Skip to content

Commit

Permalink
delint
Browse files Browse the repository at this point in the history
  • Loading branch information
MichaelChirico authored Sep 15, 2023
1 parent 1752df1 commit b21e686
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions tests/testthat/test-pipe-consistency-linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@ test_that("pipe_consistency skips allowed usage", {
skip_if_not_r_version("4.1.0")
linter <- pipe_consistency_linter()

expect_lint("1:3 %>% mean() %>% as.character()", NULL, )
expect_lint("1:3 %>% mean() %>% as.character()", NULL, linter)
expect_lint("1:3 |> mean() |> as.character()", NULL, linter)
# With no pipes
expect_lint("x <- 1:5", NULL, linter)
Expand Down Expand Up @@ -156,7 +156,7 @@ test_that("pipe_consistency_linter works with other magrittr pipes", {
linter <- pipe_consistency_linter()
expected_message <- rex("Found 1 instances of %>% and 1 instances of |>. Stick to one pipe operator.")

expect_lint("1:3 %>% mean() %T% print()", NULL, linter )
expect_lint("1:3 %>% mean() %T% print()", NULL, linter)
expect_lint(
"1:3 |> mean() %T>% print()",
list(
Expand Down

0 comments on commit b21e686

Please sign in to comment.