We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 903ad52 commit 9e790bcCopy full SHA for 9e790bc
R/misc.R
@@ -371,7 +371,7 @@ check_outcome <- function(y, spec) {
371
if (!outcome_is_numeric) {
372
cli::cli_abort(
373
"For a regression model, the outcome should be {.cls numeric}, not
374
- {.cls {class(y)[[1]]}}."
+ {.obj_type_friendly {y}}."
375
)
376
}
377
@@ -380,8 +380,8 @@ check_outcome <- function(y, spec) {
380
outcome_is_factor <- if (is.atomic(y)) {is.factor(y)} else {all(map_lgl(y, is.factor))}
381
if (!outcome_is_factor) {
382
383
- "For a classification model, the outcome should be {.cls factor}, not
384
+ "For a classification model, the outcome should be a {.cls factor}, not
385
386
387
0 commit comments