Skip to content

Commit 71a96da

Browse files
committed
Set the option in the app itself
1 parent f00fa71 commit 71a96da

File tree

3 files changed

+4
-7
lines changed

3 files changed

+4
-7
lines changed

inst/apps/126-async-ticks/app.R

+3
Original file line numberDiff line numberDiff line change
@@ -3,6 +3,9 @@ library(promises)
33
library(future)
44
plan(multisession)
55

6+
opts <- options(shiny.legacy.datatable = TRUE)
7+
onStop(function() options(opts))
8+
69
testForMissingRenderFunctions <- function() {
710
# If we add any render functions, they should be added to this test app. This test
811
# will make it obvious if we forget.
Loading

inst/apps/126-async-ticks/tests/testthat/test-mytest.R

+1-7
Original file line numberDiff line numberDiff line change
@@ -1,13 +1,7 @@
11
library(shinytest2)
22

33
test_that("Migrated shinytest test: mytest.R", {
4-
app <- AppDriver$new(
5-
variant = shinytest2::platform_variant(),
6-
# Use legacy datatable implementation just for the
7-
# info$datatable$colnames test below. We could, of course,
8-
# update that test, but it's also good to test the legacy.
9-
options = list(shiny.legacy.datatable = TRUE)
10-
)
4+
app <- AppDriver$new(variant = shinytest2::platform_variant())
115

126
app$expect_values()
137
app$expect_screenshot()

0 commit comments

Comments
 (0)