From a02335b05676ecf86684f1fabb3401e720c2c627 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Wed, 12 Jun 2024 22:55:34 -0700 Subject: [PATCH] one more var rename --- R/utils.R | 2 +- man/get_r_string.Rd | 2 +- 2 files changed, 2 insertions(+), 2 deletions(-) diff --git a/R/utils.R b/R/utils.R index c3ed7f0f1..531ac1d89 100644 --- a/R/utils.R +++ b/R/utils.R @@ -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]") diff --git a/man/get_r_string.Rd b/man/get_r_string.Rd index 9fe00ba69..418d0f17c 100644 --- a/man/get_r_string.Rd +++ b/man/get_r_string.Rd @@ -33,7 +33,7 @@ unlink(tmp) # 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]")