Skip to content

Commit 67320aa

Browse files
committed
document with other update() methods
1 parent 3fd6a35 commit 67320aa

File tree

3 files changed

+14
-49
lines changed

3 files changed

+14
-49
lines changed

R/poisson_reg.R

Lines changed: 1 addition & 15 deletions
Original file line numberDiff line numberDiff line change
@@ -66,22 +66,8 @@ print.poisson_reg <- function(x, ...) {
6666

6767
# ------------------------------------------------------------------------------
6868

69-
#' @param object A boosted tree model specification.
70-
#' @param parameters A 1-row tibble or named list with _main_
71-
#' parameters to update. If the individual arguments are used,
72-
#' these will supersede the values in `parameters`. Also, using
73-
#' engine arguments in this object will result in an error.
74-
#' @param ... Not used for `update()`.
75-
#' @param fresh A logical for whether the arguments should be
76-
#' modified in-place of or replaced wholesale.
77-
#' @return An updated model specification.
78-
#' @examples
79-
#' model <- poisson_reg(penalty = 10, mixture = 0.1)
80-
#' model
81-
#' update(model, penalty = 1)
82-
#' update(model, penalty = 1, fresh = TRUE)
8369
#' @method update poisson_reg
84-
#' @rdname poisson_reg
70+
#' @rdname parsnip_update
8571
#' @export
8672
update.poisson_reg <-
8773
function(object,

man/parsnip_update.Rd

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

man/poisson_reg.Rd

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

0 commit comments

Comments
 (0)