Skip to content

Commit aa4841d

Browse files
authored
Merge pull request #98 from tidymodels:req-pkgs-infra
Add `infra` arg to `required_pkgs()`
2 parents d66e4ed + 6f07c3d commit aa4841d

File tree

1 file changed

+5
-2
lines changed

1 file changed

+5
-2
lines changed

R/tailor.R

Lines changed: 5 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -346,8 +346,11 @@ tunable.tailor <- function(x, ...) {
346346
}
347347

348348
#' @export
349-
required_pkgs.tailor <- function(x, ...) {
349+
required_pkgs.tailor <- function(x, infra = TRUE, ...) {
350350
res <- purrr::map(x$adjustments, required_pkgs)
351-
res <- c("tailor", unlist(res))
351+
res <- unlist(res)
352+
if (infra) {
353+
res <- c("tailor", res)
354+
}
352355
sort(unique(res))
353356
}

0 commit comments

Comments
 (0)