We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 8cb0b5e commit 38dca86Copy full SHA for 38dca86
R/nest.R
@@ -359,12 +359,14 @@ nest_parse_data <- function(pd_flat) {
359
360
nested <- left_join(internal, rhs, by = c("id" = "parent_"))
361
362
- for (i in seq_along(nested$child)) {
363
- new <- combine_children(nested$child[[i]], nested$internal_child[[i]])
+ children <- nested$child
+ for (i in seq_along(children)) {
364
+ new <- combine_children(children[[i]], nested$internal_child[[i]])
365
# Work around is.null(new)
- nested$child[i] <- list(new)
366
+ children[i] <- list(new)
367
}
- nested <- nested[, setdiff(names(nested), "internal_child")]
368
+ nested$child <- children
369
+ nested$internal_child <- NULL
370
nest_parse_data(nested)
371
372
0 commit comments