Skip to content

Commit

Permalink
Merge pull request #395 from tidymodels/0.1.6-release-candidate
Browse files Browse the repository at this point in the history
0.1.6 release candidate
  • Loading branch information
topepo authored Jul 21, 2021
2 parents 52b7c84 + 5fc50d2 commit b4ae617
Show file tree
Hide file tree
Showing 9 changed files with 9 additions and 9 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
@@ -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",
Expand Down
2 changes: 1 addition & 1 deletion NEWS.md
Original file line number Diff line number Diff line change
@@ -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).

Expand Down
2 changes: 1 addition & 1 deletion R/merge.R
Original file line number Diff line number Diff line change
Expand Up @@ -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 <-
Expand Down
2 changes: 1 addition & 1 deletion R/param_set.workflows.R
Original file line number Diff line number Diff line change
Expand Up @@ -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()
#'
Expand Down
2 changes: 1 addition & 1 deletion R/tune_args.R
Original file line number Diff line number Diff line change
Expand Up @@ -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()
#'
Expand Down
2 changes: 1 addition & 1 deletion man/merge.recipe.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/parameters.workflow.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tune_args.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion tests/helper-objects.R
Original file line number Diff line number Diff line change
Expand Up @@ -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")
Expand Down

0 comments on commit b4ae617

Please sign in to comment.