diff --git a/R/boost_tree.R b/R/boost_tree.R index 795c34210..034390d6b 100644 --- a/R/boost_tree.R +++ b/R/boost_tree.R @@ -114,12 +114,12 @@ boost_tree <- function(mode = "unknown", + ..., mtry = NULL, trees = NULL, min_n = NULL, tree_depth = NULL, learn_rate = NULL, loss_reduction = NULL, sample_size = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) if (!(mode %in% boost_tree_modes)) diff --git a/R/linear_reg.R b/R/linear_reg.R index 853a761f0..d2aed4342 100644 --- a/R/linear_reg.R +++ b/R/linear_reg.R @@ -105,10 +105,10 @@ #' @importFrom purrr map_lgl linear_reg <- function(mode = "regression", + ..., penalty = NULL, mixture = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) if (!(mode %in% linear_reg_modes)) stop( diff --git a/R/logistic_reg.R b/R/logistic_reg.R index 151d4e2a2..7051b46a6 100644 --- a/R/logistic_reg.R +++ b/R/logistic_reg.R @@ -103,10 +103,10 @@ #' @importFrom purrr map_lgl logistic_reg <- function(mode = "classification", + ..., penalty = NULL, mixture = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) if (!(mode %in% logistic_reg_modes)) stop( diff --git a/R/mars.R b/R/mars.R index 0268615bd..dbaa8e381 100644 --- a/R/mars.R +++ b/R/mars.R @@ -71,9 +71,9 @@ mars <- function(mode = "unknown", + ..., num_terms = NULL, prod_degree = NULL, prune_method = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) if (!(mode %in% mars_modes)) diff --git a/R/mlp.R b/R/mlp.R index 5f44fbfdf..e4c3df660 100644 --- a/R/mlp.R +++ b/R/mlp.R @@ -93,10 +93,10 @@ mlp <- function(mode = "unknown", + ..., hidden_units = NULL, penalty = NULL, dropout = NULL, epochs = NULL, activation = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) act_funs <- c("linear", "softmax", "relu", "elu") diff --git a/R/multinom_reg.R b/R/multinom_reg.R index be0045363..6f079f167 100644 --- a/R/multinom_reg.R +++ b/R/multinom_reg.R @@ -85,10 +85,10 @@ #' @importFrom purrr map_lgl multinom_reg <- function(mode = "classification", + ..., penalty = NULL, mixture = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) if (!(mode %in% multinom_reg_modes)) stop( diff --git a/R/nearest_neighbor.R b/R/nearest_neighbor.R index 8bd53abca..499be4ea0 100644 --- a/R/nearest_neighbor.R +++ b/R/nearest_neighbor.R @@ -77,11 +77,11 @@ #' #' @export nearest_neighbor <- function(mode = "unknown", + ..., neighbors = NULL, weight_func = NULL, dist_power = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) diff --git a/R/rand_forest.R b/R/rand_forest.R index b6999b281..bfc7cc587 100644 --- a/R/rand_forest.R +++ b/R/rand_forest.R @@ -103,9 +103,9 @@ rand_forest <- function(mode = "unknown", + ..., mtry = NULL, trees = NULL, min_n = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) ## TODO: make a utility function here diff --git a/R/surv_reg.R b/R/surv_reg.R index 0d72fb83b..16ad84b70 100644 --- a/R/surv_reg.R +++ b/R/surv_reg.R @@ -20,7 +20,7 @@ #' Since survival models typically involve censoring (and require the use of #' [survival::Surv()] objects), the [fit()] function will require that the #' survival model be specified via the formula interface. -#' +#' #' Also, for the `flexsurv::flexsurvfit` engine, the typical #' `strata` function cannot be used. To achieve the same effect, #' the extra parameter roles can be used (as described above). @@ -51,9 +51,9 @@ #' @export surv_reg <- function(mode = "regression", + ..., dist = NULL, - others = list(), - ...) { + others = list()) { check_empty_ellipse(...) if (!(mode %in% surv_reg_modes)) stop( diff --git a/docs/articles/articles/Classification.html b/docs/articles/articles/Classification.html index f1f1b8a2f..9b3e6090c 100644 --- a/docs/articles/articles/Classification.html +++ b/docs/articles/articles/Classification.html @@ -162,17 +162,17 @@