File tree Expand file tree Collapse file tree 1 file changed +13
-0
lines changed Expand file tree Collapse file tree 1 file changed +13
-0
lines changed Original file line number Diff line number Diff line change @@ -280,12 +280,25 @@ check_pred_info <- function(pred_obj, type) {
280
280
invisible (NULL )
281
281
}
282
282
283
+ check_spec_pred_type <- function (object , type ) {
284
+ possible_preds <- names(object $ spec $ method $ pred )
285
+ if (! any(possible_preds == type ))
286
+ rlang :: abort(c(
287
+ glue :: glue(" No {type} prediction method available for this model." ),
288
+ glue :: glue(" Value for `type` should be one of: " ,
289
+ glue :: glue_collapse(glue :: glue(" '{possible_preds}'" ), sep = " , " ))
290
+ ))
291
+ invisible (NULL )
292
+ }
293
+
294
+
283
295
check_pkg_val <- function (pkg ) {
284
296
if (rlang :: is_missing(pkg ) || length(pkg ) != 1 || ! is.character(pkg ))
285
297
rlang :: abort(" Please supply a single character value for the package name." )
286
298
invisible (NULL )
287
299
}
288
300
301
+
289
302
check_interface_val <- function (x ) {
290
303
exp_interf <- c(" data.frame" , " formula" , " matrix" )
291
304
if (length(x ) != 1 || ! (x %in% exp_interf )) {
You can’t perform that action at this time.
0 commit comments