Skip to content

Commit 5ba98ee

Browse files
authored
register multinomial tunable arguments for brulee (#1055)
1 parent 0ff77bc commit 5ba98ee

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/tunable.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -270,7 +270,7 @@ tunable.multinomial_reg <- function(x, ...) {
270270
res$call_info[res$name == "mixture"] <-
271271
list(list(pkg = "dials", fun = "mixture", range = c(0.05, 1.00)))
272272
} else if (x$engine == "brulee") {
273-
res <- add_engine_parameters(res, brulee_mlp_engine_args)
273+
res <- add_engine_parameters(res, brulee_multinomial_engine_args)
274274
}
275275
res
276276
}

0 commit comments

Comments
 (0)