rstudio / shinydashboard

Shiny Dashboarding framework
https://rstudio.github.io/shinydashboard/
Other
886 stars 300 forks source link

tabsetPanel nested into tabItem causes incorrect display #345

Open clbenoit opened 4 years ago

clbenoit commented 4 years ago

Hello,

I want to use a tabsetPanel nested into a shinydashboard tabItem. But this seem to break the fluidity of the page and the height is not correctly adjusted to the content. Please find here a reproducible example :

.rs.api.documentSaveAll() # close and save all open file
suppressWarnings(lapply(paste('package:', names(sessionInfo()$otherPkgs), sep = ""), detach, character.only = TRUE, unload = TRUE))
rm(list = ls(all.names = TRUE))
devtools::document('.')
devtools::load_all('.')
options(app.prod = FALSE) # TRUE = production mode, FALSE = development mode
library(shiny)
import::from(shinydashboard,box, dashboardPage,dashboardSidebar,dashboardBody,dashboardHeader,sidebarMenu,menuItem,menuSubItem,tabItem,tabPanel)

if (interactive()){
ui <- dashboardPage(
  dashboardHeader(title = "Test"),
  dashboardSidebar(
    sidebarMenu(id = "sidebartabs",
                menuItem("DEG","DEG"))
  ),
  dashboardBody(
    tabItem("DEG",
            mainPanel(
              tabsetPanel(type = "pills",id = "DEGtabs",
                          tabPanel("RUN DEA",
            dataTableOutput("airquality")
            )))
    )
  )
)  

server <- function(input, output, session) {
  output$airquality <- renderDataTable(
    airquality, option = list(pageLength = 90)
  )
}
  shinyApp(ui, server) 
}

Does someone have already seen that ?

Best wishes,

Clément