We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
check_tailor()
1 parent b669901 commit 33cc542Copy full SHA for 33cc542
R/utils.R
@@ -62,6 +62,8 @@ is_tailor <- function(x) {
62
#' @keywords internal
63
#' @rdname tailor-internals
64
tailor_fully_trained <- function(x) {
65
+ check_tailor(x)
66
+
67
if (length(x$adjustments) == 0L) {
68
return(FALSE)
69
}
@@ -77,6 +79,8 @@ tailor_adjustment_trained <- function(x) {
77
79
78
80
81
tailor_requires_fit <- function(x) {
82
83
84
any(purrr::map_lgl(x$adjustments, tailor_adjustment_requires_fit))
85
86
0 commit comments