File tree Expand file tree Collapse file tree 1 file changed +4
-2
lines changed Expand file tree Collapse file tree 1 file changed +4
-2
lines changed Original file line number Diff line number Diff line change @@ -282,19 +282,21 @@ check_pred_info <- function(pred_obj, type) {
282
282
283
283
check_spec_pred_type <- function (object , type ) {
284
284
possible_preds <- names(object $ spec $ method $ pred )
285
- if (! any(possible_preds == type ))
285
+ if (! any(possible_preds == type )) {
286
286
rlang :: abort(c(
287
287
glue :: glue(" No {type} prediction method available for this model." ),
288
288
glue :: glue(" Value for `type` should be one of: " ,
289
289
glue :: glue_collapse(glue :: glue(" '{possible_preds}'" ), sep = " , " ))
290
290
))
291
+ }
291
292
invisible (NULL )
292
293
}
293
294
294
295
295
296
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 )) {
297
298
rlang :: abort(" Please supply a single character value for the package name." )
299
+ }
298
300
invisible (NULL )
299
301
}
300
302
You can’t perform that action at this time.
0 commit comments