rstudio / shinydashboard

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

Value box overlapping with a tab box #230

Open lynatruong opened 7 years ago

lynatruong commented 7 years ago

I'm having an issue trying to place a value box in the same column as a tab box, but the two boxes overlap upon output. Below is an example code and a screenshot of the overlapping problem.

image

ui <- dashboardPage(

  dashboardHeader(
    title = "valueBox test",
    titleWidth = 450
  ),

  dashboardSidebar(disable = TRUE),

  dashboardBody(
    fluidRow(
      column(width = 3,
             valueBoxOutput("progressbox"), 
             tabBox(
               id = "tabset1", height = "250px", width = NULL, 
               tabPanel("Plot Controls", 
                        selectInput("podnum", label = "Choose Pod number to display", choices = c(1:6)),
                        uiOutput("timeSinceLastUpdate"),
                        actionButton("refresh", label = "Refresh now")
               ),
               tabPanel("Legend")
             )
      )
    )
  )
)

server <- function(input, output, session) {

  output$progressbox <- renderValueBox({
  valueBox(paste0(20,"%"),
             subtitle = "Progress", icon = icon("thumbs-up", lib = "glyphicon"),
             color = "green"
    )
  })
}

shinyApp(ui = ui, server = server)
likelet commented 6 years ago

i have the same issue as you described, is this solved ?