bslib icon indicating copy to clipboard operation
bslib copied to clipboard

Previous on the pagination is not visible for cyborg theme

Open shalutiwari opened this issue 4 years ago • 1 comments

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)

cyborg-new

shalutiwari avatar Feb 11 '21 22:02 shalutiwari

Similar issue with "Yeti" theme. DT_yeti_theme_page_navigation_text_color_not_visible

MadhulikaTanuboddi avatar Feb 17 '21 22:02 MadhulikaTanuboddi