Code
new_nn <- gower_topn(x = dat_2, y = dat_1, n = 2, eps = 2)$index
Condition
Warning in `gower_work()`:
skipping variable with zero or non-finite range.
Code
recipe(~., data = mtcars) %>% step_impute_knn(all_predictors(), impute_with = NULL) %>%
prep()
Condition
Error in `step_impute_knn()`:
Caused by error in `prep()`:
! `impute_with` must not be `NULL`.
Code
tmp <- recipe(~., data = mtcars) %>% step_impute_knn(mpg, disp, vs,
impute_with = c(am, gear)) %>% prep()
Condition
Warning:
The `impute_with` variables for `mpg` only contains missing values for row: 2 and 3. Cannot impute for those rows.
Warning:
The `impute_with` variables for `disp` only contains missing values for row: 10. Cannot impute for those rows.
Code
recipe(~., data = mtcars) %>% step_impute_knn(all_predictors(), options = list(
wrong = "wrong")) %>% prep()
Condition
Error in `step_impute_knn()`:
Caused by error in `prep()`:
! `options` must only contain elements nthread and eps, the following are not allowed: wrong.
Code
recipe(~., data = mtcars) %>% step_impute_knn(all_predictors(), options = c(
wrong = "wrong")) %>% prep()
Condition
Error in `step_impute_knn()`:
Caused by error in `prep()`:
! `options` must be a list, not a string.
Code
recipe(~mpg, data = mtcars) %>% step_impute_knn(mpg, options = TRUE) %>% prep()
Condition
Error in `step_impute_knn()`:
Caused by error in `prep()`:
! `options` must be a list, not `TRUE`.
Code
recipe(mpg ~ ., data = mtcars) %>% step_impute_knn(disp, impute_with = NULL) %>%
prep()
Condition
Error in `step_impute_knn()`:
Caused by error in `prep()`:
! `impute_with` must not be `NULL`.
Code
bake(imputed_trained, new_data = biomass[, c(-4)])
Condition
Error in `step_impute_knn()`:
! The following required column is missing from `new_data`: hydrogen.
Code
rec
Message
-- Recipe ----------------------------------------------------------------------
-- Inputs
Number of variables by role
outcome: 1
predictor: 10
-- Operations
* K-nearest neighbor imputation for: <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
* K-nearest neighbor imputation for: <none> | Trained
Code
print(rec)
Message
-- Recipe ----------------------------------------------------------------------
-- Inputs
Number of variables by role
outcome: 1
predictor: 5
-- Operations
* K-nearest neighbor imputation for: carbon nitrogen
Code
prep(rec)
Message
-- Recipe ----------------------------------------------------------------------
-- Inputs
Number of variables by role
outcome: 1
predictor: 5
-- Training information
Training data contained 536 data points and no incomplete rows.
-- Operations
* K-nearest neighbor imputation for: carbon nitrogen | Trained
Code
recipe(~., data = mtcars) %>% step_impute_knn(all_predictors(), neighbors = 0L) %>%
prep()
Condition
Error in `step_impute_knn()`:
Caused by error in `prep()`:
! `neighbors` must be a whole number larger than or equal to 1, not the number 0.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.