Skip to content

Commit

Permalink
the check is already carried out via multi_predict()
Browse files Browse the repository at this point in the history
  • Loading branch information
hfrick committed Jul 27, 2024
1 parent cda9b61 commit 493343a
Showing 1 changed file with 0 additions and 4 deletions.
4 changes: 0 additions & 4 deletions R/poisson_reg-glmnet.R
Original file line number Diff line number Diff line change
Expand Up @@ -69,10 +69,6 @@ predict_raw._fishnet <- function(object, new_data, opts = list(), ...) {
#' @param penalty A numeric vector of penalty values.
multi_predict._fishnet <-
function(object, new_data, type = NULL, penalty = NULL, ...) {
if (any(names(enquos(...)) == "newdata")) {
rlang::abort("Did you mean to use `new_data` instead of `newdata`?")
}

dots <- list(...)

object$spec <- eval_args(object$spec)
Expand Down

0 comments on commit 493343a

Please sign in to comment.