tests/testthat/test-deprec-impute_roll.R

test_that("Deprecation error", {
  expect_snapshot(error = TRUE,
    recipe(~ ., data = mtcars) %>%
      step_rollimpute()
  )
})
tidymodels/recipes documentation built on Jan. 25, 2025, 7:30 a.m.