Run a gadget — runGadget
runGadget( app, server = NULL, port = getOption("shiny.port"), viewer = paneViewer(), stopOnCancel = TRUE )
Arguments
| app | Either a Shiny app object as created by
 | 
|---|---|
| server | Ignored if  | 
| port | See  | 
| viewer | Specify where the gadget should be displayed--viewer pane,
dialog window, or external browser--by passing in a call to one of the
 | 
| stopOnCancel | If  | 
Description
Similar to runApp, but handles input$cancel automatically, and
if running in RStudio, defaults to viewing the app in the Viewer pane.
Examples
if (FALSE) { library(shiny) ui <- fillPage(...) server <- function(input, output, session) { ... } # Either pass ui/server as separate arguments... runGadget(ui, server) # ...or as a single app object runGadget(shinyApp(ui, server)) }