Skip to content

Commit d08671b

Browse files
committed
small cleanup
1 parent 0b97aa0 commit d08671b

File tree

1 file changed

+4
-4
lines changed

1 file changed

+4
-4
lines changed

R/misc.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -303,8 +303,8 @@ check_args.default <- function(object, call = rlang::caller_env()) {
303303

304304
# ------------------------------------------------------------------------------
305305

306-
# copied form recipes
307-
306+
# copied from recipes
307+
# nocov start
308308
names0 <- function(num, prefix = "x", call = rlang::caller_env()) {
309309
if (num < 1) {
310310
cli::cli_abort("{.arg num} should be > 0.", call = call)
@@ -313,7 +313,7 @@ names0 <- function(num, prefix = "x", call = rlang::caller_env()) {
313313
ind <- gsub(" ", "0", ind)
314314
paste0(prefix, ind)
315315
}
316-
316+
# nocov end
317317

318318
# ------------------------------------------------------------------------------
319319

@@ -604,7 +604,7 @@ is_cran_check <- function() {
604604
}
605605

606606
if (inherits(x, "workflow")) {
607-
x <- x %>% extract_fit_parsnip(x)
607+
x <- x %>% hardhat::extract_fit_parsnip(x)
608608
}
609609
model_spec <- extract_spec_parsnip(x)
610610
model_engine <- model_spec$engine

0 commit comments

Comments
 (0)