This R cubature package exposes both the hcubature and pcubature routines of the underlying C cubature library, including the vectorized interfaces.
Per the documentation, use of pcubature is advisable only for smooth integrands in dimensions up to three at most. In fact, the pcubature routines perform significantly worse than the vectorized hcubature in inappropriate cases. So when in doubt, you are better off using hcubature.
Version 2.0 of this package integrates the Cuba library as well, once again providing vectorized interfaces.
The main point of this note is to examine the difference vectorization makes. My recommendations are below in the summary section.
Our harness will provide timing results for hcubature, pcubature (where appropriate) and Cuba cuhre calls. We begin by creating a harness for these calls.
library(benchr)
library(cubature)
harness <- function(which = NULL,
                    f, fv, lowerLimit, upperLimit, tol = 1e-3, times = 20, ...) {
    fns <- c(hc = "Non-vectorized Hcubature",
             hc.v = "Vectorized Hcubature",
             pc = "Non-vectorized Pcubature",
             pc.v = "Vectorized Pcubature",
             cc = "Non-vectorized cubature::cuhre",
             cc_v = "Vectorized cubature::cuhre")
    cc <- function() cubature::cuhre(f = f,
                                     lowerLimit = lowerLimit, upperLimit = upperLimit,
                                     relTol = tol,
                                     ...)
    cc_v <- function() cubature::cuhre(f = fv,
                                       lowerLimit = lowerLimit, upperLimit = upperLimit,
                                       relTol = tol,
                                       nVec = 1024L,
                                       ...)
    hc <- function() cubature::hcubature(f = f,
                                         lowerLimit = lowerLimit,
                                         upperLimit = upperLimit,
                                         tol = tol,
                                         ...)
    hc.v <- function() cubature::hcubature(f = fv,
                                           lowerLimit = lowerLimit,
                                           upperLimit = upperLimit,
                                           tol = tol,
                                           vectorInterface = TRUE,
                                           ...)
    pc <- function() cubature::pcubature(f = f,
                                     lowerLimit = lowerLimit,
                                     upperLimit = upperLimit,
                                     tol = tol,
                                     ...)
    pc.v <- function() cubature::pcubature(f = fv,
                                           lowerLimit = lowerLimit,
                                           upperLimit = upperLimit,
                                           tol = tol,
                                           vectorInterface = TRUE,
                                           ...)
    
    ndim = length(lowerLimit)
    if (is.null(which)) {
        fnIndices <- seq_along(fns)
    } else {
        fnIndices <- na.omit(match(which, names(fns)))
    }
    fnList <- lapply(names(fns)[fnIndices], function(x) call(x))
    argList <- c(fnList, times = times, progress = FALSE)
    result <- do.call(benchr::benchmark, args = argList)
    d <- summary(result)[seq_along(fnIndices), ]
    d$expr <- fns[fnIndices]
    d
}We reel off the timing runs.
func <- function(x) sin(x[1]) * cos(x[2]) * exp(x[3])
func.v <- function(x) {
    matrix(apply(x, 2, function(z) sin(z[1]) * cos(z[2]) * exp(z[3])), ncol = ncol(x))
}
d <- harness(f = func, fv = func.v,
             lowerLimit = rep(0, 3),
             upperLimit = rep(1, 3),
             tol = 1e-5,
             times = 100)
knitr::kable(d, digits = 3, row.names = FALSE)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 100 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.002 | 0.042 | 1.07 | 
| Vectorized Hcubature | 100 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.001 | 0.037 | 1.00 | 
| Non-vectorized Pcubature | 100 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.003 | 0.125 | 3.41 | 
| Vectorized Pcubature | 100 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.003 | 0.109 | 2.97 | 
| Non-vectorized cubature::cuhre | 100 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.002 | 0.074 | 2.05 | 
| Vectorized cubature::cuhre | 100 | 0.000 | 0.000 | 0.001 | 0.001 | 0.001 | 0.002 | 0.058 | 1.55 | 
Using cubature, we evaluate \[
\int_R\phi(x)dx
\] where \(\phi(x)\) is the three-dimensional multivariate normal density with mean 0, and variance \[
\Sigma = \left(\begin{array}{rrr}
1 &\frac{3}{5} &\frac{1}{3}\\
\frac{3}{5} &1 &\frac{11}{15}\\
\frac{1}{3} &\frac{11}{15} & 1
\end{array}
\right)
\] and \(R\) is \([-\frac{1}{2}, 1] \times [-\frac{1}{2}, 4] \times [-\frac{1}{2}, 2].\)
We construct a scalar function (my_dmvnorm) and a vector analog (my_dmvnorm_v). First the functions.
m <- 3
sigma <- diag(3)
sigma[2,1] <- sigma[1, 2] <- 3/5 ; sigma[3,1] <- sigma[1, 3] <- 1/3
sigma[3,2] <- sigma[2, 3] <- 11/15
logdet <- sum(log(eigen(sigma, symmetric = TRUE, only.values = TRUE)$values))
my_dmvnorm <- function (x, mean, sigma, logdet) {
    x <- matrix(x, ncol = length(x))
    distval <- stats::mahalanobis(x, center = mean, cov = sigma)
    exp(-(3 * log(2 * pi) + logdet + distval)/2)
}
my_dmvnorm_v <- function (x, mean, sigma, logdet) {
    distval <- stats::mahalanobis(t(x), center = mean, cov = sigma)
    exp(matrix(-(3 * log(2 * pi) + logdet + distval)/2, ncol = ncol(x)))
}Now the timing.
d <- harness(f = my_dmvnorm, fv = my_dmvnorm_v,
             lowerLimit = rep(-0.5, 3),
             upperLimit = c(1, 4, 2),
             tol = 1e-5,
             times = 10,
             mean = rep(0, m), sigma = sigma, logdet = logdet)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 10 | 0.866 | 0.875 | 0.889 | 0.893 | 0.901 | 0.932 | 8.928 | 589.00 | 
| Vectorized Hcubature | 10 | 0.002 | 0.002 | 0.002 | 0.002 | 0.002 | 0.004 | 0.022 | 1.39 | 
| Non-vectorized Pcubature | 10 | 0.366 | 0.373 | 0.379 | 0.381 | 0.389 | 0.398 | 3.811 | 251.00 | 
| Vectorized Pcubature | 10 | 0.001 | 0.001 | 0.002 | 0.002 | 0.002 | 0.002 | 0.016 | 1.00 | 
| Non-vectorized cubature::cuhre | 10 | 0.347 | 0.360 | 0.367 | 0.367 | 0.375 | 0.389 | 3.670 | 243.00 | 
| Vectorized cubature::cuhre | 10 | 0.003 | 0.003 | 0.004 | 0.004 | 0.004 | 0.005 | 0.037 | 2.34 | 
The effect of vectorization is huge. So it makes sense for users to vectorize the integrands as much as possible for efficiency.
Furthermore, for this particular example, we expect mvtnorm::pmvnorm to do pretty well since it is specialized for the multivariate normal. The good news is that the vectorized versions of hcubature and pcubature are quite competitive if you compare the table above to the one below.
library(mvtnorm)
g1 <- function() mvtnorm::pmvnorm(lower = rep(-0.5, m),
                                  upper = c(1, 4, 2), mean = rep(0, m), corr = sigma,
                                  alg = Miwa(), abseps = 1e-5, releps = 1e-5)
g2 <- function() mvtnorm::pmvnorm(lower = rep(-0.5, m),
                                  upper = c(1, 4, 2), mean = rep(0, m), corr = sigma,
                                  alg = GenzBretz(), abseps = 1e-5, releps = 1e-5)
g3 <- function() mvtnorm::pmvnorm(lower = rep(-0.5, m),
                                  upper = c(1, 4, 2), mean = rep(0, m), corr = sigma,
                                  alg = TVPACK(), abseps = 1e-5, releps = 1e-5)
knitr::kable(summary(benchr::benchmark(g1(), g2(), g3(), times = 20, progress = FALSE)),
             digits = 3, row.names = FALSE)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| g1() | 20 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.003 | 0.021 | 1.00 | 
| g2() | 20 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.003 | 0.022 | 1.02 | 
| g3() | 20 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.003 | 0.021 | 1.05 | 
testFn0 <- function(x) prod(cos(x))
testFn0_v <- function(x) matrix(apply(x, 2, function(z) prod(cos(z))), ncol = ncol(x))
d <- harness(f = testFn0, fv = testFn0_v,
             lowerLimit = rep(0, 2), upperLimit = rep(1, 2), times = 1000)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 1000 | 0 | 0 | 0 | 0 | 0 | 0.000 | 0.060 | 1.00 | 
| Vectorized Hcubature | 1000 | 0 | 0 | 0 | 0 | 0 | 0.000 | 0.078 | 1.31 | 
| Non-vectorized Pcubature | 1000 | 0 | 0 | 0 | 0 | 0 | 0.002 | 0.078 | 1.28 | 
| Vectorized Pcubature | 1000 | 0 | 0 | 0 | 0 | 0 | 0.002 | 0.133 | 2.19 | 
| Non-vectorized cubature::cuhre | 1000 | 0 | 0 | 0 | 0 | 0 | 0.006 | 0.449 | 7.48 | 
| Vectorized cubature::cuhre | 1000 | 0 | 0 | 0 | 0 | 0 | 0.002 | 0.403 | 6.54 | 
testFn1 <- function(x) {
    val <- sum(((1 - x) / x)^2)
    scale <- prod((2 / sqrt(pi)) / x^2)
    exp(-val) * scale
}
testFn1_v <- function(x) {
    val <- matrix(apply(x, 2, function(z) sum(((1 - z) / z)^2)), ncol(x))
    scale <- matrix(apply(x, 2, function(z) prod((2 / sqrt(pi)) / z^2)), ncol(x))
    exp(-val) * scale
}
d <- harness(f = testFn1, fv = testFn1_v,
             lowerLimit = rep(0, 3), upperLimit = rep(1, 3), times = 10)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 10 | 0.003 | 0.003 | 0.003 | 0.003 | 0.004 | 0.004 | 0.034 | 25.0 | 
| Vectorized Hcubature | 10 | 0.004 | 0.004 | 0.004 | 0.004 | 0.005 | 0.005 | 0.043 | 32.7 | 
| Non-vectorized Pcubature | 10 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.002 | 1.0 | 
| Vectorized Pcubature | 10 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.002 | 1.4 | 
| Non-vectorized cubature::cuhre | 10 | 0.014 | 0.015 | 0.015 | 0.015 | 0.016 | 0.016 | 0.152 | 117.0 | 
| Vectorized cubature::cuhre | 10 | 0.016 | 0.018 | 0.018 | 0.018 | 0.019 | 0.021 | 0.183 | 140.0 | 
testFn2 <- function(x) {
    radius <- 0.50124145262344534123412
    ifelse(sum(x * x) < radius * radius, 1, 0)
}
testFn2_v <- function(x) {
    radius <- 0.50124145262344534123412
    matrix(apply(x, 2, function(z) ifelse(sum(z * z) < radius * radius, 1, 0)), ncol = ncol(x))
}
d <- harness(which = c("hc", "hc.v", "cc", "cc_v"),
             f = testFn2, fv = testFn2_v,
             lowerLimit = rep(0, 2), upperLimit = rep(1, 2), times = 10)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 10 | 0.045 | 0.047 | 0.050 | 0.053 | 0.053 | 0.083 | 0.530 | 1.2 | 
| Vectorized Hcubature | 10 | 0.040 | 0.041 | 0.042 | 0.042 | 0.044 | 0.045 | 0.425 | 1.0 | 
| Non-vectorized cubature::cuhre | 10 | 0.848 | 0.868 | 0.872 | 0.880 | 0.878 | 0.929 | 8.800 | 20.9 | 
| Vectorized cubature::cuhre | 10 | 0.740 | 0.779 | 0.784 | 0.786 | 0.798 | 0.821 | 7.859 | 18.8 | 
testFn3 <- function(x) prod(2 * x)
testFn3_v <- function(x) matrix(apply(x, 2, function(z) prod(2 * z)), ncol = ncol(x))
d <- harness(f = testFn3, fv = testFn3_v,
             lowerLimit = rep(0, 3), upperLimit = rep(1, 3), times = 50)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 50 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.005 | 1.13 | 
| Vectorized Hcubature | 50 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.005 | 1.32 | 
| Non-vectorized Pcubature | 50 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.004 | 1.00 | 
| Vectorized Pcubature | 50 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.000 | 0.005 | 1.21 | 
| Non-vectorized cubature::cuhre | 50 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.043 | 10.90 | 
| Vectorized cubature::cuhre | 50 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.011 | 0.045 | 8.42 | 
testFn4 <- function(x) {
    a <- 0.1
    s <- sum((x - 0.5)^2)
    ((2 / sqrt(pi)) / (2. * a))^length(x) * exp (-s / (a * a))
}
testFn4_v <- function(x) {
    a <- 0.1
    r <- apply(x, 2, function(z) {
        s <- sum((z - 0.5)^2)
        ((2 / sqrt(pi)) / (2. * a))^length(z) * exp (-s / (a * a))
    })
    matrix(r, ncol = ncol(x))
}
d <- harness(f = testFn4, fv = testFn4_v,
             lowerLimit = rep(0, 2), upperLimit = rep(1, 2), times = 20)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 20 | 0.001 | 0.001 | 0.002 | 0.002 | 0.002 | 0.003 | 0.034 | 1.05 | 
| Vectorized Hcubature | 20 | 0.001 | 0.001 | 0.001 | 0.002 | 0.002 | 0.003 | 0.031 | 1.00 | 
| Non-vectorized Pcubature | 20 | 0.002 | 0.002 | 0.002 | 0.002 | 0.003 | 0.003 | 0.048 | 1.60 | 
| Vectorized Pcubature | 20 | 0.002 | 0.002 | 0.002 | 0.002 | 0.002 | 0.003 | 0.044 | 1.49 | 
| Non-vectorized cubature::cuhre | 20 | 0.003 | 0.003 | 0.003 | 0.004 | 0.004 | 0.005 | 0.074 | 2.42 | 
| Vectorized cubature::cuhre | 20 | 0.003 | 0.003 | 0.003 | 0.003 | 0.003 | 0.004 | 0.065 | 2.14 | 
testFn5 <- function(x) {
    a <- 0.1
    s1 <- sum((x - 1 / 3)^2)
    s2 <- sum((x - 2 / 3)^2)
    0.5 * ((2 / sqrt(pi)) / (2. * a))^length(x) * (exp(-s1 / (a * a)) + exp(-s2 / (a * a)))
}
testFn5_v <- function(x) {
    a <- 0.1
    r <- apply(x, 2, function(z) {
        s1 <- sum((z - 1 / 3)^2)
        s2 <- sum((z - 2 / 3)^2)
        0.5 * ((2 / sqrt(pi)) / (2. * a))^length(z) * (exp(-s1 / (a * a)) + exp(-s2 / (a * a)))
    })
    matrix(r, ncol = ncol(x))
}
d <- harness(f = testFn5, fv = testFn5_v,
             lowerLimit = rep(0, 2), upperLimit = rep(1, 2), times = 20)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 20 | 0.004 | 0.004 | 0.004 | 0.004 | 0.004 | 0.006 | 0.086 | 1.51 | 
| Vectorized Hcubature | 20 | 0.003 | 0.004 | 0.004 | 0.004 | 0.004 | 0.006 | 0.081 | 1.40 | 
| Non-vectorized Pcubature | 20 | 0.003 | 0.003 | 0.003 | 0.003 | 0.003 | 0.004 | 0.062 | 1.12 | 
| Vectorized Pcubature | 20 | 0.003 | 0.003 | 0.003 | 0.003 | 0.003 | 0.004 | 0.058 | 1.00 | 
| Non-vectorized cubature::cuhre | 20 | 0.007 | 0.007 | 0.008 | 0.008 | 0.008 | 0.009 | 0.157 | 2.78 | 
| Vectorized cubature::cuhre | 20 | 0.006 | 0.007 | 0.007 | 0.007 | 0.007 | 0.009 | 0.143 | 2.53 | 
testFn6 <- function(x) {
    a <- (1 + sqrt(10.0)) / 9.0
    prod( a / (a + 1) * ((a + 1) / (a + x))^2)
}
testFn6_v <- function(x) {
    a <- (1 + sqrt(10.0)) / 9.0
    r <- apply(x, 2, function(z) prod( a / (a + 1) * ((a + 1) / (a + z))^2))
    matrix(r, ncol = ncol(x))
}
d <- harness(f = testFn6, fv = testFn6_v,
             lowerLimit = rep(0, 3), upperLimit = rep(1, 3), times = 20)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 20 | 0.002 | 0.002 | 0.002 | 0.002 | 0.002 | 0.003 | 0.042 | 1.00 | 
| Vectorized Hcubature | 20 | 0.002 | 0.002 | 0.002 | 0.002 | 0.002 | 0.003 | 0.041 | 1.00 | 
| Non-vectorized Pcubature | 20 | 0.009 | 0.010 | 0.010 | 0.010 | 0.011 | 0.012 | 0.207 | 5.10 | 
| Vectorized Pcubature | 20 | 0.008 | 0.008 | 0.009 | 0.009 | 0.010 | 0.011 | 0.186 | 4.67 | 
| Non-vectorized cubature::cuhre | 20 | 0.005 | 0.005 | 0.005 | 0.005 | 0.006 | 0.007 | 0.108 | 2.75 | 
| Vectorized cubature::cuhre | 20 | 0.004 | 0.004 | 0.004 | 0.005 | 0.005 | 0.013 | 0.095 | 2.18 | 
testFn7 <- function(x) {
    n <- length(x)
    p <- 1/n
    (1 + p)^n * prod(x^p)
}
testFn7_v <- function(x) {
    matrix(apply(x, 2, function(z) {
        n <- length(z)
        p <- 1/n
        (1 + p)^n * prod(z^p)
    }), ncol = ncol(x))
}
d <- harness(f = testFn7, fv = testFn7_v,
             lowerLimit = rep(0, 3), upperLimit = rep(1, 3), times = 20)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 20 | 0.004 | 0.004 | 0.004 | 0.004 | 0.004 | 0.007 | 0.085 | 1.11 | 
| Vectorized Hcubature | 20 | 0.003 | 0.003 | 0.004 | 0.004 | 0.004 | 0.005 | 0.073 | 1.00 | 
| Non-vectorized Pcubature | 20 | 0.009 | 0.010 | 0.011 | 0.011 | 0.011 | 0.012 | 0.213 | 2.95 | 
| Vectorized Pcubature | 20 | 0.007 | 0.008 | 0.009 | 0.011 | 0.009 | 0.047 | 0.212 | 2.48 | 
| Non-vectorized cubature::cuhre | 20 | 0.043 | 0.045 | 0.046 | 0.046 | 0.047 | 0.052 | 0.929 | 12.60 | 
| Vectorized cubature::cuhre | 20 | 0.034 | 0.036 | 0.037 | 0.037 | 0.038 | 0.044 | 0.740 | 10.20 | 
I.1d <- function(x) {
    sin(4 * x) *
        x * ((x * ( x * (x * x - 4) + 1) - 1))
}
I.1d_v <- function(x) {
    matrix(apply(x, 2, function(z)
        sin(4 * z) *
        z * ((z * ( z * (z * z - 4) + 1) - 1))),
        ncol = ncol(x))
}
d <- harness(f = I.1d, fv = I.1d_v,
             lowerLimit = -2, upperLimit = 2, times = 100)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 100 | 0 | 0 | 0 | 0.000 | 0.000 | 0.001 | 0.020 | 2.28 | 
| Vectorized Hcubature | 100 | 0 | 0 | 0 | 0.000 | 0.000 | 0.001 | 0.021 | 2.52 | 
| Non-vectorized Pcubature | 100 | 0 | 0 | 0 | 0.000 | 0.000 | 0.000 | 0.008 | 1.00 | 
| Vectorized Pcubature | 100 | 0 | 0 | 0 | 0.000 | 0.000 | 0.000 | 0.016 | 2.04 | 
| Non-vectorized cubature::cuhre | 100 | 0 | 0 | 0 | 0.000 | 0.000 | 0.001 | 0.032 | 3.93 | 
| Vectorized cubature::cuhre | 100 | 0 | 0 | 0 | 0.001 | 0.001 | 0.002 | 0.052 | 6.29 | 
I.2d <- function(x) {
    x1 <- x[1]; x2 <- x[2]
    sin(4 * x1 + 1) * cos(4 * x2) * x1 * (x1 * (x1 * x1)^2 - x2 * (x2 * x2 - x1) +2)
}
I.2d_v <- function(x) {
    matrix(apply(x, 2,
                 function(z) {
                     x1 <- z[1]; x2 <- z[2]
                     sin(4 * x1 + 1) * cos(4 * x2) * x1 * (x1 * (x1 * x1)^2 - x2 * (x2 * x2 - x1) +2)
                 }),
           ncol = ncol(x))
}
d <- harness(f = I.2d, fv = I.2d_v,
             lowerLimit = rep(-1, 2), upperLimit = rep(1, 2), times = 100)
knitr::kable(d, digits = 3)| expr | n.eval | min | lw.qu | median | mean | up.qu | max | total | relative | 
|---|---|---|---|---|---|---|---|---|---|
| Non-vectorized Hcubature | 100 | 0.005 | 0.005 | 0.006 | 0.006 | 0.006 | 0.013 | 0.602 | 10.80 | 
| Vectorized Hcubature | 100 | 0.004 | 0.004 | 0.005 | 0.005 | 0.005 | 0.008 | 0.490 | 8.98 | 
| Non-vectorized Pcubature | 100 | 0.000 | 0.001 | 0.001 | 0.001 | 0.001 | 0.002 | 0.057 | 1.00 | 
| Vectorized Pcubature | 100 | 0.000 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.057 | 1.04 | 
| Non-vectorized cubature::cuhre | 100 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.003 | 0.148 | 2.68 | 
| Vectorized cubature::cuhre | 100 | 0.001 | 0.001 | 0.001 | 0.001 | 0.001 | 0.003 | 0.127 | 2.22 | 
About the only real modification we have made to the underlying cubature-1.0.2 library is that we use M = 16 rather than the default M = 19 suggested by the original author for pcubature. This allows us to comply with CRAN package size limits and seems to work reasonably well for the above tests. Future versions will allow for such customization on demand.
The changes made to the Cuba-4.2 library are separated out so that the original source is left pristine and the changes (a small number) applied only during the building process.
My recommendations are:
Vectorize your function. The time spent in so doing pays back enormously. This is easy to do and the examples above show how.
Vectorized hcubature seems to be a good starting point.
For smooth integrands in low dimensions (\(\leq 3\)), pcubature might be worth trying out. Experiment before using in a production package.
sessionInfo()## R version 4.0.5 (2021-03-31)
## Platform: x86_64-apple-darwin20.3.0 (64-bit)
## Running under: macOS Big Sur 11.3
## 
## Matrix products: default
## BLAS:   /usr/local/Cellar/openblas/0.3.15_1/lib/libopenblasp-r0.3.15.dylib
## LAPACK: /usr/local/Cellar/r/4.0.5_1/lib/R/lib/libRlapack.dylib
## 
## locale:
## [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] mvtnorm_1.1-1    cubature_2.0.4.2 benchr_0.2.5    
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_1.0.6         digest_0.6.27      R6_2.5.0           jsonlite_1.7.2    
##  [5] magrittr_2.0.1     evaluate_0.14      highr_0.9          rlang_0.4.11      
##  [9] stringi_1.5.3      jquerylib_0.1.4    bslib_0.2.4        rmarkdown_2.7     
## [13] tools_4.0.5        stringr_1.4.0      RcppProgress_0.4.2 xfun_0.22         
## [17] yaml_2.2.1         compiler_4.0.5     htmltools_0.5.1.1  knitr_1.33        
## [21] sass_0.3.1