Skip to content

inheritDotParams does not show dot parameters #633

@nuno-agostinho

Description

@nuno-agostinho

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.

Metadata

Metadata

Assignees

No one assigned

    Labels

    No labels
    No labels

    Type

    No type

    Projects

    No projects

    Milestone

    No milestone

    Relationships

    None yet

    Development

    No branches or pull requests

    Issue actions