-
Notifications
You must be signed in to change notification settings - Fork 106
Closed
Description
tunable.multinomial_reg() registers brulee_mlp_engine_args for brulee:
Lines 267 to 273 in 07961a0
| tunable.multinomial_reg <- function(x, ...) { | |
| res <- NextMethod() | |
| if (x$engine == "glmnet") { | |
| res$call_info[res$name == "mixture"] <- | |
| list(list(pkg = "dials", fun = "mixture", range = c(0.05, 1.00))) | |
| } else if (x$engine == "brulee") { | |
| res <- add_engine_parameters(res, brulee_mlp_engine_args) |
Even though there's an arg configuration for multinom_reg() specifically:
Lines 225 to 227 in 07961a0
| brulee_multinomial_engine_args <- | |
| brulee_mlp_engine_args %>% | |
| dplyr::filter(name %in% c("momentum", "batch_size", "stop_iter", "class_weights")) |
Metadata
Metadata
Assignees
Labels
No labels