We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
1 parent 50a840d commit 64b59c7Copy full SHA for 64b59c7
R/transform-files.R
@@ -244,15 +244,20 @@ parse_transform_serialize_r <- function(text,
244
transformers
245
)
246
247
- text_out <- pd_nested %>%
248
- split(pd_nested$block) %>%
249
- unname() %>%
250
- map2(find_blank_lines_to_next_block(pd_nested),
251
- parse_transform_serialize_r_block,
+ pd_split <- unname(split(pd_nested, pd_nested$block))
+ pd_blank <- find_blank_lines_to_next_block(pd_nested)
+
+ text_out <- vector("list", length(pd_split))
+ for (i in seq_along(pd_split)) {
252
+ text_out[[i]] <- parse_transform_serialize_r_block(
253
+ pd_split[[i]],
254
+ pd_blank[[i]],
255
transformers = transformers,
256
base_indention = base_indention
- ) %>%
- unlist()
257
+ )
258
+ }
259
260
+ text_out <- unlist(text_out)
261
262
verify_roundtrip(
263
text, text_out,
0 commit comments