Skip to content

Commit

Permalink
Merge pull request #65 from r-lib/dots-dots
Browse files Browse the repository at this point in the history
Use ... not \dots across all Rd
  • Loading branch information
MichaelChirico authored Oct 13, 2024
2 parents a014e88 + fbecde8 commit 5c7ee7d
Show file tree
Hide file tree
Showing 37 changed files with 368 additions and 368 deletions.
20 changes: 10 additions & 10 deletions R/cache.R
Original file line number Diff line number Diff line change
Expand Up @@ -29,7 +29,7 @@
#! setcache(x, which, value)
#! getcache(x, which)
#! remcache(x)
#! \method{print}{cache}(x, all.names = FALSE, pattern, \dots)
#! \method{print}{cache}(x, all.names = FALSE, pattern, ...)
#! }
#! \arguments{
#! \item{x}{
Expand All @@ -47,7 +47,7 @@
#! \item{pattern}{
#! passed to \code{\link{ls}} when listing the cache content
#! }
#! \item{\dots}{
#! \item{...}{
#! ignored
#! }
#! }
Expand Down Expand Up @@ -181,7 +181,7 @@ print.cache<- function(x, all.names=FALSE, pattern, ...){
#! Functions to create cache that accelerates many operations
#! }
#! \usage{
#! hashcache(x, nunique=NULL, \dots)
#! hashcache(x, nunique=NULL, ...)
#! sortcache(x, has.na = NULL)
#! sortordercache(x, has.na = NULL, stable = NULL)
#! ordercache(x, has.na = NULL, stable = NULL, optimize = "time")
Expand All @@ -202,7 +202,7 @@ print.cache<- function(x, all.names=FALSE, pattern, ...){
#! by default ramsort optimizes for 'time' which requires more RAM,
#! set to 'memory' to minimize RAM requirements and sacrifice speed
#! }
#! \item{\dots}{
#! \item{...}{
#! passed to \code{\link{hashmap}}
#! }
#! }
Expand Down Expand Up @@ -327,17 +327,17 @@ ordercache <- function(x, has.na = NULL, stable = NULL, optimize = "time"){
#! These methods are packaged here for methods in packages \code{bit64} and \code{ff}.
#! }
#! \usage{
#! \method{is.sorted}{integer64}(x, \dots)
#! \method{na.count}{integer64}(x, \dots)
#! \method{nvalid}{integer64}(x, \dots)
#! \method{nunique}{integer64}(x, \dots)
#! \method{nties}{integer64}(x, \dots)
#! \method{is.sorted}{integer64}(x, ...)
#! \method{na.count}{integer64}(x, ...)
#! \method{nvalid}{integer64}(x, ...)
#! \method{nunique}{integer64}(x, ...)
#! \method{nties}{integer64}(x, ...)
#! }
#! \arguments{
#! \item{x}{
#! some object
#! }
#! \item{\dots}{
#! \item{...}{
#! ignored
#! }
#! }
Expand Down
54 changes: 27 additions & 27 deletions R/hash64.R
Original file line number Diff line number Diff line change
Expand Up @@ -46,32 +46,32 @@
#! re-use hashmaps, which avoid re-building hashmaps again and again.
#! }
#! \usage{
#! hashfun(x, \dots)
#! \method{hashfun}{integer64}(x, minfac=1.41, hashbits=NULL, \dots)
#! hashmap(x, \dots)
#! \method{hashmap}{integer64}(x, nunique=NULL, minfac=1.41, hashbits=NULL, cache=NULL, \dots)
#! hashpos(cache, \dots)
#! \method{hashpos}{cache_integer64}(cache, x, nomatch = NA_integer_, \dots)
#! hashrev(cache, \dots)
#! \method{hashrev}{cache_integer64}(cache, x, nomatch = NA_integer_, \dots)
#! hashfin(cache, \dots)
#! \method{hashfin}{cache_integer64}(cache, x, \dots)
#! hashrin(cache, \dots)
#! \method{hashrin}{cache_integer64}(cache, x, \dots)
#! hashdup(cache, \dots)
#! \method{hashdup}{cache_integer64}(cache, \dots)
#! hashuni(cache, \dots)
#! \method{hashuni}{cache_integer64}(cache, keep.order=FALSE, \dots)
#! hashmapuni(x, \dots)
#! \method{hashmapuni}{integer64}(x, nunique=NULL, minfac=1.5, hashbits=NULL, \dots)
#! hashupo(cache, \dots)
#! \method{hashupo}{cache_integer64}(cache, keep.order=FALSE, \dots)
#! hashmapupo(x, \dots)
#! \method{hashmapupo}{integer64}(x, nunique=NULL, minfac=1.5, hashbits=NULL, \dots)
#! hashtab(cache, \dots)
#! \method{hashtab}{cache_integer64}(cache, \dots)
#! hashmaptab(x, \dots)
#! \method{hashmaptab}{integer64}(x, nunique=NULL, minfac=1.5, hashbits=NULL, \dots)
#! hashfun(x, ...)
#! \method{hashfun}{integer64}(x, minfac=1.41, hashbits=NULL, ...)
#! hashmap(x, ...)
#! \method{hashmap}{integer64}(x, nunique=NULL, minfac=1.41, hashbits=NULL, cache=NULL, ...)
#! hashpos(cache, ...)
#! \method{hashpos}{cache_integer64}(cache, x, nomatch = NA_integer_, ...)
#! hashrev(cache, ...)
#! \method{hashrev}{cache_integer64}(cache, x, nomatch = NA_integer_, ...)
#! hashfin(cache, ...)
#! \method{hashfin}{cache_integer64}(cache, x, ...)
#! hashrin(cache, ...)
#! \method{hashrin}{cache_integer64}(cache, x, ...)
#! hashdup(cache, ...)
#! \method{hashdup}{cache_integer64}(cache, ...)
#! hashuni(cache, ...)
#! \method{hashuni}{cache_integer64}(cache, keep.order=FALSE, ...)
#! hashmapuni(x, ...)
#! \method{hashmapuni}{integer64}(x, nunique=NULL, minfac=1.5, hashbits=NULL, ...)
#! hashupo(cache, ...)
#! \method{hashupo}{cache_integer64}(cache, keep.order=FALSE, ...)
#! hashmapupo(x, ...)
#! \method{hashmapupo}{integer64}(x, nunique=NULL, minfac=1.5, hashbits=NULL, ...)
#! hashtab(cache, ...)
#! \method{hashtab}{cache_integer64}(cache, ...)
#! hashmaptab(x, ...)
#! \method{hashmaptab}{integer64}(x, nunique=NULL, minfac=1.5, hashbits=NULL, ...)
#! }
#! \arguments{
#! \item{x}{ an integer64 vector }
Expand All @@ -82,7 +82,7 @@
#! \item{nunique}{ giving \emph{correct} number of unique elements can help reducing the size of the hashmap }
#! \item{nomatch}{ the value to be returned if an element is not found in the hashmap }
#! \item{keep.order}{ determines order of results and speed: \code{FALSE} (the default) is faster and returns in the (pseudo)random order of the hash function, \code{TRUE} returns in the order of first appearance in the original data, but this requires extra work }
#! \item{\dots}{ further arguments, passed from generics, ignored in methods }
#! \item{...}{ further arguments, passed from generics, ignored in methods }
#! }
#! \details{
#! \tabular{rrl}{
Expand Down
58 changes: 29 additions & 29 deletions R/highlevel64.R
Original file line number Diff line number Diff line change
Expand Up @@ -1417,7 +1417,7 @@ optimizer64 <- function(nsmall=2L^16L, nbig=2L^25L, timefun=repeat.time
#! \item{method}{
#! NULL for automatic method selection or a suitable low-level method, see details
#! }
#! \item{\dots}{
#! \item{...}{
#! ignored
#! }
#! }
Expand Down Expand Up @@ -1706,7 +1706,7 @@ match.integer64 <- function(x, table, nomatch = NA_integer_, nunique=NULL, metho
#! indicating which elements (rows) are duplicates.
#! }
#! \usage{
#! \method{duplicated}{integer64}(x, incomparables = FALSE, nunique = NULL, method = NULL, \dots)
#! \method{duplicated}{integer64}(x, incomparables = FALSE, nunique = NULL, method = NULL, ...)
#! }
#! \arguments{
#! \item{x}{a vector or a data frame or an array or \code{NULL}.}
Expand All @@ -1717,7 +1717,7 @@ match.integer64 <- function(x, table, nomatch = NA_integer_, nunique=NULL, metho
#! \item{method}{
#! NULL for automatic method selection or a suitable low-level method, see details
#! }
#! \item{\dots}{ignored}
#! \item{...}{ignored}
#! }
#! \details{
#! This function automatically chooses from several low-level functions considering the size of \code{x} and the availability of a cache.
Expand Down Expand Up @@ -1810,7 +1810,7 @@ duplicated.integer64 <- function(x
#! }
#! \usage{
#! \method{unique}{integer64}(x, incomparables = FALSE, order = c("original","values","any")
#! , nunique = NULL, method = NULL, \dots)
#! , nunique = NULL, method = NULL, ...)
#! }
#! \arguments{
#! \item{x}{a vector or a data frame or an array or \code{NULL}.}
Expand All @@ -1822,7 +1822,7 @@ duplicated.integer64 <- function(x
#! \item{method}{
#! NULL for automatic method selection or a suitable low-level method, see details
#! }
#! \item{\dots}{ignored}
#! \item{...}{ignored}
#! }
#! \details{
#! This function automatically chooses from several low-level functions considering the size of \code{x} and the availability of a cache.
Expand Down Expand Up @@ -1979,9 +1979,9 @@ unique.integer64 <- function(x
#! \code{unipos} returns the positions of those elements returned by \code{\link{unique}}.
#! }
#! \usage{
#! unipos(x, incomparables = FALSE, order = c("original","values","any"), \dots)
#! unipos(x, incomparables = FALSE, order = c("original","values","any"), ...)
#! \method{unipos}{integer64}(x, incomparables = FALSE, order = c("original","values","any")
#! , nunique = NULL, method = NULL, \dots)
#! , nunique = NULL, method = NULL, ...)
#! }
#! \arguments{
#! \item{x}{a vector or a data frame or an array or \code{NULL}.}
Expand All @@ -1993,7 +1993,7 @@ unique.integer64 <- function(x
#! \item{method}{
#! NULL for automatic method selection or a suitable low-level method, see details
#! }
#! \item{\dots}{ignored}
#! \item{...}{ignored}
#! }
#! \details{
#! This function automatically chooses from several low-level functions considering the size of \code{x} and the availability of a cache.
Expand Down Expand Up @@ -2147,7 +2147,7 @@ unipos.integer64 <- function(x
#! table of the counts at each combination of vector values.
#! }
#! \usage{
#! table.integer64(\dots
#! table.integer64(...
#! , return = c("table","data.frame","list")
#! , order = c("values","counts")
#! , nunique = NULL
Expand All @@ -2156,7 +2156,7 @@ unipos.integer64 <- function(x
#! )
#! }
#! \arguments{
#! \item{\dots}{one or more objects which can be interpreted as factors
#! \item{...}{one or more objects which can be interpreted as factors
#! (including character strings), or a list (or data frame) whose
#! components can be so interpreted. (For \code{as.table} and
#! \code{as.data.frame}, arguments passed to specific methods.)}
Expand Down Expand Up @@ -2186,7 +2186,7 @@ unipos.integer64 <- function(x
#! \cr
#! If the argument \code{dnn} is not supplied, the internal function
#! \code{list.names} is called to compute the \sQuote{dimname names}. If the
#! arguments in \code{\dots} are named, those names are used. For the
#! arguments in \code{...} are named, those names are used. For the
#! remaining arguments, \code{deparse.level = 0} gives an empty name,
#! \code{deparse.level = 1} uses the supplied argument if it is a symbol,
#! and \code{deparse.level = 2} will deparse the argument.
Expand Down Expand Up @@ -2481,15 +2481,15 @@ as.integer64.factor <- function(x, ...)as.integer64(unclass(x))
#! \code{keypos} returns the positions of the (fact table) elements that participate in their sorted unique subset (dimension table)
#! }
#! \usage{
#! keypos(x, \dots)
#! \method{keypos}{integer64}(x, method = NULL, \dots)
#! keypos(x, ...)
#! \method{keypos}{integer64}(x, method = NULL, ...)
#! }
#! \arguments{
#! \item{x}{a vector or a data frame or an array or \code{NULL}.}
#! \item{method}{
#! NULL for automatic method selection or a suitable low-level method, see details
#! }
#! \item{\dots}{ignored}
#! \item{...}{ignored}
#! }
#! \details{
#! NAs are sorted first in the dimension table, see \code{\link{ramorder.integer64}}.
Expand Down Expand Up @@ -2569,8 +2569,8 @@ keypos.integer64 <- function(x
#! \code{tiepos} returns the positions of those elements that participate in ties.
#! }
#! \usage{
#! tiepos(x, \dots)
#! \method{tiepos}{integer64}(x, nties = NULL, method = NULL, \dots)
#! tiepos(x, ...)
#! \method{tiepos}{integer64}(x, nties = NULL, method = NULL, ...)
#! }
#! \arguments{
#! \item{x}{a vector or a data frame or an array or \code{NULL}.}
Expand All @@ -2580,7 +2580,7 @@ keypos.integer64 <- function(x
#! \item{method}{
#! NULL for automatic method selection or a suitable low-level method, see details
#! }
#! \item{\dots}{ignored}
#! \item{...}{ignored}
#! }
#! \details{
#! This function automatically chooses from several low-level functions considering the size of \code{x} and the availability of a cache.
Expand Down Expand Up @@ -2665,14 +2665,14 @@ tiepos.integer64 <- function(x
#! values) are averaged and missing values propagated.
#! }
#! \usage{
#! \method{rank}{integer64}(x, method = NULL, \dots)
#! \method{rank}{integer64}(x, method = NULL, ...)
#! }
#! \arguments{
#! \item{x}{a integer64 vector}
#! \item{method}{
#! NULL for automatic method selection or a suitable low-level method, see details
#! }
#! \item{\dots}{ignored}
#! \item{...}{ignored}
#! }
#! \details{
#! This function automatically chooses from several low-level functions considering the size of \code{x} and the availability of a cache.
Expand Down Expand Up @@ -2750,15 +2750,15 @@ rank.integer64 <- function(x
#! \code{\link{qtile.integer64}} is the inverse function of 'prank.integer64' and projects [0..1] to [min..max].
#! }
#! \usage{
#! prank(x, \dots)
#! \method{prank}{integer64}(x, method = NULL, \dots)
#! prank(x, ...)
#! \method{prank}{integer64}(x, method = NULL, ...)
#! }
#! \arguments{
#! \item{x}{a integer64 vector}
#! \item{method}{
#! NULL for automatic method selection or a suitable low-level method, see details
#! }
#! \item{\dots}{ignored}
#! \item{...}{ignored}
#! }
#! \details{
#! Function \code{prank.integer64} is based on \code{\link{rank.integer64}}.
Expand Down Expand Up @@ -2806,12 +2806,12 @@ prank.integer64 <- function(x
#! \code{qtile.ineger64} is the inverse function of 'prank.integer64' and projects [0..1] to [min..max].
#! }
#! \usage{
#! qtile(x, probs=seq(0, 1, 0.25), \dots)
#! \method{qtile}{integer64}(x, probs = seq(0, 1, 0.25), names = TRUE, method = NULL, \dots)
#! \method{quantile}{integer64}(x, probs = seq(0, 1, 0.25), na.rm = FALSE, names = TRUE, type=0L, \dots)
#! \method{median}{integer64}(x, na.rm = FALSE, \dots)
#! \method{mean}{integer64}(x, na.rm = FALSE, \dots)
#! \method{summary}{integer64}(object, \dots)
#! qtile(x, probs=seq(0, 1, 0.25), ...)
#! \method{qtile}{integer64}(x, probs = seq(0, 1, 0.25), names = TRUE, method = NULL, ...)
#! \method{quantile}{integer64}(x, probs = seq(0, 1, 0.25), na.rm = FALSE, names = TRUE, type=0L, ...)
#! \method{median}{integer64}(x, na.rm = FALSE, ...)
#! \method{mean}{integer64}(x, na.rm = FALSE, ...)
#! \method{summary}{integer64}(object, ...)
#! ## mean(x, na.rm = FALSE, ...)
#! ## or
#! ## mean(x, na.rm = FALSE)
Expand All @@ -2834,7 +2834,7 @@ prank.integer64 <- function(x
#! \item{na.rm}{
#! logical; if \code{TRUE}, any \code{NA} and \code{NaN}'s are removed from \code{x} before the quantiles are computed.
#! }
#! \item{\dots}{ignored}
#! \item{...}{ignored}
#! }
#! \details{
#! Functions \code{quantile.integer64} with \code{type=0} and \code{median.integer64} are convenience wrappers to \code{qtile}.
Expand Down
Loading

0 comments on commit 5c7ee7d

Please sign in to comment.