Skip to content

Commit

Permalink
correct typo in "logistic" (#1056)
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch authored Jan 22, 2024
1 parent f0c7882 commit fec8199
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/tunable.R
Original file line number Diff line number Diff line change
Expand Up @@ -218,7 +218,7 @@ brulee_linear_engine_args <-
brulee_mlp_engine_args %>%
dplyr::filter(name %in% c("momentum", "batch_size", "stop_iter"))

brulee_logistc_engine_args <-
brulee_logistic_engine_args <-
brulee_mlp_engine_args %>%
dplyr::filter(name %in% c("momentum", "batch_size", "stop_iter", "class_weights"))

Expand Down Expand Up @@ -258,7 +258,7 @@ tunable.logistic_reg <- function(x, ...) {
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_logistc_engine_args)
res <- add_engine_parameters(res, brulee_logistic_engine_args)
}
res
}
Expand Down

0 comments on commit fec8199

Please sign in to comment.