Skip to content

Commit

Permalink
remove dead code
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Nov 22, 2024
1 parent f252cfb commit 23545c2
Showing 1 changed file with 0 additions and 13 deletions.
13 changes: 0 additions & 13 deletions R/tidy.R
Original file line number Diff line number Diff line change
Expand Up @@ -38,16 +38,3 @@ tidy.tailor <- function(x, number = NA, ...) {

tibble::new_tibble(res)
}

tidy_adjustments <- function(adjustments) {
res <- adjustment_orderings(x$adjustments)

res <- vctrs::vec_cbind(
number = seq_len(nrow(res)),
res,
trained = purrr::map_lgl(x$adjustments, purrr::pluck, "trained"),
requires_train = purrr::map_lgl(x$adjustments, purrr::pluck, "requires_fit")
)

tibble::new_tibble(res)
}

0 comments on commit 23545c2

Please sign in to comment.