Skip to content

Commit

Permalink
one more var rename
Browse files Browse the repository at this point in the history
  • Loading branch information
MichaelChirico committed Jun 13, 2024
1 parent 30a0597 commit a02335b
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -221,7 +221,7 @@ platform_independent_sort <- function(x) x[platform_independent_order(x)]
#' # more importantly, extract raw strings correctly
#' tmp_raw <- tempfile()
#' writeLines("c(R'(a\\b)', R'--[a\\\"\'\"\\b]--')", tmp_raw)
#' expr_as_xml_raw <- get_source_expressions(tmp4.0)$expressions[[1L]]$xml_parsed_content
#' expr_as_xml_raw <- get_source_expressions(tmp_raw)$expressions[[1L]]$xml_parsed_content
#' writeLines(as.character(expr_as_xml_raw))
#' get_r_string(expr_as_xml_raw, "expr[2]")
#' get_r_string(expr_as_xml_raw, "expr[3]")
Expand Down
2 changes: 1 addition & 1 deletion man/get_r_string.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit a02335b

Please sign in to comment.