Skip to content

Commit

Permalink
Merge pull request rstudio#214 from hadley/doc-tweaks
Browse files Browse the repository at this point in the history
Doc tweaks
  • Loading branch information
jcheng5 committed Aug 27, 2013
2 parents f089531 + ed8537b commit bc72b8f
Show file tree
Hide file tree
Showing 13 changed files with 121 additions and 25 deletions.
33 changes: 16 additions & 17 deletions R/bootstrap.R
Original file line number Diff line number Diff line change
Expand Up @@ -255,6 +255,7 @@ conditionalPanel <- function(condition, ...) {
#' @param value Initial value
#' @return A text input control that can be added to a UI definition.
#'
#' @family input elements
#' @seealso \code{\link{updateTextInput}}
#'
#' @examples
Expand All @@ -279,6 +280,7 @@ textInput <- function(inputId, label, value = "") {
#' @param step Interval to use when stepping between min and max
#' @return A numeric input control that can be added to a UI definition.
#'
#' @family input elements
#' @seealso \code{\link{updateNumericInput}}
#'
#' @examples
Expand Down Expand Up @@ -326,6 +328,8 @@ numericInput <- function(inputId, label, value, min = NA, max = NA, step = NA) {
#' operation.}
#' }
#'
#' @family input elements
#'
#' @param inputId Input variable to assign the control's value to.
#' @param label Display label for the control.
#' @param multiple Whether the user should be allowed to select and upload
Expand Down Expand Up @@ -363,6 +367,7 @@ fileInput <- function(inputId, label, multiple = FALSE, accept = NULL) {
#' @param value Initial value (\code{TRUE} or \code{FALSE}).
#' @return A checkbox control that can be added to a UI definition.
#'
#' @family input elements
#' @seealso \code{\link{checkboxGroupInput}}, \code{\link{updateCheckboxInput}}
#'
#' @examples
Expand All @@ -389,6 +394,7 @@ checkboxInput <- function(inputId, label, value = FALSE) {
#' @param selected Names of items that should be initially selected, if any.
#' @return A list of HTML elements that can be added to a UI definition.
#'
#' @family input elements
#' @seealso \code{\link{checkboxInput}}, \code{\link{updateCheckboxGroupInput}}
#'
#' @examples
Expand Down Expand Up @@ -483,6 +489,7 @@ choicesWithNames <- function(choices) {
#' @param multiple Is selection of multiple items allowed?
#' @return A select list control that can be added to a UI definition.
#'
#' @family input elements
#' @seealso \code{\link{updateSelectInput}}
#'
#' @examples
Expand Down Expand Up @@ -539,6 +546,7 @@ selectInput <- function(inputId,
#' defaults to the first item)
#' @return A set of radio buttons that can be added to a UI definition.
#'
#' @family input elements
#' @seealso \code{\link{updateRadioButtons}}
#'
#' @examples
Expand Down Expand Up @@ -593,6 +601,8 @@ radioButtons <- function(inputId, label, choices, selected = NULL) {
#' @param text Button caption
#' @return A submit button that can be added to a UI definition.
#'
#' @family input elements
#'
#' @examples
#' submitButton("Update View")
#' @export
Expand All @@ -612,6 +622,8 @@ submitButton <- function(text = "Apply Changes") {
#' @param label The contents of the button--usually a text label, but you could
#' also use any other HTML, like an image.
#'
#' @family input elements
#'
#' @export
actionButton <- function(inputId, label) {
tags$button(id=inputId, type="button", class="btn action-button", label)
Expand Down Expand Up @@ -647,6 +659,7 @@ actionButton <- function(inputId, label) {
#' settings; \code{FALSE} not to; or a custom settings list, such as those
#' created using \code{\link{animationOptions}}.
#'
#' @family input elements
#' @seealso \code{\link{updateSliderInput}}
#'
#' @details
Expand Down Expand Up @@ -735,6 +748,7 @@ sliderInput <- function(inputId, label, min, max, value, step = NULL,
#' "nb", "nl", "pl", "pt", "pt", "ro", "rs", "rs-latin", "ru", "sk", "sl",
#' "sv", "sw", "th", "tr", "uk", "zh-CN", and "zh-TW".
#'
#' @family input elements
#' @seealso \code{\link{dateRangeInput}}, \code{\link{updateDateInput}}
#'
#' @examples
Expand Down Expand Up @@ -815,31 +829,16 @@ dateInput <- function(inputId, label, value = NULL, min = NULL, max = NULL,
#' \item \code{DD} Full weekday name
#' }
#'
#' @param inputId Input variable to assign the control's value to.
#' @param label Display label for the control.
#' @inheritParams dateInput
#' @param start The initial start date. Either a Date object, or a string in
#' \code{yyyy-mm-dd} format. If NULL (the default), will use the current
#' date in the client's time zone.
#' @param end The initial end date. Either a Date object, or a string in
#' \code{yyyy-mm-dd} format. If NULL (the default), will use the current
#' date in the client's time zone.
#' @param min The minimum allowed date. Either a Date object, or a string in
#' \code{yyyy-mm-dd} format.
#' @param max The maximum allowed date. Either a Date object, or a string in
#' \code{yyyy-mm-dd} format.
#' @param format The format of the date to display in the browser. Defaults to
#' \code{"yyyy-mm-dd"}.
#' @param startview The date range shown when the input object is first
#' clicked. Can be "month" (the default), "year", or "decade".
#' @param weekstart Which day is the start of the week. Should be an integer
#' from 0 (Sunday) to 6 (Saturday).
#' @param language The language used for month and day names. Default is "en".
#' Other valid values include "bg", "ca", "cs", "da", "de", "el", "es", "fi",
#' "fr", "he", "hr", "hu", "id", "is", "it", "ja", "kr", "lt", "lv", "ms",
#' "nb", "nl", "pl", "pt", "pt", "ro", "rs", "rs-latin", "ru", "sk", "sl",
#' "sv", "sw", "th", "tr", "uk", "zh-CN", and "zh-TW".
#' @param separator String to display between the start and end input boxes.
#'
#' @family input elements
#' @seealso \code{\link{dateInput}}, \code{\link{updateDateRangeInput}}
#'
#' @examples
Expand Down
8 changes: 8 additions & 0 deletions man/actionButton.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -16,4 +16,12 @@
Creates an action button whose value is initially zero,
and increments by one each time it is pressed.
}
\seealso{
Other input.elements: \code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{numericInput}}, \code{\link{radioButtons}},
\code{\link{selectInput}}, \code{\link{sliderInput}},
\code{\link{submitButton}}, \code{\link{textInput}}
}

7 changes: 7 additions & 0 deletions man/checkboxGroupInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -36,5 +36,12 @@ checkboxGroupInput("variable", "Variable:",
\seealso{
\code{\link{checkboxInput}},
\code{\link{updateCheckboxGroupInput}}
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{numericInput}}, \code{\link{radioButtons}},
\code{\link{selectInput}}, \code{\link{sliderInput}},
\code{\link{submitButton}}, \code{\link{textInput}}
}
8 changes: 8 additions & 0 deletions man/checkboxInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -26,5 +26,13 @@ checkboxInput("outliers", "Show outliers", FALSE)
\seealso{
\code{\link{checkboxGroupInput}},
\code{\link{updateCheckboxInput}}
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{dateInput}}, \code{\link{dateRangeInput}},
\code{\link{fileInput}}, \code{\link{numericInput}},
\code{\link{radioButtons}}, \code{\link{selectInput}},
\code{\link{sliderInput}}, \code{\link{submitButton}},
\code{\link{textInput}}
}
8 changes: 8 additions & 0 deletions man/dateInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -84,5 +84,13 @@ dateInput("date", "Date:",
\seealso{
\code{\link{dateRangeInput}},
\code{\link{updateDateInput}}

Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{numericInput}}, \code{\link{radioButtons}},
\code{\link{selectInput}}, \code{\link{sliderInput}},
\code{\link{submitButton}}, \code{\link{textInput}}
}

24 changes: 16 additions & 8 deletions man/dateRangeInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -8,11 +8,6 @@
separator = " to ")
}
\arguments{
\item{inputId}{Input variable to assign the control's
value to.}
\item{label}{Display label for the control.}
\item{start}{The initial start date. Either a Date
object, or a string in \code{yyyy-mm-dd} format. If NULL
(the default), will use the current date in the client's
Expand All @@ -23,6 +18,14 @@
default), will use the current date in the client's time
zone.}

\item{separator}{String to display between the start and
end input boxes.}

\item{inputId}{Input variable to assign the control's
value to.}
\item{label}{Display label for the control.}
\item{min}{The minimum allowed date. Either a Date
object, or a string in \code{yyyy-mm-dd} format.}
Expand All @@ -46,9 +49,6 @@
"ms", "nb", "nl", "pl", "pt", "pt", "ro", "rs",
"rs-latin", "ru", "sk", "sl", "sv", "sw", "th", "tr",
"uk", "zh-CN", and "zh-TW".}
\item{separator}{String to display between the start and
end input boxes.}
}
\description{
Creates a pair of text inputs which, when clicked on,
Expand Down Expand Up @@ -105,5 +105,13 @@ dateRangeInput("daterange", "Date range:",
\seealso{
\code{\link{dateInput}},
\code{\link{updateDateRangeInput}}

Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{fileInput}}, \code{\link{numericInput}},
\code{\link{radioButtons}}, \code{\link{selectInput}},
\code{\link{sliderInput}}, \code{\link{submitButton}},
\code{\link{textInput}}
}

9 changes: 9 additions & 0 deletions man/fileInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -39,4 +39,13 @@
This file may be deleted if the user performs another
upload operation.} }
}
\seealso{
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{numericInput}},
\code{\link{radioButtons}}, \code{\link{selectInput}},
\code{\link{sliderInput}}, \code{\link{submitButton}},
\code{\link{textInput}}
}

8 changes: 8 additions & 0 deletions man/numericInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -33,5 +33,13 @@ numericInput("obs", "Observations:", 10,
}
\seealso{
\code{\link{updateNumericInput}}
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{radioButtons}}, \code{\link{selectInput}},
\code{\link{sliderInput}}, \code{\link{submitButton}},
\code{\link{textInput}}
}
8 changes: 8 additions & 0 deletions man/radioButtons.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -34,5 +34,13 @@ radioButtons("dist", "Distribution type:",
}
\seealso{
\code{\link{updateRadioButtons}}
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{numericInput}}, \code{\link{selectInput}},
\code{\link{sliderInput}}, \code{\link{submitButton}},
\code{\link{textInput}}
}
8 changes: 8 additions & 0 deletions man/selectInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -39,5 +39,13 @@ selectInput("variable", "Variable:",
}
\seealso{
\code{\link{updateSelectInput}}
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{numericInput}}, \code{\link{radioButtons}},
\code{\link{sliderInput}}, \code{\link{submitButton}},
\code{\link{textInput}}
}
8 changes: 8 additions & 0 deletions man/sliderInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -72,5 +72,13 @@
}
\seealso{
\code{\link{updateSliderInput}}
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{numericInput}}, \code{\link{radioButtons}},
\code{\link{selectInput}}, \code{\link{submitButton}},
\code{\link{textInput}}
}
9 changes: 9 additions & 0 deletions man/submitButton.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -19,4 +19,13 @@
\examples{
submitButton("Update View")
}
\seealso{
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{numericInput}}, \code{\link{radioButtons}},
\code{\link{selectInput}}, \code{\link{sliderInput}},
\code{\link{textInput}}
}

8 changes: 8 additions & 0 deletions man/textInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -25,5 +25,13 @@ textInput("caption", "Caption:", "Data Summary")
}
\seealso{
\code{\link{updateTextInput}}
Other input.elements: \code{\link{actionButton}},
\code{\link{checkboxGroupInput}},
\code{\link{checkboxInput}}, \code{\link{dateInput}},
\code{\link{dateRangeInput}}, \code{\link{fileInput}},
\code{\link{numericInput}}, \code{\link{radioButtons}},
\code{\link{selectInput}}, \code{\link{sliderInput}},
\code{\link{submitButton}}
}

0 comments on commit bc72b8f

Please sign in to comment.