Skip to content

Commit

Permalink
removed order default
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Oct 4, 2023
1 parent 38366c2 commit 81749cc
Showing 1 changed file with 1 addition and 5 deletions.
6 changes: 1 addition & 5 deletions R/pull.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ extract_details <- function(object, extractor) {

# Grab the new results, make sure that they align row-wise with the rsample
# object and then bind columns
pulley <- function(resamples, res, col, order = NULL) {
pulley <- function(resamples, res, col, order) {
if (all(purrr::map_lgl(res, inherits, "simpleError"))) {
res <-
resamples %>%
Expand All @@ -23,10 +23,6 @@ pulley <- function(resamples, res, col, order = NULL) {

id_cols <- grep("^id", names(resamples), value = TRUE)

if (is.null(order)) {
order <- vctrs::vec_order(resamples[id_cols])
}

resamples <- vctrs::vec_slice(resamples, order)

pulled_vals <- purrr::map(res, ~ .x[[col]]) %>% purrr::list_rbind()
Expand Down

0 comments on commit 81749cc

Please sign in to comment.