Skip to content

Commit

Permalink
Doc fixes for R CMD check
Browse files Browse the repository at this point in the history
  • Loading branch information
wch committed Aug 23, 2013
1 parent 9765194 commit 40cc5d5
Show file tree
Hide file tree
Showing 6 changed files with 44 additions and 7 deletions.
4 changes: 2 additions & 2 deletions R/bootstrap.R
Original file line number Diff line number Diff line change
Expand Up @@ -1097,13 +1097,13 @@ imageOutput <- function(outputId, width = "100%", height="400px") {
#' @param height Plot height
#' @param clickId If not \code{NULL}, the plot will send coordinates to the
#' server whenever it is clicked. This information will be accessible on the
#' \code{input} object using \code{input$\emph{clickId}}. The value will be a
#' \code{input} object using \code{input$}\emph{\code{clickId}}. The value will be a
#' named list or vector with \code{x} and \code{y} elements indicating the
#' mouse position in user units.
#' @param hoverId If not \code{NULL}, the plot will send coordinates to the
#' server whenever the mouse pauses on the plot for more than the number of
#' milliseconds determined by \code{hoverTimeout}. This information will be
# accessible on the \code{input} object using \code{input$\emph{clickId}}.
# accessible on the \code{input} object using \code{input$}\emph{\code{clickId}}.
#' The value will be \code{NULL} if the user is not hovering, and a named
#' list or vector with \code{x} and \code{y} elements indicating the mouse
#' position in user units.
Expand Down
8 changes: 7 additions & 1 deletion R/reactives.R
Original file line number Diff line number Diff line change
Expand Up @@ -173,7 +173,7 @@ ReactiveValues <- setRefClass(
#' @param ... Objects that will be added to the reactivevalues object. All of
#' these objects must be named.
#'
#' @seealso \code{\link{isolate}}.
#' @seealso \code{\link{isolate}} and \code{\link{is.reactivevalues}}.
#'
#' @export
reactiveValues <- function(...) {
Expand All @@ -199,6 +199,12 @@ setOldClass("reactivevalues")
structure(list(impl=values), class='reactivevalues', readonly=readonly)
}

#' Checks whether an object is a reactivevalues object
#'
#' Checks whether its argument is a reactivevalues object.
#'
#' @param x The object to test.
#' @seealso \code{\link{reactiveValues}}.
#' @export
is.reactivevalues <- function(x) inherits(x, 'reactivevalues')

Expand Down
16 changes: 16 additions & 0 deletions man/is.reactivevalues.Rd
Original file line number Diff line number Diff line change
@@ -0,0 +1,16 @@
\name{is.reactivevalues}
\alias{is.reactivevalues}
\title{Checks whether an object is a reactivevalues object}
\usage{
is.reactivevalues(x)
}
\arguments{
\item{x}{The object to test.}
}
\description{
Checks whether its argument is a reactivevalues object.
}
\seealso{
\code{\link{reactiveValues}}.
}

6 changes: 3 additions & 3 deletions man/plotOutput.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -19,9 +19,9 @@
\item{clickId}{If not \code{NULL}, the plot will send
coordinates to the server whenever it is clicked. This
information will be accessible on the \code{input} object
using \code{input$\emph{clickId}}. The value will be a
named list or vector with \code{x} and \code{y} elements
indicating the mouse position in user units.}
using \code{input$}\emph{\code{clickId}}. The value will
be a named list or vector with \code{x} and \code{y}
elements indicating the mouse position in user units.}

\item{hoverId}{If not \code{NULL}, the plot will send
coordinates to the server whenever the mouse pauses on
Expand Down
3 changes: 2 additions & 1 deletion man/reactiveValues.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -42,6 +42,7 @@ values <- reactiveValues(a = 1, b = 2)
isolate(values$a)
}
\seealso{
\code{\link{isolate}}.
\code{\link{isolate}} and
\code{\link{is.reactivevalues}}.
}

14 changes: 14 additions & 0 deletions man/tag.Rd
Original file line number Diff line number Diff line change
@@ -1,6 +1,8 @@
\name{tag}
\alias{tag}
\alias{tagAppendChild}
\alias{tagAppendChildren}
\alias{tagSetChildren}
\alias{tagList}
\title{
HTML Tag Object
Expand All @@ -16,6 +18,14 @@ sets of tags; see the contents of bootstrap.R for examples.

\code{tagAppendChild(tag, child)}

\code{tagAppendChildren(tag, child1, child2)}

\code{tagAppendChildren(tag, list = list(child1, child2))}

\code{tagSetChildren(tag, child1, child2)}

\code{tagSetChildren(tag, list = list(child1, child2))}

\code{tagList(...)}
}

Expand All @@ -38,6 +48,10 @@ sets of tags; see the contents of bootstrap.R for examples.
}
\item{...}{
Unnamed items that comprise this list of tags.
}
\item{list}{
An optional list of elements. Can be used with or instead of the \code{...}
items.
}
}

Expand Down

0 comments on commit 40cc5d5

Please sign in to comment.