How to solve Error when trying to deploy shiny app or flexdashboard on shinyapps.io?

I get the following Error message, when trying to publish even the shiny tutorial example "Hello Shiny" from here to my shinyapps.io account:

Error in `$<-.data.frame`(`*tmp*`, "config_url", value = "https://www.shinyapps.io/admin/#/application/") : replacement has 1 row, data has 0

The code in the app.R file looks like this:

library(shiny)

ui <- fluidPage(
  
  titlePanel("Hello Shiny!"),
  
  sidebarLayout(
    
    sidebarPanel(
      
      sliderInput(inputId = "bins",
                  label = "Number of bins:",
                  min = 1,
                  max = 50,
                  value = 30)
      
    ),
    
    mainPanel(
      
      plotOutput(outputId = "distPlot")
      
    )
  )
)

server <- function(input, output) {
  
  output$distPlot <- renderPlot({
    
    x    <- faithful$waiting
    bins <- seq(min(x), max(x), length.out = input$bins + 1)
    
    hist(x, breaks = bins, col = "#75AADB", border = "white",
         xlab = "Waiting time to next eruption (in mins)",
         main = "Histogram of waiting times")
    
  })
  
}

shinyApp(ui = ui, server = server)

Additional information:

  • Locally it works fine
  • I am behind a proxy and therefore I already followed these instructions
  • I am using Windows 10
  • the packages shiny, rsconnect and rmarkdown are up to date
  • the same error occurs when trying a flexdashboard with shiny runtime

sessionInfo

Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows >= 8 x64 (build 9200)

Matrix products: default

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

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

other attached packages:
[1] shiny_1.4.0.2

loaded via a namespace (and not attached):
 [1] Rcpp_1.0.4       digest_0.6.25    later_1.0.0      mime_0.9         R6_2.4.1         xtable_1.8-4     jsonlite_1.6.1   magrittr_1.5    
 [9] rlang_0.4.5      curl_4.3         promises_1.1.0   Cairo_1.5-10     tools_3.5.2      httpuv_1.5.2     yaml_2.2.1       rsconnect_0.8.16
[17] fastmap_1.0.1    compiler_3.5.2   askpass_1.1      htmltools_0.4.0  openssl_1.3    

I really would appreciate any hint.
Thx

1 Like

Could you the rsconnect options rsconnect.http.trace and rsconnect.http.verbose to TRUE, and then include the full output from deploying?

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