| bpmapply {BiocParallel} | R Documentation |
bpmapply applies FUN to first elements of ...,
the second elements and so on. Any type of object in ... is
allowed, provided length, [, and [[ methods are
available. The return value is a list of length equal to the
length of all objects provided, as with mapply.
bpmapply(FUN, ..., MoreArgs=NULL, SIMPLIFY=TRUE, USE.NAMES=TRUE,
BPREDO=list(), BPPARAM=bpparam())
## S4 method for signature 'ANY,missing'
bpmapply(FUN, ..., MoreArgs=NULL, SIMPLIFY=TRUE,
USE.NAMES=TRUE, BPREDO=list(), BPPARAM=bpparam())
## S4 method for signature 'ANY,BiocParallelParam'
bpmapply(FUN, ..., MoreArgs=NULL,
SIMPLIFY=TRUE, USE.NAMES=TRUE, BPREDO=list(), BPPARAM=bpparam())
FUN |
The |
... |
Objects for which methods |
MoreArgs |
List of additional arguments to |
SIMPLIFY |
If |
USE.NAMES |
If |
BPPARAM |
An optional |
BPREDO |
A |
See showMethods{bpmapply} for additional methods, e.g.,
method?bpmapply("MulticoreParam").
See mapply.
Michel Lang . Original code as attributed in
mclapply.
bpvec for parallel, vectorized calculations.
BiocParallelParam for possible values of BPPARAM.
showMethods("bpmapply")
fun <- function(greet, who) {
paste(Sys.getpid(), greet, who)
}
greet <- c("morning", "night")
who <- c("sun", "moon")
param <- bpparam()
original <- bpworkers(param)
bpworkers(param) <- 2
result <- bpmapply(fun, greet, who, BPPARAM = param)
cat(paste(result, collapse="\n"), "\n")
bpworkers(param) <- original