renderUI
renderUI(expr, env = parent.frame(), quoted = FALSE, outputArgs = list())Arguments
| expr | An expression that returns a Shiny tag object, HTML,
or a list of such objects. | 
|---|---|
| env | The environment in which to evaluate expr. | 
| quoted | Is expra quoted expression (withquote())? This
is useful if you want to save an expression in a variable. | 
| outputArgs | A list of arguments to be passed through to the implicit
call to uiOutputwhenrenderUIis used in an
interactive R Markdown document. | 
Description
Experimental feature. Makes a reactive version of a function that generates HTML using the Shiny UI library.
Details
The corresponding HTML output tag should be div and have the CSS class
name shiny-html-output (or use uiOutput).
Examples
## Only run examples in interactive R sessions
if (interactive()) {
ui <- fluidPage(
  uiOutput("moreControls")
)
server <- function(input, output) {
  output$moreControls <- renderUI({
    tagList(
      sliderInput("n", "N", 1, 1000, 500),
      textInput("label", "Label")
    )
  })
}
shinyApp(ui, server)
}See also
conditionalPanel