rstudio / shinytest2

https://rstudio.github.io/shinytest2/
Other
108 stars 18 forks source link

shinytest2 fails to init `{golem}` app within the RStudio IDE #271

Open yogat3ch opened 2 years ago

yogat3ch commented 2 years ago

Hi shinytest2 devs, We're trying to set-up the shinytest2 package with a large golem app and running into issues each way we turn. The first of which is attempting to run the basic shinytest2 test.

The tests folder is organized as follows:

tests
├── testthat
│   ├── setup.R
│   ├── test-inst-apps.R
│   ├── test-shinytest2.R
│   └── test_unit_vuln_robust_def_input.R
└── testthat.R

test-inst-apps.R was an attempt to get the app running from the inst/test_app folder, but that never worked properly so it's now commented out.

The contents of test-shinytest2.R are as follows:

library(shinytest2)

test_that("Initial Shiny values are consistent", {
  app <-
    shinytest2::AppDriver$new(
      name = "Shiny_Driver1920x1080",
      seed = 1,
      height = 1920,
      width = 1080,
      options = options() |> purrr::list_modify(error = utils::recover, memoise = FALSE, use_local_crssDB = FALSE, use_db = TRUE)
    )

  app$expect_values()
})

The options configure the app to run properly.

Trying to run the tests with: testthat::test_dir("tests/testthat")

Results in the following error:

Caused by error in `app_start_shiny()`:
! Error starting shiny application:
Loading required package: shiny
i UU: `opts` & `toggle` functions were generated for the following options in '.Rprofile': use_db, max_policies, phase, use_local_crssDB, renv.config.auto.snapshot, memoise, use_reprex, use_debug, use_intro, shiny.autoload.r, shiny.testmode
Warning: replacing previous import 'ggplot2::last_plot' by 'plotly::last_plot' when loading 'dmdu'
attempt to load db
Running application in test mode.

Listening on http://127.0.0.1:4499
Error in .Call("rs_shinyviewer", url, getwd(), "browser", NULL, PACKAGE = "(embedding)") : 
  "rs_shinyviewer" not available for .Call() for package "(embedding)"

This had previously not been a problem as of a few months ago when trying to set up shinytest2 and running them with test_dir, but it's cropped up in the more recent version.

We've been pushing off building tests for the app because we're unable to get shinytest2 to work, but the app is getting large enough where it's becoming very cumbersome and time-consuming for every code review to run through all the app functionality manually to ensure breaks aren't occurring.

I'm hoping that with some help from the team at RStudio (Posit?) we can figure out how to put some shiny tests in place!

Thanks in advance for the assistance, Stephen

sessionInfo() R version 4.2.1 (2022-06-23) Platform: aarch64-apple-darwin20 (64-bit) Running under: macOS Monterey 12.6 Matrix products: default LAPACK: /Library/Frameworks/R.framework/Versions/4.2-arm64/Resources/lib/libRlapack.dylib locale: [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8 attached base packages: [1] stats graphics grDevices datasets utils methods base other attached packages: [1] dmdu_0.0.0.9001 shinytest2_0.2.0 testthat_3.1.4 shiny_1.7.2 loaded via a namespace (and not attached): [1] backports_1.4.1 plyr_1.8.7 lazyeval_0.2.2 websocket_1.4.1 tippy_1.0.0 crosstalk_1.2.1 [7] usethis_2.1.6 ggplot2_3.3.6 digest_0.6.29 htmltools_0.5.3 parsnip_1.0.1 fansi_1.0.3 [13] magrittr_2.0.3 checkmate_2.1.0 memoise_2.0.1 googlesheets4_1.0.0 config_0.3.1 tzdb_0.3.0 [19] remotes_2.4.2 readr_2.1.2 vroom_1.5.7 hardhat_1.2.0 prettyunits_1.1.1 colorspace_2.0-3 [25] rvest_1.0.3 xfun_0.33 dplyr_1.0.10 callr_3.7.2 crayon_1.5.2 cicerone_1.0.5.9000 [31] BOR_0.0.0.9000 jsonlite_1.8.0 roxygen2_7.2.1 tidyrules_0.1.5 glue_1.6.2 gtable_0.3.1 [37] gargle_1.2.0 sortable_0.4.6 pkgbuild_1.3.1 crssDB_0.5.2 scales_1.2.1 pool_0.1.6 [43] DBI_1.1.3 miniUI_0.1.1.1 Rcpp_1.0.9 viridisLite_0.4.1 xtable_1.8-4 echarty_1.4.5 [49] UU_0.32.0 learnr_0.10.1 bit_4.0.4 DT_0.23 profvis_0.3.7 htmlwidgets_1.5.4 [55] httr_1.4.4 ellipsis_0.3.2 urlchecker_1.0.1 pkgconfig_2.0.3 sass_0.4.2 chromote_0.1.1 [61] utf8_1.2.2 tidyselect_1.1.2 rlang_1.0.6 later_1.3.0 munsell_0.5.0 cellranger_1.1.0 [67] tools_4.2.1 cachem_1.0.6 cli_3.4.1 generics_0.1.3 english_1.2-6 devtools_2.4.4 [73] evaluate_0.16 stringr_1.4.1 fastmap_1.1.0 yaml_2.3.5 processx_3.7.0 knitr_1.40 [79] bit64_4.0.5 fs_1.5.2 purrr_0.3.4 reactable_0.3.0 mime_0.12 xml2_1.3.3 [85] brio_1.1.3 compiler_4.2.1 rstudioapi_0.14 plotly_4.10.0 curl_4.3.2 tibble_3.1.8 [91] bslib_0.4.0 stringi_1.7.8 ps_1.7.1 desc_1.4.2 virgaUtils_0.2.0 markdown_1.1 [97] shinyjs_2.1.0 vctrs_0.4.2 pillar_1.8.1 lifecycle_1.0.2 jquerylib_0.1.4 data.table_1.14.2 [103] cowplot_1.1.1 httpuv_1.6.6 patchwork_1.1.1 R6_2.5.1 RMySQL_0.10.23 promises_1.2.0.1 [109] renv_0.16.0 rpart.plot_3.1.1 sessioninfo_1.2.2 assertthat_0.2.1 pkgload_1.3.0 golem_0.3.4 [115] bs4Dash_2.1.0 rprojroot_2.0.3 shinyWidgets_0.7.1 withr_2.5.0 parallel_4.2.1 hms_1.1.2 [121] shinyvalidate_0.1.2 grid_4.2.1 rpart_4.1.16 tidyr_1.2.1 waldo_0.4.0 rmarkdown_2.16 [127] attempt_0.3.1 snakecase_0.11.0 googledrive_2.0.0 lubridate_1.8.0
schloerke commented 2 years ago

Hi @yogat3ch !

There are some rough experiences given how {golem} is forcing a pkgload::load_all(). However, it should work.

The error is an IDE error. Does it work if you run it outside of the IDE (or in a terminal session)?


Side note: Instead of testthat::test_dir("tests/testthat"), you should be able to call shinytest2::test_app().

yogat3ch commented 2 years ago

Hi @schloerke, Thanks for the response and sorry about the extended delay on getting back to you! We had three sprint weeks on a different project so I have not had time to experiment with this until now.

I tried using shinytest2::test_app from the console and when doing so I encounter the following error: image The error is identical if hitting Run Tests from the Build pane.

I tried changing theapp_dir for shinytest2::AppDriver$new to "../../" and I think it started recursively loading the app: image

I'm not sure how I would run shiny tests from a terminal session. Still at a loss for how to get basic up & running with shinytest2

schloerke commented 2 years ago

Can I have you update to the latest RStudio IDE?


To run from the terminal, select the "Terminal" window pane in the IDE. Then enter R to start the R process. Given you're in your app folder, try shinytest2::record_test() from within the terminal.

yogat3ch commented 2 years ago

Hi @schloerke, I just updated RStudio to 2022.07.2+576.

My setup-shinytest2.R looks as follows:

library(shinytest2)

test_that("Initial Shiny values are consistent", {
  devtools::load_all(pkgload::pkg_path())
  shinytest2::load_app_env()

  app <-
    shinytest2::AppDriver$new(
      name = "Shiny_Driver1920x1080",
      seed = 1,
      height = 1920,
      width = 1080,
      options = options() |> purrr::list_modify(error = utils::recover, memoise = FALSE, use_local_crssDB = FALSE, use_db = TRUE)
    )

  app$expect_values()
})

I ran shinytest2::record_test() from the terminal and it works better than expected as y'all seem to have added the ability to catch a great deal more browser events than previously! I recorded a test with the app and saved it. I opened the file created by the tests and hit the "Run Tests" button. The output is as follows:

image

The error:

── Error (setup-shinytest2.R:7:3): Initial Shiny values are consistent ─────────
Error in `app_initialize(self, private, app_dir = app_dir, ..., load_timeout = load_timeout, 
    timeout = timeout, wait = wait, expect_values_screenshot_args = expect_values_screenshot_args, 
    screenshot_args = screenshot_args, check_names = check_names, 
    name = name, variant = variant, view = view, height = height, 
    width = width, seed = seed, clean_logs = clean_logs, shiny_args = shiny_args, 
    render_args = render_args, options = options)`: Can't find `tests/testthat/` in current directory.

i You can inspect the failed AppDriver object via `rlang::last_error()$app`
i AppDriver logs:
{shinytest2} R info 11:51:32.98 Start AppDriver initialization
{shinytest2} R info 11:51:32.98 Error while initializing AppDriver:
                                Can't find `tests/testthat/` in current directory.

Caused by error in `testthat::test_path()`:
! Can't find `tests/testthat/` in current directory.

is the same as when trying to run the setup-shinytest2.R file, so I think it's caused by the loading of the test app in that file. Running shinytest2::test_app from the terminal has the same result. Thoughts?

sessionInfo() (from the terminal session) ``` R version 4.2.1 (2022-06-23) Platform: aarch64-apple-darwin20 (64-bit) Running under: macOS Monterey 12.6 Matrix products: default BLAS: /Library/Frameworks/R.framework/Versions/4.2-arm64/Resources/lib/libRblas.0.dylib LAPACK: /Library/Frameworks/R.framework/Versions/4.2-arm64/Resources/lib/libRlapack.dylib locale: [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8 attached base packages: [1] stats graphics grDevices datasets utils methods base other attached packages: [1] shiny_1.7.2 dmdu_0.0.0.9001 shinytest2_0.2.0 testthat_3.1.4 loaded via a namespace (and not attached): [1] websocket_1.4.1 colorspace_2.0-3 ellipsis_0.3.2 [4] rprojroot_2.0.3 snakecase_0.11.0 markdown_1.1 [7] fs_1.5.2 rstudioapi_0.14 roxygen2_7.2.1 [10] remotes_2.4.2 bit64_4.0.5 DT_0.23 [13] chromote_0.1.1 golem_0.3.4 fansi_1.0.3 [16] lubridate_1.8.0 xml2_1.3.3 cachem_1.0.6 [19] knitr_1.40 config_0.3.1 pkgload_1.3.0 [22] jsonlite_1.8.2 tippy_1.0.0 readr_2.1.2 [25] compiler_4.2.1 BOR_0.0.0.9000 httr_1.4.4 [28] backports_1.4.1 assertthat_0.2.1 fastmap_1.1.0 [31] lazyeval_0.2.2 cli_3.4.1 later_1.3.0 [34] htmltools_0.5.3 prettyunits_1.1.1 tools_4.2.1 [37] gtable_0.3.1 glue_1.6.2 dplyr_1.0.10 [40] Rcpp_1.0.9 sortable_0.4.6 jquerylib_0.1.4 [43] vctrs_0.4.2 crosstalk_1.2.1 parsnip_1.0.1 [46] xfun_0.33 stringr_1.4.1 ps_1.7.1 [49] brio_1.1.3 rvest_1.0.3 english_1.2-6 [52] UU_0.34.1 mime_0.12 miniUI_0.1.1.1 [55] lifecycle_1.0.2 shinyvalidate_0.1.2 renv_0.16.0 [58] devtools_2.4.4 scales_1.2.1 vroom_1.5.7 [61] hms_1.1.2 promises_1.2.0.1 parallel_4.2.1 [64] virgaUtils_0.3.0 curl_4.3.2 rpart.plot_3.1.1 [67] yaml_2.3.5 memoise_2.0.1 ggplot2_3.3.6 [70] sass_0.4.2 rpart_4.1.16 stringi_1.7.8 [73] desc_1.4.2 RMySQL_0.10.23 cicerone_1.0.5.9000 [76] checkmate_2.1.0 echarty_1.4.5 hardhat_1.2.0 [79] pkgbuild_1.3.1 attempt_0.3.1 rlang_1.0.6 [82] pkgconfig_2.0.3 evaluate_0.16 purrr_0.3.4 [85] patchwork_1.1.1 htmlwidgets_1.5.4 bit_4.0.4 [88] cowplot_1.1.1 processx_3.7.0 tidyselect_1.1.2 [91] shinyVirga_0.0.0.9002 learnr_0.10.1 plyr_1.8.7 [94] magrittr_2.0.3 R6_2.5.1 generics_0.1.3 [97] profvis_0.3.7 DBI_1.1.3 pillar_1.8.1 [100] withr_2.5.0 tibble_3.1.8 reactable_0.3.0 [103] crayon_1.5.2 shinyWidgets_0.7.1 bs4Dash_2.1.0 [106] utf8_1.2.2 plotly_4.10.0 rmarkdown_2.16 [109] tzdb_0.3.0 crssDB_0.6.3 urlchecker_1.0.1 [112] tidyrules_0.1.5 usethis_2.1.6 grid_4.2.1 [115] data.table_1.14.2 callr_3.7.2 digest_0.6.29 [118] xtable_1.8-4 tidyr_1.2.1 httpuv_1.6.6 [121] pool_0.1.6 munsell_0.5.0 viridisLite_0.4.1 [124] bslib_0.4.0 sessioninfo_1.2.2 shinyjs_2.1.0 ```
yogat3ch commented 2 years ago

Hi @schloerke,

In attempting to debug, I modified setup-shinytest2.R as follows to print the absolute path of the directory since the error indicates that app_initialize cant find tests/testthat in the current directory:

library(shinytest2)

test_that("Initial Shiny values are consistent", {
  devtools::load_all(pkgload::pkg_path())
  load_app_env <- function (app_dir = "../../", renv = rlang::caller_env(), globalrenv = rlang::caller_env())
  {
    print(fs::path_abs(app_dir))
    shiny::loadSupport(app_dir, renv = renv, globalrenv = globalrenv)
  }

  load_app_env()

  app <-
    shinytest2::AppDriver$new(
      name = "Shiny_Driver1920x1080",
      seed = 1,
      height = 1920,
      width = 1080,
      options = options() |> purrr::list_modify(error = utils::recover, memoise = FALSE, use_local_crssDB = FALSE, use_db = TRUE)
    )

  app$expect_values()
})
# Load application support files into testing environment
shinytest2::load_app_env()

The location of setup-shinytest2.R can be seen in the subsection of this screenshot of the directory tree (the full tree is massive and would be confusing to display). The left most branch is the root folder of the golem package. It can be seen that tests/testthat is directly in the root folder. image

When I run this file with the RStudio IDE, the print statement indicates that the app_dir argument evaluates to the root golem directory, so the load_app_env isn't the culprit.

The shinytest2::AppDriver was throwing the error. I modified the call to specify the app_dir as it uses testthat::test_path("../../") which resolves to "tests/testthat/../../" which doesn't look right. The app_dir now points to the package root.

debug(shinytest2:::app_start_shiny)
  app <-
    try(shinytest2::AppDriver$new(
      app_dir = pkgload::pkg_path(),
      name = "Shiny_Driver1920x1080",
      seed = 1,
      height = 1920,
      width = 1080,
      options = options() |> purrr::list_modify(error = rlang::trace_back, memoise = FALSE, use_local_crssDB = FALSE, use_db = TRUE)
    ))
print(app)

I also added a debug and a try + print combination for more verbose logging.

When I run this via the RStudio IDE, I now encounter the error:

i You can inspect the failed AppDriver object via `rlang::last_error()$app`
i AppDriver logs:
{shinytest2} R info   15:07:41.00 Start AppDriver initialization
{shinytest2} R info   15:07:41.00 Starting Shiny app
{shinytest2} R info   15:07:42.07 Error while initializing AppDriver:
                                  Error starting shiny application:
                                  Loading required package: shiny
                                  Warning in loadSupport(appDir, renv = sharedEnv, globalrenv = NULL) :
                                    Loading R/ subdirectory for Shiny application, but this directory appears to contain an R package. Sourcing files in R/ may cause unexpected behavior.
                                  i UU: `opts` & `toggle` functions were generated for the following options in '.Rprofile': use_db, max_policies, phase, use_local_crssDB, renv.config.auto.snapshot, memoise, use_reprex, use_debug, use_intro, shiny.autoload.r, shiny.testmode
                                  Error in standardise_path(file) : object 'dirs' not found
{shiny}      R stderr ----------- Loading required package: shiny
{shiny}      R stderr ----------- Warning in loadSupport(appDir, renv = sharedEnv, globalrenv = NULL) :
{shiny}      R stderr -----------   Loading R/ subdirectory for Shiny application, but this directory appears to contain an R package. Sourcing files in R/ may cause unexpected behavior.
{shiny}      R stderr ----------- i UU: `opts` & `toggle` functions were generated for the following options in '.Rprofile': use_db, max_policies, phase, use_local_crssDB, renv.config.auto.snapshot, memoise, use_reprex, use_debug, use_intro, shiny.autoload.r, shiny.testmode
{shiny}      R stderr ----------- Error in standardise_path(file) : object 'dirs' not found

Caused by error in `app_start_shiny()`:
! Error starting shiny application:
Loading required package: shiny
Warning in loadSupport(appDir, renv = sharedEnv, globalrenv = NULL) :
  Loading R/ subdirectory for Shiny application, but this directory appears to contain an R package. Sourcing files in R/ may cause unexpected behavior.
i UU: `opts` & `toggle` functions were generated for the following options in '.Rprofile': use_db, max_policies, phase, use_local_crssDB, renv.config.auto.snapshot, memoise, use_reprex, use_debug, use_intro, shiny.autoload.r, shiny.testmode
Error in standardise_path(file) : object 'dirs' not found
---
Backtrace:
  1. base::try(...)
       at tests/testthat/setup-shinytest2.R:7:2
  6. shinytest2::AppDriver$new(...)
  7. shinytest2 (local) initialize(...)
  8. shinytest2:::app_initialize(...)
 10. shinytest2:::app_initialize_(self, private, ..., view = view)
 11. shinytest2:::app_start_shiny(...)
── Warning (setup-shinytest2.R:4:3): Initial Shiny values are consistent ───────
replacing previous import 'ggplot2::last_plot' by 'plotly::last_plot' when loading 'dmdu'
Backtrace:
  1. devtools::load_all(pkgload::pkg_path())
       at tests/testthat/setup-shinytest2.R:4:2
  2. pkgload::load_all(...)
  3. pkgload:::load_imports(path)
  4. pkgload:::process_imports(path)
  9. base::namespaceImport(...)
 10. base::namespaceImportFrom(...)

dirs is a list object with functions that conveniently create file paths to various locations in the golem package. It executes before it's used due to roxygen2 @include statements in necessary locations.

When I try to run the code in this file at the console, I encounter the rs_shinyviewer error from earlier. When I run shinytest2::test_app() from the terminal I am able to debug inside of app_start_shiny where I can see that the app starts successfully. The tests run, and when it gets to this setup file, I encounter the same error as when it runs via the RStudio IDE.

Two questions. The first implied by this error:

schloerke commented 2 years ago
  • Does shinytest2 respect package collate order?

Ah! Interesting. No it does not.

{shinytest2} uses ./tests/testthat/setup-shinytest2.R to call shinytest2::load_app_env(). That method does not respect collate.

Some changes can be made:

{shinytest2} just calls shiny::runApp(). {golem} apps try to load the R folder for you via pkgload::load_all().

  • Does shinytest2 load the project level ,Renviron file in the background task in which it runs the app?

Ah! Interesting. No it does not.

But it can!


I'll make a PR for the second bullet. Please let me know how the adjustments for the first bullet work for you!

yogat3ch commented 2 years ago

Hi @schloerke, Thank you for the tips! The app now boots successfully and passes the default "initial values" test. I ran the test I recorded with record_test and am realizing that it did not pick up Datatable click actions, which are central to the interaction with our app. When I was previously working on this, I developed some JS functions that use jQuery to reproduce these DT row clicks. I was able to set up some javascript functions that checked for the presence of various DOM elements on the page. Much of our testing requires this pattern: click some datatable rows, verify some DOM elements.

This was easy to do when I could just run the app loading code:

app <-
  try(shinytest2::AppDriver$new(
    app_dir = pkgload::pkg_path(),
    variant = platform_variant(),
    name = "Shiny_Driver1920x1080",
    seed = 1,
    height = 865,
    width = 1211,
    options = options() |> purrr::list_modify(error = rlang::trace_back, memoise = FALSE, use_local_crssDB = FALSE, use_db = TRUE)
  ))

from the console, use app$view(), then proceed to use the app$run_js()/app$get_js() to execute tests of this nature.

However, recent updates to shinytest2 now prevent the app from loading at the console due to the rs_shinyviewer error:

Error in .Call("rs_shinyviewer", url, getwd(), "browser", NULL, PACKAGE = "(embedding)") : 
 "rs_shinyviewer" not available for .Call() for package "(embedding)"

I am however, thanks to this conversation, now able to get the app running from the terminal, and use app$view to see the running app to develop jQuery based tests!

Do you have any ideas as to how to overcome the rs_shinyviewer bug? Should I open a new issue for that?

Thank you for all of your help and for the PR!

yogat3ch commented 1 year ago

Hi @schloerke, I've run into a wall with this workaround. I just updated the package to see any of these issues have been addressed but it doesn't appear so.

I tried running the app at the console and it encounters the same error as this issue was opened for:

Error in .Call("rs_shinyviewer", url, getwd(), "browser", NULL, PACKAGE = "(embedding)") : 
"rs_shinyviewer" not available for .Call() for package "(embedding)"

However, I'm also now unable to use the terminal session workaround, app$view() results in this error:

image

I've taken a look at the logs for the terminal session and there don't appear to be any R or Javascript errors that would cause it to fail.

I've reset chrome devtools to default settings to no avail. I'm running Chrome Version 111.0.5563.64 (Official Build) (arm64). My coworkers machine does not seem to experience this issue.

Any ideas on how to resolve this? I'm basically SOL on using shinytest2 at all at this point and our testing framework is failing because I can't maintain it due to the bugs with view

Any assistance will be much appreciated 🙏

`devtools::session_info()` ``` ─ Session info ─────────────────────────────────────────────────────────────────────────────────── setting value version R version 4.2.1 (2022-06-23) os macOS Ventura 13.2.1 system aarch64, darwin20 ui RStudio language (EN) collate en_US.UTF-8 ctype en_US.UTF-8 tz America/New_York date 2023-03-14 rstudio 2022.12.0+353 Elsbeth Geranium (desktop) pandoc 2.19.2 @ /Applications/RStudio.app/Contents/Resources/app/quarto/bin/tools/ (via rmarkdown) ─ Packages ─────────────────────────────────────────────────────────────────────────────────────── ! package * version date (UTC) lib source assertthat 0.2.1 2019-03-21 [1] CRAN (R 4.2.0) P attempt 0.3.1 2020-05-03 [?] CRAN (R 4.2.0) backports 1.4.1 2021-12-13 [1] CRAN (R 4.2.0) P bit 4.0.4 2020-08-04 [?] CRAN (R 4.2.0) P bit64 4.0.5 2020-08-30 [?] CRAN (R 4.2.0) BOR 0.4.0 2023-01-31 [1] Github (Martin-McCoy/BOR@7ac64a0) brio 1.1.3 2021-11-30 [1] CRAN (R 4.2.0) P bs4Dash 2.2.1 2023-02-11 [?] Github (yogat3ch/bs4Dash@e43aa79) P bslib 0.4.2 2022-12-16 [?] CRAN (R 4.2.0) cachem 1.0.6 2021-08-19 [1] CRAN (R 4.2.0) callr 3.7.2 2022-08-22 [1] CRAN (R 4.2.1) checkmate 2.1.0 2022-04-21 [1] CRAN (R 4.2.0) chromote 0.1.1 2022-09-07 [1] CRAN (R 4.2.0) cicerone 1.0.5.9000 2022-09-29 [1] Github (JohnCoene/cicerone@1f28ea4) P cli 3.6.0 2023-01-09 [?] CRAN (R 4.2.0) P colorspace 2.0-3 2022-02-21 [?] CRAN (R 4.2.0) P config 0.3.1 2020-12-17 [?] CRAN (R 4.2.0) crayon 1.5.2 2022-09-29 [1] CRAN (R 4.2.1) crosstalk 1.2.1 2022-10-26 [1] Github (Martin-McCoy/crosstalk@7f1b582) crssDB 1.0.0 2023-01-31 [1] Github (Martin-McCoy/crssDB@32cd781) P curl 4.3.3 2022-10-06 [?] CRAN (R 4.2.0) data.table 1.14.2 2021-09-27 [1] CRAN (R 4.2.0) DBI 1.1.3 2022-06-18 [1] CRAN (R 4.2.0) P desc 1.4.2 2022-09-08 [?] CRAN (R 4.2.1) devtools 2.4.5 2022-10-11 [1] CRAN (R 4.2.0) P digest 0.6.31 2022-12-11 [?] CRAN (R 4.2.0) P dmdu * 1.1.0 2023-03-03 [?] load_all() P dplyr 1.1.0 2023-01-29 [?] CRAN (R 4.2.0) P DT 0.27 2023-01-17 [?] CRAN (R 4.2.0) P echarts4r 0.4.4 2022-05-28 [?] CRAN (R 4.2.0) echartsUtils 0.4.4 2023-03-09 [1] Github (yogat3ch/echartsUtils@8e62603) echarty 1.4.5 2022-04-01 [1] CRAN (R 4.2.1) P ellipsis 0.3.2 2021-04-29 [?] CRAN (R 4.2.0) english 1.2-6 2021-08-21 [1] CRAN (R 4.2.0) evaluate 0.16 2022-08-09 [1] CRAN (R 4.2.0) P fansi 1.0.3 2022-03-24 [?] CRAN (R 4.2.0) fastmap 1.1.0 2021-01-25 [1] CRAN (R 4.2.0) VP fs 1.5.2 2023-02-06 [?] CRAN (R 4.2.0) (on disk 1.6.1) P generics 0.1.3 2022-07-05 [?] CRAN (R 4.2.0) P ggplot2 3.3.6 2022-05-03 [?] CRAN (R 4.2.0) P glue 1.6.2 2022-02-24 [?] CRAN (R 4.2.0) P golem 0.3.4 2022-09-26 [?] CRAN (R 4.2.0) gtable 0.3.1 2022-09-01 [1] CRAN (R 4.2.0) P hardhat 1.2.0 2022-06-30 [?] CRAN (R 4.2.0) P hms 1.1.2 2022-08-19 [?] CRAN (R 4.2.0) P htmltools 0.5.4 2022-12-07 [?] CRAN (R 4.2.0) htmlwidgets 1.5.4 2021-09-08 [1] CRAN (R 4.2.0) P httpuv 1.6.8 2023-01-12 [?] CRAN (R 4.2.0) httr 1.4.4 2022-08-17 [1] CRAN (R 4.2.0) jquerylib 0.1.4 2021-04-26 [1] CRAN (R 4.2.0) P jsonlite 1.8.4 2022-12-06 [?] CRAN (R 4.2.1) knitr 1.40 2022-08-24 [1] CRAN (R 4.2.0) later 1.3.0 2021-08-18 [1] CRAN (R 4.2.0) P lazyeval 0.2.2 2019-03-15 [?] CRAN (R 4.2.0) learnr 0.10.1 2020-02-13 [1] CRAN (R 4.2.0) P lifecycle 1.0.3 2022-10-07 [?] CRAN (R 4.2.0) P lubridate 1.9.0 2022-11-06 [?] CRAN (R 4.2.1) P magrittr 2.0.3 2022-03-30 [?] CRAN (R 4.2.0) markdown 1.1 2019-08-07 [1] CRAN (R 4.2.0) memoise 2.0.1 2021-11-26 [1] CRAN (R 4.2.0) mime 0.12 2021-09-28 [1] CRAN (R 4.2.0) miniUI 0.1.1.1 2018-05-18 [1] CRAN (R 4.2.0) P munsell 0.5.0 2018-06-12 [?] CRAN (R 4.2.0) OpenMCE 1.0.0 2022-11-30 [1] Github (yogat3ch/OpenMCE@ff7549a) P parsnip 1.0.2 2022-10-01 [?] CRAN (R 4.2.0) P pillar 1.8.1 2022-08-19 [?] CRAN (R 4.2.0) pkgbuild 1.3.1 2021-12-20 [1] CRAN (R 4.2.0) P pkgconfig 2.0.3 2019-09-22 [?] CRAN (R 4.2.0) pkgload 1.3.0 2022-06-27 [1] CRAN (R 4.2.0) P plotly 4.10.1 2022-11-07 [?] CRAN (R 4.2.1) P plyr 1.8.7 2022-03-24 [?] CRAN (R 4.2.0) pool 0.1.6 2021-01-14 [1] CRAN (R 4.2.0) P prettyunits 1.1.1 2020-01-24 [?] CRAN (R 4.2.0) processx 3.7.0 2022-07-07 [1] CRAN (R 4.2.0) profvis 0.3.7 2020-11-02 [1] CRAN (R 4.2.0) promises 1.2.0.1 2021-02-11 [1] CRAN (R 4.2.0) ps 1.7.1 2022-06-18 [1] CRAN (R 4.2.0) purrr 1.0.1 2023-01-10 [1] CRAN (R 4.2.0) P R6 2.5.1 2021-08-19 [?] CRAN (R 4.2.0) P RColorBrewer 1.1-3 2022-04-03 [?] CRAN (R 4.2.0) VP Rcpp 1.0.9 2023-01-22 [?] CRAN (R 4.2.0) (on disk 1.0.10) P readr 2.1.2 2022-01-30 [?] CRAN (R 4.2.0) remotes 2.4.2 2021-11-30 [1] CRAN (R 4.2.0) renv 0.16.0 2022-09-29 [1] CRAN (R 4.2.1) P rlang 1.0.6 2022-09-24 [?] CRAN (R 4.2.0) P rmarkdown 2.20 2023-01-19 [?] CRAN (R 4.2.0) RMySQL 0.10.23 2021-12-14 [1] CRAN (R 4.2.0) roxygen2 7.2.1 2022-07-18 [1] CRAN (R 4.2.0) P rpart 4.1.16 2022-01-24 [?] CRAN (R 4.2.1) P rpart.plot 3.1.1 2022-05-21 [?] CRAN (R 4.2.0) rprojroot 2.0.3 2022-04-02 [1] CRAN (R 4.2.0) P rstudioapi 0.14 2022-08-22 [?] CRAN (R 4.2.0) P sass 0.4.5 2023-01-24 [?] CRAN (R 4.2.0) scales 1.2.1 2022-08-20 [1] CRAN (R 4.2.0) sessioninfo 1.2.2 2021-12-06 [1] CRAN (R 4.2.0) P shiny 1.7.4 2022-12-15 [?] CRAN (R 4.2.0) P shiny.tailwind 0.2.2 2023-02-11 [?] Github (kylebutts/shiny.tailwind@76b7c02) P shinyjs 2.1.0 2021-12-23 [?] CRAN (R 4.2.0) P shinytest2 * 0.2.1.9000 2023-03-14 [?] Github (rstudio/shinytest2@b8fdce6) shinyvalidate 0.1.2 2022-04-21 [1] CRAN (R 4.2.0) shinyVirga 0.20.1 2023-03-06 [1] Github (Martin-McCoy/shinyVirga@267000d) P shinyWidgets 0.7.6 2023-01-08 [?] CRAN (R 4.2.0) snakecase 0.11.0 2019-05-25 [1] CRAN (R 4.2.0) sortable 0.4.6 2022-08-14 [1] CRAN (R 4.2.0) stringi 1.7.8 2022-07-11 [1] CRAN (R 4.2.0) P stringr 1.5.0 2022-12-02 [?] CRAN (R 4.2.0) testthat * 3.1.6 2022-12-09 [1] CRAN (R 4.2.0) P tibble 3.1.8 2022-07-22 [?] CRAN (R 4.2.0) P tidyr 1.2.1 2022-09-08 [?] CRAN (R 4.2.1) tidyrules 0.1.5 2020-06-04 [1] CRAN (R 4.2.0) P tidyselect 1.2.0 2022-10-10 [?] CRAN (R 4.2.0) P timechange 0.1.1 2022-11-04 [?] CRAN (R 4.2.1) P tippy 1.0.0 2023-01-31 [?] Github (JohnCoene/tippy@c3c3a2a) P tzdb 0.3.0 2022-03-28 [?] CRAN (R 4.2.0) urlchecker 1.0.1 2021-11-30 [1] CRAN (R 4.2.0) usethis 2.1.6 2022-05-25 [1] CRAN (R 4.2.0) P utf8 1.2.2 2021-07-24 [?] CRAN (R 4.2.0) UU 1.19.0 2023-03-03 [1] Github (yogat3ch/UU@05f5df3) P vctrs 0.5.2 2023-01-23 [?] CRAN (R 4.2.0) virgaUtils 0.4.0 2023-01-31 [1] Github (Martin-McCoy/virgaUtils@b7477f6) viridisLite 0.4.1 2022-08-22 [1] CRAN (R 4.2.0) P vroom 1.5.7 2021-11-30 [?] CRAN (R 4.2.0) websocket 1.4.1 2021-08-18 [1] CRAN (R 4.2.0) P withr 2.5.0 2022-03-03 [?] CRAN (R 4.2.0) P xfun 0.36 2022-12-21 [?] CRAN (R 4.2.0) xml2 1.3.3 2021-11-30 [1] CRAN (R 4.2.0) xtable 1.8-4 2019-04-21 [1] CRAN (R 4.2.0) yaml 2.3.5 2022-02-21 [1] CRAN (R 4.2.0) P yardstick 1.1.0 2022-09-07 [?] CRAN (R 4.2.0) [1] /Users/stephenholsenbeck/Library/Caches/org.R-project.R/R/renv/library/dmdu-4393acb2/R-4.2/aarch64-apple-darwin20 [2] /Users/stephenholsenbeck/Documents/R/Contributor_Repos/VirgaLabs/dmdu/renv/sandbox/R-4.2/aarch64-apple-darwin20/84ba8b13 V ── Loaded and on-disk version mismatch. P ── Loaded and on-disk path mismatch. ────────────────────────────────────────────────────────────────────────────────────────────────── ```
schloerke commented 1 year ago

I can reprex {chromote} disconnecting by making a new AppDriver. This is unrelated to {golem} / RStudio IDE. Making a new issue for better tracking.