Create a tabset panel
Create a tabset that contains tabPanel()
elements. Tabsets are
useful for dividing output into multiple independently viewable sections.
tabsetPanel( ..., id = NULL, selected = NULL, type = c("tabs", "pills", "hidden"), position = deprecated() )
... |
|
id |
If provided, you can use |
selected |
The |
type |
|
position |
This argument is deprecated; it has been discontinued in Bootstrap 3. |
A tabset that can be passed to mainPanel()
# Show a tabset that includes a plot, summary, and # table view of the generated distribution mainPanel( tabsetPanel( tabPanel("Plot", plotOutput("plot")), tabPanel("Summary", verbatimTextOutput("summary")), tabPanel("Table", tableOutput("table")) ) ) ui <- fluidPage( sidebarLayout( sidebarPanel( radioButtons("controller", "Controller", 1:3, 1) ), mainPanel( tabsetPanel( id = "hidden_tabs", # Hide the tab values. # Can only switch tabs by using `updateTabsetPanel()` type = "hidden", tabPanelBody("panel1", "Panel 1 content"), tabPanelBody("panel2", "Panel 2 content"), tabPanelBody("panel3", "Panel 3 content") ) ) ) ) server <- function(input, output, session) { observeEvent(input$controller, { updateTabsetPanel(session, "hidden_tabs", selected = paste0("panel", input$controller)) }) } if (interactive()) { shinyApp(ui, server) }
Please choose more modern alternatives, such as Google Chrome or Mozilla Firefox.