Skip to content

Commit 7a387a0

Browse files
tree creator from parse data
1 parent b92e54c commit 7a387a0

File tree

1 file changed

+7
-1
lines changed

1 file changed

+7
-1
lines changed

R/nested-to-tree.R

Lines changed: 7 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -9,10 +9,16 @@
99
create_tree <- function(text, structure_only = FALSE) {
1010
compute_parse_data_nested(text) %>%
1111
pre_visit(c(default_style_guide_attributes)) %>%
12-
create_node_from_nested_root(structure_only) %>%
12+
create_tree_from_pd_with_default_style_attributes(structure_only)
13+
}
14+
15+
create_tree_from_pd_with_default_style_attributes <- function(pd, structure_only = FALSE) {
16+
pd %>%
17+
create_node_from_nested_root(structure_only) %>%
1318
as.data.frame()
1419
}
1520

21+
1622
#' Convert a nested tibble into a node tree
1723
#'
1824
#' This function is convenient to display all nesting levels of a nested tibble

0 commit comments

Comments
 (0)