-
Notifications
You must be signed in to change notification settings - Fork 237
Closed
Description
For instance, in the following code:
#' Pre-styled button
#'
#' @param id Character: button identifier
#' @param label Character: label
#' @param class Character: class
#' @inheritDotParams actionButton -inputId -label
#'
#' @importFrom shiny actionButton
#' @return HTML for a pre-styled button
processButton <- function(id, label, ..., class="btn-primary") {
button <- actionButton(id, label=label, class=class, type="button", ...)
return(button)
}The dot parameters should include the dot argument from actionButton, as the function is simply a wrapper to the other function and the dot argument is desired.
pnacht and pearsonca
Metadata
Metadata
Assignees
Labels
No labels