rstudio / shinycoreci-apps

SUPERSEDED - Apps for Shiny continuous integration testing
Other
36 stars 4 forks source link

GHA: "206-freeze-thaw" shinyjster test failure #143

Closed MadhulikaTanuboddi closed 3 years ago

MadhulikaTanuboddi commented 3 years ago

Run the shinyjster test for the app https://github.com/rstudio/shinycoreci-apps/blob/master/apps/206-freeze-thaw/app.R The test fails on the last step.

> runApp('apps/206-freeze-thaw')

Listening on http://127.0.0.1:6980
shinyjster - Progress: 1/4 (waiting)
shinyjster - Progress: 1/4 (running)
shinyjster - Progress: 2/4 (waiting)
shinyjster - Progress: 3/4 (waiting)
shinyjster - Progress: 3/4 (running)
shinyjster - Progress: 4/4 (waiting)
shinyjster - Progress: 4/4 (running) - Error found: 'Fail' does not equal 'OK'
shinyjster - JS error found! Error:
    msg: 'Fail' does not equal 'OK'
    x: Fail
    y: OK
    xStr: 'Fail'
    yStr: 'OK'
    yStr: 'OK'
206-freeze-thaw-shinyjster-test-failure

Could this be related to the recent tabset/tabset panel changes?

Note: Reviewing the runTests history, this is build this test started failing from https://github.com/rstudio/shinycoreci-apps/runs/2516442456?check_suite_focus=true

so around 7 days ago, from ~May 5th

cpsievert commented 3 years ago

Here's a minimal example

library(shiny)

ui <- fluidPage(
  uiOutput("tabs")
)

server <- function(input, output, session) {
  output$tabs <- renderUI({
    tabsetPanel(
      tabPanel("A", "a"),
      tabPanel("B", "b")
    )
  })
}

shinyApp(ui, server)
Screen Shot 2021-05-13 at 12 58 37 PM

The .active tab styling doesn't show up because this renderHook never gets called because renderUI() runs through shiny:::processDeps() which uses doRenderTags() (not renderTags())