Skip to content

Commit

Permalink
Minor doc tweaks
Browse files Browse the repository at this point in the history
- Combine sliderInput and animationOptions topics
- Provide better staticdoc index descriptions

Sorry for the big diff, that's due to using a newer version of roxygen.
  • Loading branch information
jcheng5 committed Feb 5, 2014
1 parent b3e9971 commit 9828c8b
Show file tree
Hide file tree
Showing 101 changed files with 1,158 additions and 1,223 deletions.
2 changes: 1 addition & 1 deletion R/bootstrap.R
Original file line number Diff line number Diff line change
Expand Up @@ -887,7 +887,7 @@ actionButton <- function(inputId, label, icon = NULL) {
#' according to some simple heuristics.
#' @param animate \code{TRUE} to show simple animation controls with default
#' settings; \code{FALSE} not to; or a custom settings list, such as those
#' created using \code{\link{animationOptions}}.
#' created using \code{animationOptions}.
#'
#' @family input elements
#' @seealso \code{\link{updateSliderInput}}
Expand Down
4 changes: 1 addition & 3 deletions R/slider.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,9 +3,7 @@ hasDecimals <- function(value) {
return (!identical(value, truncatedValue))
}

#' Animation Options
#'
#' Creates an options object for customizing animations for \link{sliderInput}.
#' @rdname sliderInput
#'
#' @param interval The interval, in milliseconds, between each animation step.
#' @param loop \code{TRUE} to automatically restart the animation when it
Expand Down
8 changes: 4 additions & 4 deletions man/HTML.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
\alias{HTML}
\title{Mark Characters as HTML}
\usage{
HTML(text, ...)
HTML(text, ...)
}
\arguments{
\item{text}{The text value to mark with HTML}
Expand All @@ -11,11 +11,11 @@
character and concatenated together}
}
\value{
The same value, but marked as HTML.
The same value, but marked as HTML.
}
\description{
Marks the given text as HTML, which means the \link{tag}
functions will know not to perform HTML escaping on it.
Marks the given text as HTML, which means the \link{tag}
functions will know not to perform HTML escaping on it.
}
\examples{
el <- div(HTML("I like <u>turtles</u>"))
Expand Down
20 changes: 11 additions & 9 deletions man/actionButton.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
\alias{actionButton}
\title{Action button}
\usage{
actionButton(inputId, label, icon = NULL)
actionButton(inputId, label, icon = NULL)
}
\arguments{
\item{inputId}{Specifies the input slot that will be used
Expand All @@ -16,8 +16,8 @@
button}
}
\description{
Creates an action button whose value is initially zero,
and increments by one each time it is pressed.
Creates an action button whose value is initially zero, and
increments by one each time it is pressed.
}
\examples{
\dontrun{
Expand All @@ -36,11 +36,13 @@ actionButton("goButton", "Go!")
}
}
\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}}
Other input.elements: \code{\link{animationOptions}},
\code{\link{sliderInput}};
\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}}
}

22 changes: 11 additions & 11 deletions man/addResourcePath.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
\alias{addResourcePath}
\title{Resource Publishing}
\usage{
addResourcePath(prefix, directoryPath)
addResourcePath(prefix, directoryPath)
}
\arguments{
\item{prefix}{The URL prefix (without slashes). Valid
Expand All @@ -15,22 +15,22 @@
static resources to be served.}
}
\description{
Adds a directory of static resources to Shiny's web
server, with the given path prefix. Primarily intended
for package authors to make supporting JavaScript/CSS
files available to their components.
Adds a directory of static resources to Shiny's web server,
with the given path prefix. Primarily intended for package
authors to make supporting JavaScript/CSS files available
to their components.
}
\details{
You can call \code{addResourcePath} multiple times for a
given \code{prefix}; only the most recent value will be
retained. If the normalized \code{directoryPath} is
different than the directory that's currently mapped to
the \code{prefix}, a warning will be issued.
You can call \code{addResourcePath} multiple times for a
given \code{prefix}; only the most recent value will be
retained. If the normalized \code{directoryPath} is
different than the directory that's currently mapped to the
\code{prefix}, a warning will be issued.
}
\examples{
addResourcePath('datasets', system.file('data', package='datasets'))
}
\seealso{
\code{\link{singleton}}
\code{\link{singleton}}
}

28 changes: 0 additions & 28 deletions man/animationOptions.Rd

This file was deleted.

33 changes: 16 additions & 17 deletions man/bootstrapPage.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -3,10 +3,9 @@
\alias{bootstrapPage}
\title{Create a Bootstrap page}
\usage{
bootstrapPage(..., title = NULL, responsive = TRUE,
theme = NULL)
bootstrapPage(..., title = NULL, responsive = TRUE, theme = NULL)

basicPage(...)
basicPage(...)
}
\arguments{
\item{...}{The contents of the document body.}
Expand All @@ -23,27 +22,27 @@
\code{www/bootstrap.css})}
}
\value{
A UI defintion that can be passed to the \link{shinyUI}
function.
A UI defintion that can be passed to the \link{shinyUI}
function.
}
\description{
Create a Shiny UI page that loads the CSS and JavaScript
for \href{http://getbootstrap.com/2.3.2/}{Bootstrap}, and
has no content in the page body (other than what you
provide).
Create a Shiny UI page that loads the CSS and JavaScript
for \href{http://getbootstrap.com/2.3.2/}{Bootstrap}, and
has no content in the page body (other than what you
provide).
}
\details{
This function is primarily intended for users who are
proficient in HTML/CSS, and know how to lay out pages in
Bootstrap. Most applications should use
\code{\link{fluidPage}} along with layout functions like
\code{\link{fluidRow}} and \code{\link{sidebarLayout}}.
This function is primarily intended for users who are
proficient in HTML/CSS, and know how to lay out pages in
Bootstrap. Most applications should use
\code{\link{fluidPage}} along with layout functions like
\code{\link{fluidRow}} and \code{\link{sidebarLayout}}.
}
\note{
The \code{basicPage} function is deprecated, you should
use the \code{\link{fluidPage}} function instead.
The \code{basicPage} function is deprecated, you should use
the \code{\link{fluidPage}} function instead.
}
\seealso{
\code{\link{fluidPage}}, \code{\link{fixedPage}}
\code{\link{fluidPage}}, \code{\link{fixedPage}}
}

30 changes: 15 additions & 15 deletions man/checkboxGroupInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -2,8 +2,7 @@
\alias{checkboxGroupInput}
\title{Checkbox Group Input Control}
\usage{
checkboxGroupInput(inputId, label, choices,
selected = NULL)
checkboxGroupInput(inputId, label, choices, selected = NULL)
}
\arguments{
\item{inputId}{Input variable to assign the control's
Expand All @@ -19,13 +18,13 @@
selected, if any.}
}
\value{
A list of HTML elements that can be added to a UI
definition.
A list of HTML elements that can be added to a UI
definition.
}
\description{
Create a group of checkboxes that can be used to toggle
multiple choices independently. The server will receive
the input as a character vector of the selected values.
Create a group of checkboxes that can be used to toggle
multiple choices independently. The server will receive the
input as a character vector of the selected values.
}
\examples{
checkboxGroupInput("variable", "Variable:",
Expand All @@ -34,14 +33,15 @@ checkboxGroupInput("variable", "Variable:",
"Gears" = "gear"))
}
\seealso{
\code{\link{checkboxInput}},
\code{\link{updateCheckboxGroupInput}}
\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}}
Other input.elements: \code{\link{actionButton}};
\code{\link{animationOptions}}, \code{\link{sliderInput}};
\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}}
}
26 changes: 13 additions & 13 deletions man/checkboxInput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
\alias{checkboxInput}
\title{Checkbox Input Control}
\usage{
checkboxInput(inputId, label, value = FALSE)
checkboxInput(inputId, label, value = FALSE)
}
\arguments{
\item{inputId}{Input variable to assign the control's
Expand All @@ -14,25 +14,25 @@
\code{FALSE}).}
}
\value{
A checkbox control that can be added to a UI definition.
A checkbox control that can be added to a UI definition.
}
\description{
Create a checkbox that can be used to specify logical
values.
Create a checkbox that can be used to specify logical
values.
}
\examples{
checkboxInput("outliers", "Show outliers", FALSE)
}
\seealso{
\code{\link{checkboxGroupInput}},
\code{\link{updateCheckboxInput}}
\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}}
Other input.elements: \code{\link{actionButton}};
\code{\link{animationOptions}}, \code{\link{sliderInput}};
\code{\link{checkboxGroupInput}}; \code{\link{dateInput}};
\code{\link{dateRangeInput}}; \code{\link{fileInput}};
\code{\link{numericInput}}; \code{\link{radioButtons}};
\code{\link{selectInput}}; \code{\link{submitButton}};
\code{\link{textInput}}
}
12 changes: 6 additions & 6 deletions man/column.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
\alias{column}
\title{Create a column within a UI definition}
\usage{
column(width, ..., offset = 0)
column(width, ..., offset = 0)
}
\arguments{
\item{width}{The grid width of the column (must be
Expand All @@ -14,12 +14,12 @@
from the end of the previous column.}
}
\value{
A column that can be included within a
\code{\link{fluidRow}} or \code{\link{fixedRow}}.
A column that can be included within a
\code{\link{fluidRow}} or \code{\link{fixedRow}}.
}
\description{
Create a column for use within a \code{\link{fluidRow}}
or \code{\link{fixedRow}}
Create a column for use within a \code{\link{fluidRow}} or
\code{\link{fixedRow}}
}
\examples{
fluidRow(
Expand All @@ -42,6 +42,6 @@ fluidRow(
)
}
\seealso{
\code{\link{fluidRow}}, \code{\link{fixedRow}}.
\code{\link{fluidRow}}, \code{\link{fixedRow}}.
}

24 changes: 12 additions & 12 deletions man/conditionalPanel.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
\alias{conditionalPanel}
\title{Conditional Panel}
\usage{
conditionalPanel(condition, ...)
conditionalPanel(condition, ...)
}
\arguments{
\item{condition}{A JavaScript expression that will be
Expand All @@ -12,19 +12,19 @@
\item{...}{Elements to include in the panel.}
}
\description{
Creates a panel that is visible or not, depending on the
value of a JavaScript expression. The JS expression is
evaluated once at startup and whenever Shiny detects a
relevant change in input/output.
Creates a panel that is visible or not, depending on the
value of a JavaScript expression. The JS expression is
evaluated once at startup and whenever Shiny detects a
relevant change in input/output.
}
\details{
In the JS expression, you can refer to \code{input} and
\code{output} JavaScript objects that contain the current
values of input and output. For example, if you have an
input with an id of \code{foo}, then you can use
\code{input.foo} to read its value. (Be sure not to
modify the input/output objects, as this may cause
unpredictable behavior.)
In the JS expression, you can refer to \code{input} and
\code{output} JavaScript objects that contain the current
values of input and output. For example, if you have an
input with an id of \code{foo}, then you can use
\code{input.foo} to read its value. (Be sure not to modify
the input/output objects, as this may cause unpredictable
behavior.)
}
\examples{
sidebarPanel(
Expand Down
Loading

0 comments on commit 9828c8b

Please sign in to comment.