Skip to content

Commit

Permalink
use released version of lzstring
Browse files Browse the repository at this point in the history
  • Loading branch information
pawelru committed Oct 22, 2024
1 parent c1f1a4e commit aa8fe8a
Show file tree
Hide file tree
Showing 2 changed files with 52 additions and 7 deletions.
2 changes: 0 additions & 2 deletions DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -23,8 +23,6 @@ Suggests:
pkgdown (>= 2.0.0),
testthat (>= 3.1.5),
withr (>= 2.4.3)
Remotes:
lzstring=parmsam/lzstring-r
Config/Needs/verdepcheck: tidyverse/glue, jeroen/jsonlite,
lzstring=parmsam/lzstring-r, r-lib/roxygen2, tidyverse/stringr,
r-lib/pkgdown, r-lib/testthat, r-lib/withr
Expand Down
57 changes: 52 additions & 5 deletions tests/testthat/test-tag_examplesShinylive.R
Original file line number Diff line number Diff line change
Expand Up @@ -84,7 +84,7 @@ test_that("examplesShinylive tag - multiple occurrences", {
)
})

test_that("examplesShinylive tag - don't use previous example code", {
test_that("examplesShinylive tag - on default use only next example code", {
text <- "
#' This is a title
#'
Expand All @@ -94,10 +94,10 @@ test_that("examplesShinylive tag - don't use previous example code", {
#' @export
#'
#' @examples
#' x <- 'this is excluded'
#' 'this is excluded'
#' @examplesShinylive
#' @examples
#' f(1, 2)
#' 'this is included'
f <- function(x, y) x + y
"
expect_silent(block <- roxygen2::parse_text(text)[[1]])
Expand All @@ -108,11 +108,11 @@ test_that("examplesShinylive tag - don't use previous example code", {
)
expect_identical(
roxygen2::block_get_tag(block, "examplesShinylive")$raw,
"\nf(1, 2)"
"\n'this is included'"
)
expect_identical(
roxygen2::block_get_tag_value(block, "examplesShinylive"),
"https://shinylive.io/r/app/#code=NobwRAdghgtgpmAXGKAHVA6ASmANGAYwHsIAXOMpMAHQgDMAKARlwAIAmASjAF8BdIA"
"https://shinylive.io/r/app/#code=NobwRAdghgtgpmAXGKAHVA6ASmANGAYwHsIAXOMpMAHQgHJSALASwGcACNziAgGwFcAJnEF0wAXwC6QA"
)
})

Expand Down Expand Up @@ -354,3 +354,50 @@ test_that("format returns Rd parsable to tidy HTML", {
testthat::expect_setequal(tidy_res, character(0))
})
})

test_that("examplesShinylive tag - respect order of tags - before examples", {
text <- "
#' This is a title
#'
#' This is the description.
#'
#' @param x,y A number
#' @export
#' @examplesShinylive
#' @examples
#' f(1, 2)
f <- function(x, y) x + y
"
expect_silent(block <- roxygen2::parse_text(text)[[1]])

block_tag_names <- vapply(block$tags, `[[`, character(1), "tag")

expect_lt(
which(block_tag_names == "examplesShinylive"),
which(block_tag_names == "examples")
)
})

test_that("examplesShinylive tag - respect order of tags - after examples", {
text <- "
#' This is a title
#'
#' This is the description.
#'
#' @param x,y A number
#' @export
#' @examples
#' f(1, 2)
#' @examplesShinylive
#' {{ prev_example }}
f <- function(x, y) x + y
"
expect_silent(block <- roxygen2::parse_text(text)[[1]])

block_tag_names <- vapply(block$tags, `[[`, character(1), "tag")

expect_gt(
which(block_tag_names == "examplesShinylive"),
which(block_tag_names == "examples")
)
})

0 comments on commit aa8fe8a

Please sign in to comment.