Skip to content

Commit cc3cf6f

Browse files
committed
remove used check_glmnet_lambda()
1 parent d7133ec commit cc3cf6f

File tree

1 file changed

+0
-17
lines changed

1 file changed

+0
-17
lines changed

R/multinom_reg.R

Lines changed: 0 additions & 17 deletions
Original file line numberDiff line numberDiff line change
@@ -317,20 +317,3 @@ predict_raw._multnet <- function(object, new_data, opts = list(), ...) {
317317
object$spec <- eval_args(object$spec)
318318
predict_raw.model_fit(object, new_data = new_data, opts = opts, ...)
319319
}
320-
321-
322-
323-
# ------------------------------------------------------------------------------
324-
325-
# This checks as a pre-processor in the model data object
326-
check_glmnet_lambda <- function(dat, object) {
327-
if (length(object$fit$lambda) > 1)
328-
rlang::abort(
329-
glue::glue(
330-
"`predict()` doesn't work with multiple penalties (i.e. lambdas). ",
331-
"Please specify a single value using `penalty = some_value` or use ",
332-
"`multi_predict()` to get multiple predictions per row of data."
333-
)
334-
)
335-
dat
336-
}

0 commit comments

Comments
 (0)