Skip to content

Commit 2f00678

Browse files
committed
minor linting
1 parent f8ca21b commit 2f00678

File tree

1 file changed

+4
-2
lines changed

1 file changed

+4
-2
lines changed

R/aaa_models.R

Lines changed: 4 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -282,19 +282,21 @@ check_pred_info <- function(pred_obj, type) {
282282

283283
check_spec_pred_type <- function(object, type) {
284284
possible_preds <- names(object$spec$method$pred)
285-
if (!any(possible_preds == type))
285+
if (!any(possible_preds == type)) {
286286
rlang::abort(c(
287287
glue::glue("No {type} prediction method available for this model."),
288288
glue::glue("Value for `type` should be one of: ",
289289
glue::glue_collapse(glue::glue("'{possible_preds}'"), sep = ", "))
290290
))
291+
}
291292
invisible(NULL)
292293
}
293294

294295

295296
check_pkg_val <- function(pkg) {
296-
if (rlang::is_missing(pkg) || length(pkg) != 1 || !is.character(pkg))
297+
if (rlang::is_missing(pkg) || length(pkg) != 1 || !is.character(pkg)) {
297298
rlang::abort("Please supply a single character value for the package name.")
299+
}
298300
invisible(NULL)
299301
}
300302

0 commit comments

Comments
 (0)