@@ -44,8 +44,9 @@ snapshot_reject <- function(files = NULL, path = "tests/testthat") {
4444}
4545
4646# ' @rdname snapshot_accept
47+ # ' @param ... Additional arguments passed on to [shiny::runApp()].
4748# ' @export
48- snapshot_review <- function (files = NULL , path = " tests/testthat" ) {
49+ snapshot_review <- function (files = NULL , path = " tests/testthat" , ... ) {
4950 check_installed(c(" shiny" , " diffviewer" ), " to use snapshot_review()" )
5051
5152 changed <- snapshot_meta(files , path )
@@ -54,12 +55,12 @@ snapshot_review <- function(files = NULL, path = "tests/testthat") {
5455 return (invisible ())
5556 }
5657
57- review_app(changed $ name , changed $ cur , changed $ new )
58+ review_app(changed $ name , changed $ cur , changed $ new , ... )
5859 rstudio_tickle()
5960 invisible ()
6061}
6162
62- review_app <- function (name , old_path , new_path ) {
63+ review_app <- function (name , old_path , new_path , ... ) {
6364 stopifnot(
6465 length(name ) == length(old_path ),
6566 length(old_path ) == length(new_path )
@@ -147,7 +148,8 @@ review_app <- function(name, old_path, new_path) {
147148 shiny :: runApp(
148149 shiny :: shinyApp(ui , server ),
149150 quiet = TRUE ,
150- launch.browser = shiny :: paneViewer()
151+ launch.browser = shiny :: paneViewer(),
152+ ...
151153 )
152154 invisible ()
153155}
0 commit comments