mirror of
https://github.com/rstudio/shiny.git
synced 2026-01-10 15:38:19 -05:00
use panel suffix for tab components
This commit is contained in:
@@ -41,9 +41,9 @@ export(sidebarPanel)
|
||||
export(span)
|
||||
export(strong)
|
||||
export(submitButton)
|
||||
export(tab)
|
||||
export(tableOutput)
|
||||
export(tabset)
|
||||
export(tabPanel)
|
||||
export(tabsetPanel)
|
||||
export(tag)
|
||||
export(tagAppendChild)
|
||||
export(tags)
|
||||
|
||||
@@ -149,12 +149,12 @@ submitButton <- function(text = "Apply Changes") {
|
||||
|
||||
|
||||
#' @export
|
||||
tab <- function(name, ...) {
|
||||
tabPanel <- function(name, ...) {
|
||||
div(class="tab-pane", title=name, ...)
|
||||
}
|
||||
|
||||
#' @export
|
||||
tabset <- function(...) {
|
||||
tabsetPanel <- function(...) {
|
||||
|
||||
# build tab-nav and tab-content divs
|
||||
tabs <- list(...)
|
||||
|
||||
@@ -30,10 +30,10 @@ shinyUI(
|
||||
),
|
||||
|
||||
mainPanel(
|
||||
tabset(
|
||||
tab("Plot", plotOutput("plot1")),
|
||||
tab("Summary", verbatimTextOutput("summary1")),
|
||||
tab("Table", tableOutput("table1"))
|
||||
tabsetPanel(
|
||||
tabPanel("Plot", plotOutput("plot1")),
|
||||
tabPanel("Summary", verbatimTextOutput("summary1")),
|
||||
tabPanel("Table", tableOutput("table1"))
|
||||
)
|
||||
)
|
||||
)
|
||||
|
||||
Reference in New Issue
Block a user