Skip to content

Commit 33cc542

Browse files
committed
check_tailor() in helper functions
1 parent b669901 commit 33cc542

File tree

1 file changed

+4
-0
lines changed

1 file changed

+4
-0
lines changed

R/utils.R

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -62,6 +62,8 @@ is_tailor <- function(x) {
6262
#' @keywords internal
6363
#' @rdname tailor-internals
6464
tailor_fully_trained <- function(x) {
65+
check_tailor(x)
66+
6567
if (length(x$adjustments) == 0L) {
6668
return(FALSE)
6769
}
@@ -77,6 +79,8 @@ tailor_adjustment_trained <- function(x) {
7779
#' @keywords internal
7880
#' @rdname tailor-internals
7981
tailor_requires_fit <- function(x) {
82+
check_tailor(x)
83+
8084
any(purrr::map_lgl(x$adjustments, tailor_adjustment_requires_fit))
8185
}
8286

0 commit comments

Comments
 (0)