Skip to content

Commit 1ed3235

Browse files
committed
Remove a TODO and update a snapshot test!
1 parent c22e0f6 commit 1ed3235

File tree

2 files changed

+1
-2
lines changed

2 files changed

+1
-2
lines changed

tests/testthat/_snaps/pick.md

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -213,7 +213,7 @@
213213
filter(df, pick(x, y)$x)
214214
Condition
215215
Error in `filter()`:
216-
i In argument: `asNamespace("dplyr")$dplyr_pick_tibble(x = x, y = y)$x`.
216+
i In argument: `pick(x, y)$x`.
217217
Caused by error:
218218
! `..1` must be a logical vector, not a double vector.
219219

tests/testthat/test-pick.R

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -492,7 +492,6 @@ test_that("`filter()` with `pick()` that uses invalid tidy-selection errors", {
492492
test_that("`filter()` that doesn't use `pick()` result correctly errors", {
493493
df <- tibble(x = c(1, 2, NA, 3), y = c(2, NA, 5, 3))
494494

495-
# TODO: Can we improve on the `In argument:` expression in the expansion case?
496495
expect_snapshot(error = TRUE, {
497496
filter(df, pick(x, y)$x)
498497
})

0 commit comments

Comments
 (0)