shiny not working

I have recently bought a new laptop, installed R and RStudio, but Shiny doesn't respond.
Shiny library is installed and here is the sessioninfo. Any suggestions?

R version 3.6.2 (2019-12-12)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows 10 x64 (build 17763)

Matrix products: default

locale:
[1] LC_COLLATE=English_Australia.1252 LC_CTYPE=English_Australia.1252 LC_MONETARY=English_Australia.1252 LC_NUMERIC=C
[5] LC_TIME=English_Australia.1252

attached base packages:
[1] stats graphics grDevices utils datasets methods base

other attached packages:
[1] shiny_1.4.0

loaded via a namespace (and not attached):
[1] compiler_3.6.2 fastmap_1.0.1 magrittr_1.5 R6_2.4.1 promises_1.1.0 later_1.0.0 htmltools_0.4.0 tools_3.6.2 Rcpp_1.0.3
[10] digest_0.6.23 xtable_1.8-4 httpuv_1.5.2 mime_0.8 rlang_0.4.2
...

Please give an example of code that is not doing what you expect and describe what happens when you run it.

I'm running the Old Faithful Geyser example from the Shiny gallery. When I run the app I get a blank popup and RStudio hangs.

#
# This is a Shiny web application. You can run the application by clicking
# the 'Run App' button above.
#
# Find out more about building applications with Shiny here:
#
#    http://shiny.rstudio.com/
#

library(shiny)

# Define UI for application that draws a histogram
ui <- fluidPage(

    # Application title
    titlePanel("Old Faithful Geyser Data"),

    # Sidebar with a slider input for number of bins 
    sidebarLayout(
        sidebarPanel(
            sliderInput("bins",
                        "Number of bins:",
                        min = 1,
                        max = 50,
                        value = 30)
        ),

        # Show a plot of the generated distribution
        mainPanel(
           plotOutput("distPlot")
        )
    )
)

# Define server logic required to draw a histogram
server <- function(input, output) {

    output$distPlot <- renderPlot({
        # generate bins based on input$bins from ui.R
        x    <- faithful[, 2]
        bins <- seq(min(x), max(x), length.out = input$bins + 1)

        # draw the histogram with the specified number of bins
        hist(x, breaks = bins, col = 'darkgray', border = 'white')
    })
}

# Run the application 
shinyApp(ui = ui, server = server)

I'm having a similar issue with shiny 1.4.0. I have an app that works fine with shiny v1.3.2, it is run locally. The problem is that when updating to shiny 1.4.0 and running the app, it will not show any errors at all. It behaves normally, throws the usual "Listening on http://XXX.X.X.X:XXXX" and shows the UI with no data from server. If I try dummy apps, it works correctly, though.

Packages I'm using on the app are: shiny, leaflet, shinydashboard, leaflet.extras, and DT and uses several html tags and JS. I'm going to try and provide a reproducible example with an alternate mini-app.

Session info from working app:

> sessionInfo() 
R version 3.6.2 (2019-12-12)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows >= 8 x64 (build 9200)

Matrix products: default

Random number generation:
 RNG:     Mersenne-Twister 
 Normal:  Inversion 
 Sample:  Rounding 
 
locale:
[1] LC_COLLATE=English_United States.1252  LC_CTYPE=English_United States.1252    LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C                           LC_TIME=English_United States.1252    

attached base packages:
[1] stats     graphics  grDevices utils     datasets  methods   base     

other attached packages:
[1] magrittr_1.5         DT_0.11              leaflet.extras_1.0.0 shinydashboard_0.7.1 leaflet_2.0.3        shiny_1.3.2         

loaded via a namespace (and not attached):
 [1] Rcpp_1.0.3        rstudioapi_0.10   xtable_1.8-4      R6_2.4.1          rlang_0.4.2       tools_3.6.2       htmltools_0.4.0  
 [8] crosstalk_1.0.0   yaml_2.2.0        digest_0.6.23     crayon_1.3.4      zip_2.0.4         later_1.0.0       htmlwidgets_1.5.1
[15] promises_1.1.0    mime_0.8          openxlsx_4.1.4    stringi_1.4.5     compiler_3.6.2    jsonlite_1.6      httpuv_1.5.2

Session info from "not working" app:

> sessionInfo()
R version 3.6.2 (2019-12-12)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows >= 8 x64 (build 9200)

Matrix products: default

Random number generation:
 RNG:     Mersenne-Twister 
 Normal:  Inversion 
 Sample:  Rounding 
 
locale:
[1] LC_COLLATE=English_United States.1252  LC_CTYPE=English_United States.1252    LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C                           LC_TIME=English_United States.1252    

attached base packages:
[1] stats     graphics  grDevices utils     datasets  methods   base     

other attached packages:
[1] magrittr_1.5         DT_0.11              leaflet.extras_1.0.0 shinydashboard_0.7.1 leaflet_2.0.3        shiny_1.4.0         

loaded via a namespace (and not attached):
 [1] Rcpp_1.0.3        digest_0.6.23     later_1.0.0       mime_0.8          R6_2.4.1          jsonlite_1.6      xtable_1.8-4     
 [8] zip_2.0.4         rlang_0.4.2       stringi_1.4.5     promises_1.1.0    openxlsx_4.1.4    tools_3.6.2       htmlwidgets_1.5.1
[15] crosstalk_1.0.0   fastmap_1.0.1     httpuv_1.5.2      yaml_2.2.0        compiler_3.6.2    htmltools_0.4.0

I'm still having the problem. For a while the problem resolved itself, but now its back. The problem affects shiny and other dialog boxes like github. Any ideas?

1 Like

Any updates on this?

1 Like

Hi, did you finally resolve this issue? I am having the exact same challenge

Yes, I eventually found a post - its a rending issue. Roll RStudio back to an earlier version. I'm using Version 1.1.463

Thanks. Did you also have to roll back to an older version of the shiny package? or this worked with shiny 1.4.0?

This topic was automatically closed 7 days after the last reply. New replies are no longer allowed.