Skip to content

Commit

Permalink
Remove outputs from roxygen examples (#2575)
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil authored May 14, 2024
1 parent cbd0619 commit 6c2eb75
Show file tree
Hide file tree
Showing 2 changed files with 8 additions and 8 deletions.
8 changes: 4 additions & 4 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -226,8 +226,8 @@ platform_independent_sort <- function(x) x[platform_independent_order(x)]
#' writeLines("c('a', 'b')", tmp)
#' expr_as_xml <- get_source_expressions(tmp)$expressions[[1L]]$xml_parsed_content
#' writeLines(as.character(expr_as_xml))
#' get_r_string(expr_as_xml, "expr[2]") # "a"
#' get_r_string(expr_as_xml, "expr[3]") # "b"
#' get_r_string(expr_as_xml, "expr[2]")
#' get_r_string(expr_as_xml, "expr[3]")
#' unlink(tmp)
#'
#' # more importantly, extract strings under R>=4 raw strings
Expand All @@ -236,8 +236,8 @@ platform_independent_sort <- function(x) x[platform_independent_order(x)]
#' writeLines("c(R'(a\\b)', R'--[a\\\"\'\"\\b]--')", tmp4.0)
#' expr_as_xml4.0 <- get_source_expressions(tmp4.0)$expressions[[1L]]$xml_parsed_content
#' writeLines(as.character(expr_as_xml4.0))
#' get_r_string(expr_as_xml4.0, "expr[2]") # "a\\b"
#' get_r_string(expr_as_xml4.0, "expr[3]") # "a\\\"'\"\\b"
#' get_r_string(expr_as_xml4.0, "expr[2]")
#' get_r_string(expr_as_xml4.0, "expr[3]")
#' unlink(tmp4.0)
#'
#' @export
Expand Down
8 changes: 4 additions & 4 deletions 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 6c2eb75

Please sign in to comment.