Skip to content

Commit 21c0e91

Browse files
committed
fix space typo
1 parent fa40f0a commit 21c0e91

File tree

2 files changed

+3
-3
lines changed

2 files changed

+3
-3
lines changed

R/logistic_reg.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -145,7 +145,7 @@ check_args.logistic_reg <- function(object, call = rlang::caller_env()) {
145145
if (object$engine == "LiblineaR") {
146146
if (is.numeric(args$mixture) && !args$mixture %in% 0:1) {
147147
cli::cli_abort(
148-
c("x" = "For the {.pkg LiblineaR} engine, mixture must be 0 or 1,\\
148+
c("x" = "For the {.pkg LiblineaR} engine, mixture must be 0 or 1, \\
149149
not {args$mixture}.",
150150
"i" = "Choose a pure ridge model with {.code mixture = 0} or \\
151151
a pure lasso model with {.code mixture = 1}.",
@@ -157,7 +157,7 @@ check_args.logistic_reg <- function(object, call = rlang::caller_env()) {
157157
if ((!is.null(args$penalty)) && args$penalty == 0) {
158158
cli::cli_abort(
159159
"For the {.pkg LiblineaR} engine, {.arg penalty} must be {.code > 0}, \\
160-
not 0.",
160+
not 0.",
161161
call = call
162162
)
163163
}

tests/testthat/_snaps/logistic_reg.md

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -57,7 +57,7 @@
5757
fit(spec, Class ~ ., lending_club)
5858
Condition
5959
Error in `fit()`:
60-
x For the LiblineaR engine, mixture must be 0 or 1,not 0.5.
60+
x For the LiblineaR engine, mixture must be 0 or 1, not 0.5.
6161
i Choose a pure ridge model with `mixture = 0` or a pure lasso model with `mixture = 1`.
6262
! The Liblinear engine does not support other values.
6363

0 commit comments

Comments
 (0)