RandomNbinomArray-class {DelayedRandomArray} | R Documentation |
A DelayedArray subclass that performs on-the-fly sampling of negative binomial-distributed values.
RandomNbinomArraySeed( dim, prob = prob, size = size, mu = mu, chunkdim = NULL, sparse = FALSE ) ## S4 method for signature 'RandomNbinomArraySeed' DelayedArray(seed) RandomNbinomArray(dim, prob, size, mu, chunkdim = NULL, sparse = FALSE)
dim |
Integer vector of positive length, specifying the dimensions of the array. |
prob, size, mu |
Numeric vector used as the argument of the same name in Exactly one of |
chunkdim |
Integer vector of length equal to |
sparse |
Logical scalar indicating whether the sampled array should be treated as sparse. |
seed |
A RandomNbinomArraySeed object. |
All constructors return an instance of a RandomNbinomArray object, containing random draws from a negative binomial distribution with the specified parameters.
Aaron Lun
The RandomArraySeed class, for details on chunking and the distributional parameters.
X <- RandomNbinomArraySeed(c(1e5, 1e5), size=10, mu=20) Y <- DelayedArray(X) Y # Fiddling with the distribution parameters: X2 <- RandomNbinomArraySeed(c(1e5, 1e5), size=10, mu=runif(1e5), sparse=TRUE) Y2 <- DelayedArray(X2) Y2 # Using another array as input: library(Matrix) lambda <- rsparsematrix(1e5, 1e5, density=0.00001) lambda <- abs(DelayedArray(lambda)) + 0.1 X3 <- RandomNbinomArraySeed(c(1e5, 1e5), size=1, mu=lambda) Y3 <- DelayedArray(X3) Y3