diff --git a/DESCRIPTION b/DESCRIPTION index 85d3f7d46..db562aa7a 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,6 +1,6 @@ Package: tune Title: Tidy Tuning Tools -Version: 0.1.5.9001 +Version: 0.1.6 Authors@R: c(person(given = "Max", family = "Kuhn", diff --git a/NEWS.md b/NEWS.md index 69441e126..e7608d618 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,4 +1,4 @@ -# tune (development version) +# tune 0.1.6 * When using `load_pkgs()`, packages that use random numbers on start-up do not affect the state of the RNG. We also added more control of the RNGkind to make it consistent with the user's previous value (#389). diff --git a/R/merge.R b/R/merge.R index c86290226..dbdfcf1ba 100644 --- a/R/merge.R +++ b/R/merge.R @@ -20,7 +20,7 @@ #' #' pca_rec <- #' recipe(mpg ~ ., data = mtcars) %>% -#' step_knnimpute(all_predictors(), neighbors = tune()) %>% +#' step_impute_knn(all_predictors(), neighbors = tune()) %>% #' step_pca(all_predictors(), num_comp = tune()) #' #' pca_grid <- diff --git a/R/param_set.workflows.R b/R/param_set.workflows.R index d85a70e2f..04e5359c5 100644 --- a/R/param_set.workflows.R +++ b/R/param_set.workflows.R @@ -11,7 +11,7 @@ #' library(recipes) #' #' recipe(mpg ~ ., data = mtcars) %>% -#' step_knnimpute(all_predictors(), neighbors = tune()) %>% +#' step_impute_knn(all_predictors(), neighbors = tune()) %>% #' step_pca(all_predictors(), num_comp = tune()) %>% #' dials::parameters() #' diff --git a/R/tune_args.R b/R/tune_args.R index 75f5fa2a1..537e42f10 100644 --- a/R/tune_args.R +++ b/R/tune_args.R @@ -28,7 +28,7 @@ #' library(recipes) #' #' recipe(mpg ~ ., data = mtcars) %>% -#' step_knnimpute(all_predictors(), neighbors = tune()) %>% +#' step_impute_knn(all_predictors(), neighbors = tune()) %>% #' step_pca(all_predictors(), num_comp = tune()) %>% #' tune_args() #' diff --git a/man/merge.recipe.Rd b/man/merge.recipe.Rd index c7363ae3e..84aae3d64 100644 --- a/man/merge.recipe.Rd +++ b/man/merge.recipe.Rd @@ -32,7 +32,7 @@ library(recipes) pca_rec <- recipe(mpg ~ ., data = mtcars) \%>\% - step_knnimpute(all_predictors(), neighbors = tune()) \%>\% + step_impute_knn(all_predictors(), neighbors = tune()) \%>\% step_pca(all_predictors(), num_comp = tune()) pca_grid <- diff --git a/man/parameters.workflow.Rd b/man/parameters.workflow.Rd index 1208c2c9e..dc432378d 100644 --- a/man/parameters.workflow.Rd +++ b/man/parameters.workflow.Rd @@ -30,7 +30,7 @@ library(tibble) library(recipes) recipe(mpg ~ ., data = mtcars) \%>\% - step_knnimpute(all_predictors(), neighbors = tune()) \%>\% + step_impute_knn(all_predictors(), neighbors = tune()) \%>\% step_pca(all_predictors(), num_comp = tune()) \%>\% dials::parameters() diff --git a/man/tune_args.Rd b/man/tune_args.Rd index 6d17b4e41..42690103f 100644 --- a/man/tune_args.Rd +++ b/man/tune_args.Rd @@ -53,7 +53,7 @@ the \code{id} field reverts to the name of the parameters. library(recipes) recipe(mpg ~ ., data = mtcars) \%>\% - step_knnimpute(all_predictors(), neighbors = tune()) \%>\% + step_impute_knn(all_predictors(), neighbors = tune()) \%>\% step_pca(all_predictors(), num_comp = tune()) \%>\% tune_args() diff --git a/tests/helper-objects.R b/tests/helper-objects.R index 175e32519..c4c5666e6 100644 --- a/tests/helper-objects.R +++ b/tests/helper-objects.R @@ -48,7 +48,7 @@ lm_model <- no_engine <- linear_reg() weird_annotation <- - boost_tree(mode = "regression", trees = tune("$^%&#!")) %>% + boost_tree(mode = "classification", trees = tune("$^%&#!")) %>% set_engine("C5.0", rules = TRUE, noGlobalPruning = TRUE) glmn <- linear_reg(penalty = tune(), mixture = tune()) %>% set_engine("glmnet")