Skip to content

Commit

Permalink
apply suggestions from review
Browse files Browse the repository at this point in the history
Co-authored-by: Emil Hvitfeldt <[email protected]>
  • Loading branch information
simonpcouch and EmilHvitfeldt authored Sep 9, 2024
1 parent 5eeedde commit 00f90f9
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/tidy_glmnet.R
Original file line number Diff line number Diff line change
Expand Up @@ -58,6 +58,6 @@ get_glmn_coefs <- function(x, penalty = 0.01) {
tidy_glmnet <- function(x, penalty = NULL, ..., call = caller_env()) {
check_installs(x$spec)
load_libs(x$spec, quiet = TRUE, attach = TRUE)
check_number_decimal(penalty, min = 0, max = 1, call = call)
check_number_decimal(penalty, min = 0, max = 1, allow_null = TRUE, call = call)
get_glmn_coefs(x$fit, penalty = penalty)
}

0 comments on commit 00f90f9

Please sign in to comment.