Skip to content

Commit

Permalink
pass one more call
Browse files Browse the repository at this point in the history
  • Loading branch information
EmilHvitfeldt committed Jan 5, 2024
1 parent f4db3e7 commit 08e1b51
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/set_pred.R
Original file line number Diff line number Diff line change
Expand Up @@ -137,7 +137,7 @@ check_pred_info <- function(pred_obj, type, call = rlang::caller_env()) {
)
}

check_func_val(pred_obj$func)
check_func_val(pred_obj$func, call = call)

if (!is.list(pred_obj$args)) {
rlang::abort("The `args` element should be a list.", call = call)
Expand Down

0 comments on commit 08e1b51

Please sign in to comment.