bslib
bslib copied to clipboard
Previous on the pagination is not visible for cyborg theme
Install remotes::install_github("rstudio/DT") and change theme to cyborg when you run below app. Previous on the pagination 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)
data:image/s3,"s3://crabby-images/adcfc/adcfc19ee2df7fbb66fa385ae0e7787a1a62de4e" alt="cyborg-new"
Similar issue with "Yeti" theme.