Skip to content

Commit

Permalink
transition from deprecated purrr::transpose()
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Sep 24, 2024
1 parent d413853 commit 87eb8f9
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/cal-apply-impl.R
Original file line number Diff line number Diff line change
Expand Up @@ -23,7 +23,7 @@ apply_interval_column <- function(.data, est_filter, estimates) {
}

ret <- estimates %>%
purrr::transpose() %>%
purrr::list_transpose(simplify = FALSE) %>%
purrr::imap(~ {
apply_interval_estimate(
estimate = .x,
Expand Down
2 changes: 1 addition & 1 deletion R/cal-plot-utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -153,7 +153,7 @@
)

cuts %>%
purrr::transpose() %>%
purrr::list_transpose(simplify = FALSE) %>%
purrr::map_df(
~ {
rf <- .data$.estimate >= .x$lower_cut & .data$.estimate <= .x$upper_cut
Expand Down

0 comments on commit 87eb8f9

Please sign in to comment.