Skip to content

Commit cb6f544

Browse files
Use stable version of {purrrr}
1 parent 6db6eff commit cb6f544

File tree

3 files changed

+4
-9
lines changed

3 files changed

+4
-9
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -27,7 +27,7 @@ Depends:
2727
Imports:
2828
cli (>= 3.1.1),
2929
magrittr (>= 2.0.0),
30-
purrr (>= 0.2.3),
30+
purrr (>= 1.0.2),
3131
R.cache (>= 0.15.0),
3232
rlang (>= 1.0.0),
3333
rprojroot (>= 1.1),

R/compat-dplyr.R

Lines changed: 0 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -51,9 +51,3 @@ left_join <- function(x, y, by) {
5151
last <- function(x) {
5252
x[[length(x)]]
5353
}
54-
55-
map_dfr <- function(.x, .f, ...) {
56-
.f <- purrr::as_mapper(.f, ...)
57-
res <- map(.x, .f, ...)
58-
vec_rbind(!!!res)
59-
}

R/visit.R

Lines changed: 3 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -233,10 +233,11 @@ enrich_terminals <- function(flattened_pd, use_raw_indention = FALSE) {
233233
groups <- flattened_pd$line1
234234
split_pd <- vec_split(flattened_pd, groups)[[2L]]
235235
flattened_pd <- split_pd %>%
236-
map_dfr(function(.x) {
236+
purrr::map(function(.x) {
237237
.x$col2 <- cumsum(.x$nchar + .x$lag_spaces)
238238
.x
239-
})
239+
}) %>%
240+
purrr::list_rbind()
240241
flattened_pd$col1 <- flattened_pd$col2 - flattened_pd$nchar
241242
flattened_pd
242243
}

0 commit comments

Comments
 (0)