bslib icon indicating copy to clipboard operation
bslib copied to clipboard

The number on top left doesn't show up for Materia theme

Open shalutiwari opened this issue 4 years ago • 0 comments

materia-new Install remotes::install_github("rstudio/DT") and then run below app. Then change app to Materia. Now if you carefully look at top left **show 10 entries** , then the number 10 doesn't is not visible.


library(shiny)
library(DT)

ui <- fluidPage(
  theme = bslib::bs_theme(),
  dataTableOutput("x")
)

server <- function(input, output, session) {
   bslib::bs_themer()
  output$x <- renderDataTable({
    datatable(mtcars)
  })
}

shinyApp(ui, server)

shalutiwari avatar Feb 11 '21 22:02 shalutiwari