Skip to content

Commit

Permalink
test(310): Use latest chromote
Browse files Browse the repository at this point in the history
  • Loading branch information
gadenbuie committed Oct 27, 2023
1 parent b4f702c commit d906e10
Show file tree
Hide file tree
Showing 2 changed files with 7 additions and 4 deletions.
2 changes: 0 additions & 2 deletions inst/apps/310-bslib-sidebar-dynamic/app.R
Original file line number Diff line number Diff line change
Expand Up @@ -83,8 +83,6 @@ nested_sidebar <- function(idx = 0L) {
ui <- page_fixed(
h1("Dynamic Sidebars"),
tags$head(tags$title("bslib | Tests | Dynamic Sidebars")),
# Disable sidebar transitions for tests
tags$style(":root {--bslib-sidebar-transition-duration: 0ms};"),
p(
"Test dynamically added sidebars.",
"Each new layout is a nested layout with two sidebars.",
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@ library(shinytest2)

# Only take screenshots on mac + r-release to reduce diff noise
expect_screenshot_mac_release <- local({
release <- rversions::r_release()$version
release <- jsonlite::fromJSON("https://api.r-hub.io/rversions/resolve/release")$version
release <- paste0(
strsplit(release, ".", fixed = TRUE)[[1]][1:2],
collapse = "."
Expand Down Expand Up @@ -69,7 +69,12 @@ test_that("310-bslib-sidebar-dynamic: dynamically added sidebars are fully funct
width = 1200,
view = interactive(),
options = list(bslib.precompiled = FALSE),
expect_values_screenshot_args = FALSE
expect_values_screenshot_args = FALSE,
screenshot_args = list(
selector = "viewport",
delay = 0.5,
options = list(captureBeyondViewport = FALSE)
)
)

expect_sidebar_hidden <- expect_sidebar_hidden_factory(app)
Expand Down

0 comments on commit d906e10

Please sign in to comment.