Skip to content

Commit 2c98ce9

Browse files
committed
Register S3 method
1 parent 3427448 commit 2c98ce9

File tree

2 files changed

+4
-1
lines changed

2 files changed

+4
-1
lines changed

R/logistic_reg.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -290,7 +290,6 @@ finalize.logistic_reg <- function(x, engine = NULL, ...) {
290290
#' If parameters need to be modified, this function can be used
291291
#' in lieu of recreating the object from scratch.
292292
#'
293-
#' @export
294293
#' @inheritParams logistic_reg
295294
#' @param object A logistic reression model specification.
296295
#' @param fresh A logical for whether the arguments should be
@@ -303,6 +302,8 @@ finalize.logistic_reg <- function(x, engine = NULL, ...) {
303302
#' update(model, regularization = 1)
304303
#'
305304
#' update(model, regularization = 1, fresh = TRUE)
305+
#' @method update logistic_reg
306+
#' @export
306307
update.logistic_reg <-
307308
function(object,
308309
regularization = NULL, mixture = NULL,

R/rand_forest.R

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -389,6 +389,8 @@ finalize.rand_forest <- function(x, engine = NULL, ...) {
389389
#' update(model, mtry = 1)
390390
#'
391391
#' update(model, mtry = 1, fresh = TRUE)
392+
#' @method update rand_forest
393+
#' @export
392394
update.rand_forest <-
393395
function(object,
394396
mtry = NULL, trees = NULL, min_n = NULL,

0 commit comments

Comments
 (0)