Skip to content

Commit

Permalink
use magrittr pipe
Browse files Browse the repository at this point in the history
  • Loading branch information
yjunechoe committed Nov 6, 2023
1 parent 62c752e commit 3aaaaec
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions tests/testthat/test-tidyselect-yaml_columns.R
Original file line number Diff line number Diff line change
Expand Up @@ -60,7 +60,7 @@ test_that("everything() default in `rows_*()` makes yaml roundtrip", {
test_that("complex column selection expressions make the round trip", {

# `expanded = FALSE` preserves complex expr and makes roundtrip
agent_pre <- create_agent(~ small_table) |>
agent_pre <- create_agent(~ small_table) %>%
col_vals_lt(
columns = where(is.numeric) & starts_with("c"),
value = 8
Expand Down Expand Up @@ -90,7 +90,7 @@ test_that("complex column selection expressions make the round trip", {


# `expanded = TRUE` resolves immediately and works as expected
agent_pre <- create_agent(~ small_table) |>
agent_pre <- create_agent(~ small_table) %>%
col_vals_lt(
columns = where(is.numeric) & starts_with("c"),
value = 8
Expand Down

0 comments on commit 3aaaaec

Please sign in to comment.