-
Notifications
You must be signed in to change notification settings - Fork 68
Open
Labels
featurea feature request or enhancementa feature request or enhancement
Description
With printing in the rset objects, I think that we'll have to move this code into an rsample PR.
Most of the rsets have a superseding class (like v_fold) and the print method for that class happens first.
Using v_fold as an example, its print method removes the first two classes (v_fold and rset) so that the remaining printing is the default tibble printing. That's why there is not a rsample:::print.rset method.
I'm going to temporarily remove the print methods and make this comment an issue for rsample, and then Hannah can take a look (who is out of office next week 😿)
#' @export
print.rset <- function(x, ...) {
fold_weights <- attr(x, ".fold_weights")
if (!is.null(fold_weights)) {
# Create a tibble with fold weights as a column
x_tbl <- tibble::as_tibble(x)
x_tbl$fold_weight <- fold_weights
print(x_tbl, ...)
} else {
# Use default behavior
NextMethod("print")
}
}
#' @export
print.manual_rset <- function(x, ...) {
fold_weights <- attr(x, ".fold_weights")
if (!is.null(fold_weights)) {
# Create a tibble with fold weights as a column
x_tbl <- tibble::as_tibble(x)
x_tbl$fold_weight <- fold_weights
print(x_tbl, ...)
} else {
# Use default behavior for manual_rset
NextMethod("print")
}
}Originally posted by @topepo in tidymodels/tune#1007 (comment)
Metadata
Metadata
Assignees
Labels
featurea feature request or enhancementa feature request or enhancement