A B C D E F G H I K M N O P R S T U V W
shiny-package | Web Application Framework for R |
a | HTML Builder Functions |
absolutePanel | Panel with absolute positioning |
actionButton | Action button/link |
actionLink | Action button/link |
addResourcePath | Resource Publishing |
animationOptions | Slider Input Widget |
as.shiny.appobj | Create a Shiny app object |
as.shiny.appobj.character | Create a Shiny app object |
as.shiny.appobj.list | Create a Shiny app object |
as.shiny.appobj.shiny.appobj | Create a Shiny app object |
as.tags.shiny.appobj | Create a Shiny app object |
basicPage | Create a Bootstrap page |
bookmarkButton | Create a button for bookmarking/sharing |
bootstrapLib | Bootstrap libraries |
bootstrapPage | Create a Bootstrap page |
br | HTML Builder Functions |
browserViewer | Viewer options |
brushedPoints | Find rows of data that are selected by a brush |
brushOpts | Create an object representing brushing options |
builder | HTML Builder Functions |
callModule | Invoke a Shiny module |
checkboxGroupInput | Checkbox Group Input Control |
checkboxInput | Checkbox Input Control |
clickOpts | Create an object representing click options |
code | HTML Builder Functions |
column | Create a column within a UI definition |
conditionalPanel | Conditional Panel |
createWebDependency | Create a web dependency |
dataTableOutput | Create a table output element |
dateInput | Create date input |
dateRangeInput | Create date range input |
dblclickOpts | Create an object representing double-click options |
dialogViewer | Viewer options |
div | HTML Builder Functions |
domains | Reactive domains |
downloadButton | Create a download button or link |
downloadHandler | File Downloads |
downloadLink | Create a download button or link |
em | HTML Builder Functions |
enableBookmarking | Enable bookmarking for a Shiny application |
eventReactive | Event handler |
exprToFunction | Convert an expression to a function |
fileInput | File Upload Control |
fillCol | Flex Box-based row/column layouts |
fillPage | Create a page that fills the window |
fillRow | Flex Box-based row/column layouts |
fixedPage | Create a page with a fixed layout |
fixedPanel | Panel with absolute positioning |
fixedRow | Create a page with a fixed layout |
flowLayout | Flow layout |
fluidPage | Create a page with fluid layout |
fluidRow | Create a page with fluid layout |
freezeReactiveValue | Freeze a reactive value |
getDefaultReactiveDomain | Reactive domains |
getShinyOption | Get or set Shiny options |
h1 | HTML Builder Functions |
h2 | HTML Builder Functions |
h3 | HTML Builder Functions |
h4 | HTML Builder Functions |
h5 | HTML Builder Functions |
h6 | HTML Builder Functions |
headerPanel | Create a header panel |
helpText | Create a help text element |
hoverOpts | Create an object representing hover options |
hr | HTML Builder Functions |
HTML | Mark Characters as HTML |
htmlOutput | Create an HTML output element |
htmlTemplate | Process an HTML template |
icon | Create an icon |
imageOutput | Create an plot or image output element |
img | HTML Builder Functions |
include | Include Content From a File |
includeCSS | Include Content From a File |
includeHTML | Include Content From a File |
includeMarkdown | Include Content From a File |
includeScript | Include Content From a File |
includeText | Include Content From a File |
incProgress | Reporting progress (functional API) |
inputPanel | Input panel |
insertUI | Insert UI objects |
installExprFunction | Install an expression as a function |
invalidateLater | Scheduled Invalidation |
is.reactive | Create a reactive expression |
is.reactivevalues | Checks whether an object is a reactivevalues object |
is.shiny.appobj | Create a Shiny app object |
is.singleton | Include content only once |
isolate | Create a non-reactive scope for an expression |
isTruthy | Check for required values |
knitr_methods | Knitr S3 methods |
knit_print.html | Knitr S3 methods |
knit_print.reactive | Knitr S3 methods |
knit_print.shiny.appobj | Knitr S3 methods |
knit_print.shiny.render.function | Knitr S3 methods |
knit_print.shiny.tag | Knitr S3 methods |
knit_print.shiny.tag.list | Knitr S3 methods |
mainPanel | Create a main panel |
makeReactiveBinding | Make a reactive variable |
markRenderFunction | Mark a function as a render function |
maskReactiveContext | Evaluate an expression without a reactive context |
modalButton | Create a button for a modal dialog |
modalDialog | Create a modal dialog UI |
navbarMenu | Create a page with a top level navigation bar |
navbarPage | Create a page with a top level navigation bar |
navlistPanel | Create a navigation list panel |
nearPoints | Find rows of data that are near a click/hover/double-click |
need | Validate input values and other conditions |
NS | Namespaced IDs for inputs/outputs |
ns.sep | Namespaced IDs for inputs/outputs |
numericInput | Create a numeric input control |
observe | Create a reactive observer |
observeEvent | Event handler |
onBookmark | Add callbacks for Shiny session bookmarking events |
onBookmarked | Add callbacks for Shiny session bookmarking events |
onFlush | Add callbacks for Shiny session events |
onFlushed | Add callbacks for Shiny session events |
onReactiveDomainEnded | Reactive domains |
onRestore | Add callbacks for Shiny session bookmarking events |
onRestored | Add callbacks for Shiny session bookmarking events |
onSessionEnded | Add callbacks for Shiny session events |
outputOptions | Set options for an output object. |
p | HTML Builder Functions |
pageWithSidebar | Create a page with a sidebar |
paneViewer | Viewer options |
parseQueryString | Parse a GET query string from a URL |
passwordInput | Create a password input control |
plotOutput | Create an plot or image output element |
plotPNG | Run a plotting function and save the output as a PNG |
pre | HTML Builder Functions |
print.shiny.appobj | Create a Shiny app object |
Progress | Reporting progress (object-oriented API) |
radioButtons | Create radio buttons |
reactive | Create a reactive expression |
reactiveFileReader | Reactive file reader |
reactivePlot | Plot output (deprecated) |
reactivePoll | Reactive polling |
reactivePrint | Print output (deprecated) |
reactiveTable | Table output (deprecated) |
reactiveText | Text output (deprecated) |
reactiveTimer | Timer |
reactiveUI | UI output (deprecated) |
reactiveValues | Create an object for storing reactive values |
reactiveValuesToList | Convert a reactivevalues object to a list |
registerInputHandler | Register an Input Handler |
removeInputHandler | Deregister an Input Handler |
removeModal | Show or remove a modal dialog |
removeNotification | Show or remove a notification |
removeUI | Remove UI objects |
renderDataTable | Table output with the JavaScript library DataTables |
renderImage | Image file output |
renderPlot | Plot Output |
renderPrint | Printable Output |
renderTable | Table Output |
renderText | Text Output |
renderUI | UI Output |
repeatable | Make a random number generator repeatable |
req | Check for required values |
restoreInput | Restore an input value |
runApp | Run Shiny Application |
runExample | Run Shiny Example Applications |
runGadget | Run a gadget |
runGist | Run a Shiny application from a URL |
runGitHub | Run a Shiny application from a URL |
runUrl | Run a Shiny application from a URL |
safeError | Declare an error safe for the user to see |
selectInput | Create a select list input control |
selectizeInput | Create a select list input control |
serverInfo | Collect information about the Shiny Server environment |
session | Session object |
setBookmarkExclude | Exclude inputs from bookmarking |
setProgress | Reporting progress (functional API) |
shiny | Web Application Framework for R |
shiny-options | Global options for Shiny |
shinyApp | Create a Shiny app object |
shinyAppDir | Create a Shiny app object |
shinyAppFile | Create a Shiny app object |
shinyOptions | Get or set Shiny options |
shinyServer | Define Server Functionality |
shinyUI | Create a Shiny UI handler |
showBookmarkUrlModal | Display a modal dialog for bookmarking |
showModal | Show or remove a modal dialog |
showNotification | Show or remove a notification |
showReactLog | Reactive Log Visualizer |
sidebarLayout | Layout a sidebar and main area |
sidebarPanel | Create a sidebar panel |
singleton | Include content only once |
sliderInput | Slider Input Widget |
span | HTML Builder Functions |
splitLayout | Split layout |
stopApp | Stop the currently running Shiny app |
strong | HTML Builder Functions |
submitButton | Create a submit button |
suppressDependencies | Suppress web dependencies |
tableOutput | Create a table output element |
tabPanel | Create a tab panel |
tabsetPanel | Create a tabset panel |
tag | HTML Tag Object |
tagAppendAttributes | HTML Tag Object |
tagAppendChild | HTML Tag Object |
tagAppendChildren | HTML Tag Object |
tagList | HTML Tag Object |
tags | HTML Builder Functions |
tagSetChildren | HTML Tag Object |
textAreaInput | Create a textarea input control |
textInput | Create a text input control |
textOutput | Create a text output element |
titlePanel | Create a panel containing an application title. |
uiOutput | Create an HTML output element |
updateActionButton | Change the label or icon of an action button on the client |
updateCheckboxGroupInput | Change the value of a checkbox group input on the client |
updateCheckboxInput | Change the value of a checkbox input on the client |
updateDateInput | Change the value of a date input on the client |
updateDateRangeInput | Change the start and end values of a date range input on the client |
updateNavbarPage | Change the selected tab on the client |
updateNavlistPanel | Change the selected tab on the client |
updateNumericInput | Change the value of a number input on the client |
updateQueryString | Update URL in browser's location bar |
updateRadioButtons | Change the value of a radio input on the client |
updateSelectInput | Change the value of a select input on the client |
updateSelectizeInput | Change the value of a select input on the client |
updateSliderInput | Change the value of a slider input on the client |
updateTabsetPanel | Change the selected tab on the client |
updateTextAreaInput | Change the value of a textarea input on the client |
updateTextInput | Change the value of a text input on the client |
urlModal | Generate a modal dialog that displays a URL |
validate | Validate input values and other conditions |
validateCssUnit | Validate proper CSS formatting of a unit |
verbatimTextOutput | Create a verbatim text output element |
verticalLayout | Lay out UI elements vertically |
viewer | Viewer options |
wellPanel | Create a well panel |
withMathJax | Load the MathJax library and typeset math expressions |
withProgress | Reporting progress (functional API) |
withReactiveDomain | Reactive domains |
withTags | Evaluate an expression using 'tags' |