use panel suffix for tab components

This commit is contained in:
JJ Allaire
2012-07-23 05:53:20 -07:00
parent ef44a2295f
commit f66c2967dd
3 changed files with 8 additions and 8 deletions

View File

@@ -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)

View File

@@ -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(...)

View File

@@ -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"))
)
)
)