Skip to content

Commit c7e640a

Browse files
authored
Merge pull request #321 from tidymodels/engine-specific_defaults
Add defaults to engine specific params in model docs
2 parents 8fd1a87 + 73dbb73 commit c7e640a

29 files changed

+341
-125
lines changed

NAMESPACE

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -102,7 +102,6 @@ export(boost_tree)
102102
export(check_empty_ellipse)
103103
export(check_final_param)
104104
export(control_parsnip)
105-
export(convert_args)
106105
export(convert_stan_interval)
107106
export(decision_tree)
108107
export(eval_args)

R/aaa.R

Lines changed: 0 additions & 27 deletions
Original file line numberDiff line numberDiff line change
@@ -30,33 +30,6 @@ convert_stan_interval <- function(x, level = 0.95, lower = TRUE) {
3030
res
3131
}
3232

33-
#' Make a table of arguments
34-
#' @param model_name A character string for the model
35-
#' @keywords internal
36-
#' @export
37-
convert_args <- function(model_name) {
38-
envir <- get_model_env()
39-
40-
args <-
41-
ls(envir) %>%
42-
tibble::tibble(name = .) %>%
43-
dplyr::filter(grepl("args", name)) %>%
44-
dplyr::mutate(model = sub("_args", "", name),
45-
args = purrr::map(name, ~envir[[.x]])) %>%
46-
tidyr::unnest(args) %>%
47-
dplyr::select(model:original)
48-
49-
convert_df <- args %>%
50-
dplyr::filter(grepl(model_name, model)) %>%
51-
dplyr::select(-model) %>%
52-
tidyr::pivot_wider(names_from = engine, values_from = original)
53-
54-
convert_df %>%
55-
knitr::kable(col.names = paste0("**", colnames(convert_df), "**"))
56-
57-
}
58-
59-
6033
# ------------------------------------------------------------------------------
6134
# nocov
6235

R/boost_tree_data.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -338,8 +338,8 @@ set_model_arg(
338338
set_model_arg(
339339
model = "boost_tree",
340340
eng = "spark",
341-
parsnip = "min_info_gain",
342-
original = "loss_reduction",
341+
parsnip = "loss_reduction",
342+
original = "min_info_gain",
343343
func = list(pkg = "dials", fun = "loss_reduction"),
344344
has_submodel = FALSE
345345
)

man/boost_tree.Rd

Lines changed: 14 additions & 9 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/convert_args.Rd

Lines changed: 0 additions & 15 deletions
This file was deleted.

man/decision_tree.Rd

Lines changed: 7 additions & 5 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/linear_reg.Rd

Lines changed: 5 additions & 3 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/logistic_reg.Rd

Lines changed: 5 additions & 3 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/mars.Rd

Lines changed: 5 additions & 3 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/mlp.Rd

Lines changed: 10 additions & 8 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)