Skip to content

Commit 89964cc

Browse files
typos and other minor changes, clean-up.
1 parent d2385b5 commit 89964cc

File tree

5 files changed

+6
-46
lines changed

5 files changed

+6
-46
lines changed

R/nested.R

Lines changed: 1 addition & 18 deletions
Original file line numberDiff line numberDiff line change
@@ -7,23 +7,6 @@
77
#' @return A nested parse table. Apart from the columns provided by
88
#' `utils::getParseData()`, a column "short" with the first five characters of
99
#' "text" is added, the nested subtibbles are in column "child".
10-
#' TODO:
11-
#' - Implement enhance_parse_data_nested()
12-
#' - Walk tree defined by `child`, compute whitespace information
13-
#' - Store indention depth in a separate column, unaffected by
14-
#' inter-token space
15-
#' - Implement compute_parse_data_nested_with_ws() as
16-
#' compute_parse_data_nested() + enhance_parse_data_nested()
17-
#' - Implement serialization of nested parse data
18-
#' - Use compute_parse_data_nested_with_ws() instead of
19-
#' compute_parse_data_flat_enhanced()
20-
#' - Perform all transformations on hierarchical structure
21-
#' - Compute text for a sub-element
22-
#' - Compute indentation
23-
#' - Braces
24-
#' - Function calls
25-
#' - Function definitions
26-
#' - Remove `includeText = TRUE`
2710
compute_parse_data_nested <- function(text) {
2811
parse_data <- tokenize(text) %>%
2912
add_terminal_token_before() %>%
@@ -150,7 +133,7 @@ nest_parse_data <- function(pd_flat) {
150133

151134
#' Combine child and internal child
152135
#'
153-
#' binds two parse tables together and arranges them so that the tokens are in
136+
#' Binds two parse tables together and arranges them so that the tokens are in
154137
#' the correct order.
155138
#' @param child A parse table or `NULL`.
156139
#' @param internal_child A parse table or `NULL`.

R/ws.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -49,7 +49,8 @@ prettify_local <- function(transformers) {
4949

5050
#' Style a string
5151
#'
52-
#' Styles a character vector
52+
#' Styles a character vector. Each element of the character vector corresponds
53+
#' to one line of code.
5354
#' @param text A character vector with text to style.
5455
#' @inheritParams style_pkg
5556
#' @family stylers

man/combine_children.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/compute_parse_data_nested.Rd

Lines changed: 0 additions & 25 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/style_text.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)