Code
prep(rec, training = dat)
Condition
Error in `step_interact()`:
Caused by error in `bake()`:
! Name collision occurred. The following variable names already exist:
* `x1ax2`
Code
recipe(mpg ~ ., data = mtcars) %>% step_interact(terms = starts_with("dis")) %>%
prep()
Condition
Error in `step_interact()`:
Caused by error:
! `terms` must be supplied as a formula.
Code
tmp <- recipe(mpg ~ ., data = mtcars) %>% step_interact(~ disp:am) %>% prep(
strings_as_factors = FALSE)
Condition
Warning:
Categorical variables used in `step_interact()` should probably be avoided; This can lead to differences in dummy variable values that are produced by ?step_dummy (`?recipes::step_dummy()`). Please convert all involved variables to dummy variables first.
Code
bake(int_rec_trained, dat_tr[, 4:6])
Condition
Error in `step_interact()`:
! The following required columns are missing from `new_data`: z and x1.
Code
rec
Message
-- Recipe ----------------------------------------------------------------------
-- Inputs
Number of variables by role
outcome: 1
predictor: 10
-- Operations
* Interactions with: <none>
Code
rec
Message
-- Recipe ----------------------------------------------------------------------
-- Inputs
Number of variables by role
outcome: 1
predictor: 10
-- Training information
Training data contained 32 data points and no incomplete rows.
-- Operations
* Interactions with: <none> | Trained
Code
rec <- prep(rec)
Condition
Warning:
`keep_original_cols` was added to `step_interact()` after this recipe was created.
i Regenerate your recipe to avoid this warning.
Code
print(rec)
Message
-- Recipe ----------------------------------------------------------------------
-- Inputs
Number of variables by role
outcome: 1
predictor: 6
-- Operations
* Interactions with: x1:x2
Code
prep(rec)
Message
-- Recipe ----------------------------------------------------------------------
-- Inputs
Number of variables by role
outcome: 1
predictor: 6
-- Training information
Training data contained 10 data points and no incomplete rows.
-- Operations
* Interactions with: x1:x2 | Trained
Code
recipe(mpg ~ ., data = mtcars) %>% step_interact(~ disp::wt, sep = TRUE) %>%
prep()
Condition
Error in `step_interact()`:
! `sep` must be a single string, not `TRUE`.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.