Skip to content

Commit 21f0bb2

Browse files
Fix typos in tools to register models (#363)
* typo * missing space * Add missing space Co-authored-by: Julia Silge <julia.silge@gmail.com>
1 parent 7a86bfd commit 21f0bb2

File tree

1 file changed

+3
-3
lines changed

1 file changed

+3
-3
lines changed

R/aaa_models.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -268,7 +268,7 @@ check_pred_info <- function(pred_obj, type) {
268268

269269
check_pkg_val <- function(pkg) {
270270
if (rlang::is_missing(pkg) || length(pkg) != 1 || !is.character(pkg))
271-
rlang::abort("Please supply a single character vale for the package name.")
271+
rlang::abort("Please supply a single character value for the package name.")
272272
invisible(NULL)
273273
}
274274

@@ -591,7 +591,7 @@ set_fit <- function(model, mode, eng, value) {
591591
dplyr::filter(engine == eng & mode == !!mode) %>%
592592
nrow()
593593
if (has_engine != 1) {
594-
rlang::abort(glue::glue("The combination of '{eng}' and mode '{mode}' has not",
594+
rlang::abort(glue::glue("The combination of '{eng}' and mode '{mode}' has not ",
595595
"been registered for model '{model}'."))
596596
}
597597

@@ -601,7 +601,7 @@ set_fit <- function(model, mode, eng, value) {
601601
nrow()
602602

603603
if (has_fit > 0) {
604-
rlang::abort(glue::glue("The combination of '{eng}' and mode '{mode}'",
604+
rlang::abort(glue::glue("The combination of '{eng}' and mode '{mode}' ",
605605
"already has a fit component for model '{model}'."))
606606
}
607607

0 commit comments

Comments
 (0)