Skip to content

Commit e492134

Browse files
add documentation with example
1 parent c665894 commit e492134

File tree

2 files changed

+57
-0
lines changed

2 files changed

+57
-0
lines changed

R/initialize.R

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -4,6 +4,10 @@
44
#' entries in the parse table and adds this information to the table.
55
#' @param pd_flat A parse table.
66
#' @importFrom utils tail
7+
#' @examples
8+
#' string_to_format <- "call( 3)"
9+
#' pd <- styler:::compute_parse_data_nested(string_to_format)
10+
#' styler:::pre_visit(pd, c(initialize_default_attributes))
711
#' @export
812
initialize_default_attributes <- function(pd_flat) {
913

man/initialize_default_attributes.Rd

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

0 commit comments

Comments
 (0)