Skip to content

Commit

Permalink
remove TODO (posted as issue comment)
Browse files Browse the repository at this point in the history
  • Loading branch information
MichaelChirico committed Oct 10, 2022
1 parent c8483b7 commit bc78d68
Showing 1 changed file with 0 additions and 9 deletions.
9 changes: 0 additions & 9 deletions tests/testthat/test-unnecessary_placeholder_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,15 +7,6 @@ test_that("unnecessary_placeholder_linter skips allowed usages", {
expect_lint("x %>% foo(., .)", NULL, unnecessary_placeholder_linter())
# . used as a keyword argument --> ok
expect_lint("x %>% foo(arg = .)", NULL, unnecessary_placeholder_linter())
# TODO(chiricom): currently, the linter marks
# ' x %>% ... %>% length(.) > 0
# this _technically_ works as intended because it's parsed as
# ' `>`(x %>% ... %>% length(), 0)
# but I think the code is not quite behaving as intended.
# ' x %>% ... %>% (length(.) > 0)
# is probably closer to what was intended. So for now we mark the code as a
# lint, but that also doesn't feel quite right (we're using this linter
# as a signal of a different code quality issue).
})

test_that("unnecessary_placeholder_linter blocks simple disallowed usages", {
Expand Down

0 comments on commit bc78d68

Please sign in to comment.