tables not rendering in Edge but good in Chrome and Firefox

I have a shiny app (wrapped into an R package) that allows users to click a button to load one of the example data sets, which is useful to new users. The app then displays the data in tables using DT::renderDataTable.

Firefox and Chrome: no problem.

IE and Edge: the tables do not render. If I close the app and reopen, they render fine from then on. Curiously, if I start the app in Firefox or Chrome (after rebooting), close it, and then open it in IE or Edge, the tables render just fine.

And ideas what could be going on?

---------------------- Update -------------------
I found a similar example on StackOverflow from a few years ago (https://stackoverflow.com/questions/37381206/renderdatatable-in-shiny-not-rendering-output-correctly). Their setup was slightly different from mine, and the proposed solution doesn't work for me. However, they do have simple code that reproduces the problem that I've been having, i.e., table not rendering in Edge in fresh Windows session, but working fine after closing and restarting app:

require(shiny)
shinyApp(
  ui = fluidPage(DT::dataTableOutput('tbl')),
  server = function(input, output) {
    output$tbl = DT::renderDataTable(
      iris, options = list(lengthChange = FALSE)
    )
  }
)

I believe that since you wish to apply options, the table should be wrapped in a call to DT::datatable()

require(shiny)
library(DT)
shinyApp(
  ui = fluidPage(DT::dataTableOutput('tbl')),
  server = function(input, output) {
    output$tbl = DT::renderDataTable(
    DT::datatable(  iris, options = list(lengthChange = FALSE))
    )
  }
)

This was a bug in shiny dependency httpuv that was fixed 29 Aug 2019. Just update shiny.

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