Skip to content

Commit

Permalink
remove bad test
Browse files Browse the repository at this point in the history
  • Loading branch information
topepo committed Oct 31, 2024
1 parent 141f1e9 commit f7dedb1
Show file tree
Hide file tree
Showing 2 changed files with 0 additions and 15 deletions.
9 changes: 0 additions & 9 deletions tests/testthat/_snaps/interact.md
Original file line number Diff line number Diff line change
Expand Up @@ -123,12 +123,3 @@
Error in `step_interact()`:
! `sep` must be a single string, not `TRUE`.

---

Code
recipe(~ x + y + z, data = tr_dat) %>% step_integer(all_predictors(),
zero_based = "sure!") %>% prep()
Condition
Error:
! object 'tr_dat' not found

6 changes: 0 additions & 6 deletions tests/testthat/test-interact.R
Original file line number Diff line number Diff line change
Expand Up @@ -441,10 +441,4 @@ test_that("bad args", {
prep(),
error = TRUE
)
expect_snapshot(
recipe(~ x + y + z, data = tr_dat) %>%
step_integer(all_predictors(), zero_based = "sure!") %>%
prep(),
error = TRUE
)
})

0 comments on commit f7dedb1

Please sign in to comment.