|
81 | 81 | #' reloaded and reattached to the `parsnip` object. |
82 | 82 | #' |
83 | 83 | #' @importFrom purrr map_lgl |
84 | | -#' @seealso [fit()], [set_engine()] |
| 84 | +#' @seealso [fit()], [set_engine()], [update()] |
85 | 85 | #' @examples |
86 | 86 | #' show_engines("boost_tree") |
87 | 87 | #' |
@@ -132,32 +132,8 @@ print.boost_tree <- function(x, ...) { |
132 | 132 |
|
133 | 133 | # ------------------------------------------------------------------------------ |
134 | 134 |
|
135 | | -#' @export |
136 | | -#' @param object A boosted tree model specification. |
137 | | -#' @param parameters A 1-row tibble or named list with _main_ |
138 | | -#' parameters to update. If the individual arguments are used, |
139 | | -#' these will supersede the values in `parameters`. Also, using |
140 | | -#' engine arguments in this object will result in an error. |
141 | | -#' @param ... Not used for `update()`. |
142 | | -#' @param fresh A logical for whether the arguments should be |
143 | | -#' modified in-place of or replaced wholesale. |
144 | | -#' @return An updated model specification. |
145 | | -#' @examples |
146 | | -#' model <- boost_tree(mtry = 10, min_n = 3) |
147 | | -#' model |
148 | | -#' update(model, mtry = 1) |
149 | | -#' update(model, mtry = 1, fresh = TRUE) |
150 | | -#' |
151 | | -#' param_values <- tibble::tibble(mtry = 10, tree_depth = 5) |
152 | | -#' |
153 | | -#' model %>% update(param_values) |
154 | | -#' model %>% update(param_values, mtry = 3) |
155 | | -#' |
156 | | -#' param_values$verbose <- 0 |
157 | | -#' # Fails due to engine argument |
158 | | -#' # model %>% update(param_values) |
159 | 135 | #' @method update boost_tree |
160 | | -#' @rdname boost_tree |
| 136 | +#' @rdname parsnip_update |
161 | 137 | #' @export |
162 | 138 | update.boost_tree <- |
163 | 139 | function(object, |
|
0 commit comments