RandomBetaArray-class {DelayedRandomArray} | R Documentation |
A DelayedArray subclass that performs on-the-fly sampling of beta-distributed values.
RandomBetaArraySeed(dim, shape1, shape2, ncp = 0, chunkdim = NULL) ## S4 method for signature 'RandomBetaArraySeed' DelayedArray(seed) RandomBetaArray(dim, shape1, shape2, ncp = 0, chunkdim = NULL)
dim |
Integer vector of positive length, specifying the dimensions of the array. |
shape1, shape2, ncp |
Numeric vector used as the argument of the same name in |
chunkdim |
Integer vector of length equal to |
seed |
A RandomBetaArraySeed object. |
All constructors return an instance of a RandomBetaArray object, containing random draws from a beta distribution with the specified parameters.
Aaron Lun
The RandomArraySeed class, for details on chunking and the distributional parameters.
X <- RandomBetaArraySeed(c(1e5, 1e5), shape1=1, shape2=10) Y <- DelayedArray(X) Y # Fiddling with the distribution parameters: X2 <- RandomBetaArraySeed(c(1e5, 1e5), shape1=runif(1e5), shape2=2) Y2 <- DelayedArray(X2) Y2 # Using another array as input: library(Matrix) s1 <- rsparsematrix(1e5, 1e5, density=0.00001) s1 <- abs(DelayedArray(s1)) + 1 X3 <- RandomBetaArraySeed(c(1e5, 1e5), shape1=s1, shape2=s1+1) Y3 <- DelayedArray(X3) Y3