Skip to content

Commit fec8199

Browse files
authored
correct typo in "logistic" (#1056)
1 parent f0c7882 commit fec8199

File tree

1 file changed

+2
-2
lines changed

1 file changed

+2
-2
lines changed

R/tunable.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -218,7 +218,7 @@ brulee_linear_engine_args <-
218218
brulee_mlp_engine_args %>%
219219
dplyr::filter(name %in% c("momentum", "batch_size", "stop_iter"))
220220

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

@@ -258,7 +258,7 @@ tunable.logistic_reg <- function(x, ...) {
258258
res$call_info[res$name == "mixture"] <-
259259
list(list(pkg = "dials", fun = "mixture", range = c(0.05, 1.00)))
260260
} else if (x$engine == "brulee") {
261-
res <- add_engine_parameters(res, brulee_logistc_engine_args)
261+
res <- add_engine_parameters(res, brulee_logistic_engine_args)
262262
}
263263
res
264264
}

0 commit comments

Comments
 (0)