Skip to content

Commit f940cae

Browse files
authoredNov 17, 2022
Merge pull request #178 from kgoldfeld/fix-addCorGen-2
Fix add cor gen 2
2 parents 651b898 + 26101ca commit f940cae

12 files changed

+359
-534
lines changed
 

‎CITATION.cff

+10-19
Original file line numberDiff line numberDiff line change
@@ -123,25 +123,6 @@ references:
123123
email: matteo.fasiolo@gmail.com
124124
year: '2022'
125125
url: https://CRAN.R-project.org/package=mvnfast
126-
- type: software
127-
title: mvtnorm
128-
abstract: 'mvtnorm: Multivariate Normal and t Distributions'
129-
notes: Imports
130-
authors:
131-
- family-names: Genz
132-
given-names: Alan
133-
- family-names: Bretz
134-
given-names: Frank
135-
- family-names: Miwa
136-
given-names: Tetsuhisa
137-
- family-names: Mi
138-
given-names: Xuefei
139-
- family-names: Hothorn
140-
given-names: Torsten
141-
email: Torsten.Hothorn@R-project.org
142-
orcid: https://orcid.org/0000-0001-8301-0471
143-
year: '2022'
144-
url: https://CRAN.R-project.org/package=mvtnorm
145126
- type: software
146127
title: Rcpp
147128
abstract: 'Rcpp: Seamless R and C++ Integration'
@@ -498,6 +479,16 @@ references:
498479
given-names: Emanuele
499480
year: '2022'
500481
url: https://CRAN.R-project.org/package=blockmatrix
482+
- type: software
483+
title: pbv
484+
abstract: 'pbv: Probabilities for Bivariate Normal Distribution'
485+
notes: LinkingTo
486+
authors:
487+
- family-names: Robitzsch
488+
given-names: Alexander
489+
year: '2022'
490+
url: https://CRAN.R-project.org/package=pbv
491+
version: '>= 0.4-22'
501492
identifiers:
502493
- type: url
503494
value: https://kgoldfeld.github.io/simstudy/dev/

‎DESCRIPTION

+4-4
Original file line numberDiff line numberDiff line change
@@ -2,7 +2,7 @@ Type: Package
22
Package: simstudy
33
Title: Simulation of Study Data
44
Version: 0.5.1.9000
5-
Date: 2022-10-03
5+
Date: 2022-11-16
66
Authors@R:
77
c(person(given = "Keith",
88
family = "Goldfeld",
@@ -33,7 +33,6 @@ Imports:
3333
glue,
3434
methods,
3535
mvnfast,
36-
mvtnorm,
3736
Rcpp,
3837
backports
3938
Suggests:
@@ -60,8 +59,9 @@ Suggests:
6059
survminer,
6160
blockmatrix
6261
LinkingTo:
63-
Rcpp
62+
Rcpp,
63+
pbv (>= 0.4-22)
6464
VignetteBuilder:
6565
knitr
6666
Encoding: UTF-8
67-
RoxygenNote: 7.2.1
67+
RoxygenNote: 7.2.2

‎NEWS.md

+6
Original file line numberDiff line numberDiff line change
@@ -5,6 +5,12 @@
55
accommodate clustered observations over time where the within-cluster correlation
66
in the same time period can be different from the within-cluster correlation across time periods.
77

8+
## Major fixes
9+
10+
* Overhauled function `addCorGen` to make it more flexible. It can now handle cluster
11+
dependent data, and not just time-dependent data. In addition, performance has been
12+
dramatically improved.
13+
814
# simstudy 0.5.1
915

1016
## Minor fixes

‎R/RcppExports.R

+12
Original file line numberDiff line numberDiff line change
@@ -17,3 +17,15 @@ chkNonIncreasing <- function(adjmatrix) {
1717
.Call(`_simstudy_chkNonIncreasing`, adjmatrix)
1818
}
1919

20+
checkBoundsBin <- function(p1, p2, d) {
21+
invisible(.Call(`_simstudy_checkBoundsBin`, p1, p2, d))
22+
}
23+
24+
findRhoBin <- function(p1, p2, d) {
25+
.Call(`_simstudy_findRhoBin`, p1, p2, d)
26+
}
27+
28+
getRhoMat <- function(N, P, TCORR) {
29+
.Call(`_simstudy_getRhoMat`, N, P, TCORR)
30+
}
31+

‎R/add_correlated_data.R

+122-260
Large diffs are not rendered by default.

‎R/generate_correlated_data.R

+19-96
Original file line numberDiff line numberDiff line change
@@ -258,36 +258,21 @@ genCorFlex <- function(n, defs, rho = 0, tau = NULL, corstr = "cs", corMatrix =
258258
#' Multivariate Binary Variates. The American Statistician 1991;45:302-4.
259259
#' @examples
260260
#' set.seed(23432)
261-
#' l <- c(8, 10, 12)
261+
#' lambda <- c(8, 10, 12)
262262
#'
263-
#' genCorGen(1000, nvars = 3, params1 = l, dist = "poisson", rho = .7, corstr = "cs")
264-
#' genCorGen(1000, nvars = 3, params1 = 5, dist = "poisson", rho = .7, corstr = "cs")
265-
#' genCorGen(1000, nvars = 3, params1 = l, dist = "poisson", rho = .7, corstr = "cs", wide = TRUE)
266-
#' genCorGen(1000, nvars = 3, params1 = 5, dist = "poisson", rho = .7, corstr = "cs", wide = TRUE)
263+
#' genCorGen(100, nvars = 3, params1 = lambda, dist = "poisson", rho = .7, corstr = "cs")
264+
#' genCorGen(100, nvars = 3, params1 = 5, dist = "poisson", rho = .7, corstr = "cs")
265+
#' genCorGen(100, nvars = 3, params1 = lambda, dist = "poisson", rho = .7, corstr = "cs", wide = TRUE)
266+
#' genCorGen(100, nvars = 3, params1 = 5, dist = "poisson", rho = .7, corstr = "cs", wide = TRUE)
267267
#'
268-
#' genCorGen(1000,
269-
#' nvars = 3, params1 = l, dist = "poisson", rho = .7, corstr = "cs",
268+
#' genCorGen(100,
269+
#' nvars = 3, params1 = lambda, dist = "poisson", rho = .7, corstr = "cs",
270270
#' cnames = "new_var"
271271
#' )
272-
#' genCorGen(1000,
273-
#' nvars = 3, params1 = l, dist = "poisson", rho = .7, corstr = "cs",
272+
#' genCorGen(100,
273+
#' nvars = 3, params1 = lambda, dist = "poisson", rho = .7, corstr = "cs",
274274
#' wide = TRUE, cnames = "a, b, c"
275275
#' )
276-
#'
277-
#' genCorGen(1000, nvars = 3, params1 = c(.3, .5, .7), dist = "binary", rho = .3, corstr = "cs")
278-
#' genCorGen(1000,
279-
#' nvars = 3, params1 = l, params2 = c(1, 1, 1), dist = "gamma", rho = .3,
280-
#' corstr = "cs", wide = TRUE
281-
#' )
282-
#'
283-
#' genCorGen(1000,
284-
#' nvars = 3, params1 = c(.3, .5, .7), dist = "binary",
285-
#' corMatrix = genCorMat(3), method = "ep"
286-
#' )
287-
#' genCorGen(1000,
288-
#' nvars = 3, params1 = c(.3, .5, .7), dist = "binary",
289-
#' corMatrix = genCorMat(3), method = "copula"
290-
#' )
291276
#' @export
292277
#' @concept correlated
293278
genCorGen <- function(n, nvars, params1, params2 = NULL, dist, rho, corstr,
@@ -359,6 +344,10 @@ genCorGen <- function(n, nvars, params1, params2 = NULL, dist, rho, corstr,
359344
if (dist != "binary" & method == "ep") {
360345
stop("Method `ep` applies only to binary data generation")
361346
}
347+
348+
if (!is.null(corMatrix)) {
349+
assertClass(corMatrix = corMatrix, class = "matrix")
350+
}
362351

363352
####
364353

@@ -404,7 +393,7 @@ genCorGen <- function(n, nvars, params1, params2 = NULL, dist, rho, corstr,
404393

405394
if (!is.null(cnames)) setnames(dFinal, "X", cnames)
406395
} else {
407-
dFinal <- dcast(dtM, id ~ seq, value.var = "X")
396+
dFinal <- data.table::dcast(dtM, id ~ seq, value.var = "X")
408397
if (!is.null(cnames)) {
409398
nnames <- trimws(unlist(strsplit(cnames, split = ",")))
410399
setnames(dFinal, paste0("V", 1:nvars), nnames)
@@ -416,66 +405,6 @@ genCorGen <- function(n, nvars, params1, params2 = NULL, dist, rho, corstr,
416405
return(dFinal[])
417406
}
418407

419-
420-
# TODO Implement Emrich and Piedmonte algorithm for correlated binary data?
421-
#' Internal functions called by genCorGen and addCorGen - returns matrix
422-
#'
423-
#' @param nvars Number of new variables to generate
424-
#' @param corMatrix Correlation matrix
425-
#' @param rho Correlation coefficient
426-
#' @param corstr Correlation structure
427-
#' @return A correlation matrix
428-
#' @noRd
429-
.checkBoundsBin <- function(p1, p2, d) {
430-
l <- (p1 * p2) / ((1 - p1) * (1 - p2))
431-
L <- max(-sqrt(l), -sqrt(1 / l))
432-
433-
u <- (p1 * (1 - p2)) / (p2 * (1 - p1))
434-
U <- min(sqrt(u), sqrt(1 / u))
435-
436-
if ((d < L & isTRUE(all.equal(d, L)) == FALSE) |
437-
(d > U & isTRUE(all.equal(d, U)) == FALSE)) {
438-
LU <- paste0("(", round(L, 2), " ... ", round(U, 2), ")")
439-
stopText <- paste("Specified correlation", d, "out of range", LU)
440-
stop(stopText)
441-
}
442-
}
443-
444-
445-
#'
446-
.findRhoBin <- function(p1, p2, d) {
447-
.checkBoundsBin(p1, p2, d)
448-
449-
target <- d * sqrt(p1 * p2 * (1 - p1) * (1 - p2)) + p1 * p2
450-
451-
# given p1, p2 & d, bisection search for corresponding rho
452-
453-
Max <- 1
454-
Min <- -1
455-
test <- 0
456-
found <- FALSE
457-
458-
while (!found) {
459-
corr <- diag(2)
460-
corr[1, 2] <- corr[2, 1] <- test
461-
462-
est <- mvtnorm::pmvnorm(lower = rep(-Inf, 2), upper = c(stats::qnorm(p1), stats::qnorm(p2)), mean = c(0, 0), corr = corr)
463-
464-
if (round(est, 5) == round(target, 5)) {
465-
found <- TRUE
466-
rho <- test
467-
} else if (est < target) {
468-
Min <- test
469-
test <- (Min + Max) / 2
470-
} else {
471-
Max <- test
472-
test <- (Min + Max) / 2
473-
}
474-
}
475-
476-
return(rho)
477-
}
478-
479408
#'
480409
.genBinEP <- function(n, p, tcorr) {
481410

@@ -486,16 +415,9 @@ genCorGen <- function(n, nvars, params1, params2 = NULL, dist, rho, corstr,
486415

487416
np <- length(p)
488417
phicorr <- diag(length(p))
489-
490-
for (i in (1:(np - 1))) {
491-
for (j in ((i + 1):np)) {
492-
p1 <- p[i]
493-
p2 <- p[j]
494-
495-
phicorr[j, i] <- phicorr[i, j] <- .findRhoBin(p1, p2, tcorr[i, j])
496-
}
497-
}
498-
418+
419+
phicorr <- getRhoMat(np, p, tcorr)
420+
499421
# check that phicorr is positive definite (PD), if not adjust to nearest PD matrix
500422
if (!all(eigen(phicorr)$values > 0)) {
501423
phicorr <- Matrix::nearPD(phicorr)$mat
@@ -632,6 +554,8 @@ genBlockMat <- function(rho, nInds, nPeriods, corstr = "ind",
632554
assertAtLeast(nPeriods = nPeriods, minVal = 2)
633555
assertInRange(rho = rho, range = c(-1,1))
634556

557+
assertOption(corstr = corstr, options = c("ind", "cs", "ar1"))
558+
635559
if (!is.null(iRho)) {
636560
assertInRange(iRho = iRho, range = c(-1,1))
637561
if (length(rho) == 1) {
@@ -647,7 +571,6 @@ genBlockMat <- function(rho, nInds, nPeriods, corstr = "ind",
647571
}
648572
}
649573

650-
assertOption(corstr = corstr, options = c("ind", "cs", "ar1"))
651574

652575
###
653576

‎R/utility.R

+4-3
Original file line numberDiff line numberDiff line change
@@ -652,7 +652,7 @@ viewBasis <- function(knots, degree) {
652652
)
653653

654654
ggplot2::ggplot(data = dtmelt, ggplot2::aes(x = x, y = value, group = basis)) +
655-
ggplot2::geom_line(ggplot2::aes(color = basis), size = 1) +
655+
ggplot2::geom_line(ggplot2::aes(color = basis), linewidth = 1) +
656656
ggplot2::theme(
657657
legend.position = "none",
658658
panel.grid.minor = ggplot2::element_blank()
@@ -727,7 +727,8 @@ viewSplines <- function(knots, degree, theta) {
727727
dx[, Spline := factor(index)]
728728

729729
p <- ggplot2::ggplot(data = dx) +
730-
ggplot2::geom_line(ggplot2::aes(x = x, y = y.spline, color = Spline), size = 1) +
730+
ggplot2::geom_line(ggplot2::aes(x = x, y = y.spline, color = Spline),
731+
linewidth = 1) +
731732
ggplot2::scale_y_continuous(limits = c(0, 1)) +
732733
ggplot2::scale_x_continuous(limits = c(0, 1), breaks = knots) +
733734
ggplot2::theme(panel.grid.minor = ggplot2::element_blank()) +
@@ -841,7 +842,7 @@ survParamPlot <- function(formula, shape, points = NULL, n = 100, scale = 1) {
841842
)
842843

843844
p <- ggplot2::ggplot(data = dd, ggplot2::aes(x = T, y = p)) +
844-
ggplot2::geom_line(size = 0.8) +
845+
ggplot2::geom_line(linewidth = 0.8) +
845846
ggplot2::scale_y_continuous(limits = c(0,1), name = "probability of survival") +
846847
ggplot2::scale_x_continuous(name = "time") +
847848
ggplot2::theme(panel.grid = ggplot2::element_blank(),

‎man/addCorGen.Rd

+15-106
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

‎man/genCorGen.Rd

+9-24
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

‎src/RcppExports.cpp

+47-6
Original file line numberDiff line numberDiff line change
@@ -11,18 +11,18 @@ Rcpp::Rostream<false>& Rcpp::Rcerr = Rcpp::Rcpp_cerr_get();
1111
#endif
1212

1313
// matMultinom
14-
Rcpp::IntegerVector matMultinom(Rcpp::NumericMatrix probmatrix);
14+
IntegerVector matMultinom(NumericMatrix probmatrix);
1515
RcppExport SEXP _simstudy_matMultinom(SEXP probmatrixSEXP) {
1616
BEGIN_RCPP
1717
Rcpp::RObject rcpp_result_gen;
1818
Rcpp::RNGScope rcpp_rngScope_gen;
19-
Rcpp::traits::input_parameter< Rcpp::NumericMatrix >::type probmatrix(probmatrixSEXP);
19+
Rcpp::traits::input_parameter< NumericMatrix >::type probmatrix(probmatrixSEXP);
2020
rcpp_result_gen = Rcpp::wrap(matMultinom(probmatrix));
2121
return rcpp_result_gen;
2222
END_RCPP
2323
}
2424
// markovChains
25-
Rcpp::IntegerMatrix markovChains(int nchains, NumericMatrix P, int chainLen, IntegerVector state0);
25+
IntegerMatrix markovChains(int nchains, NumericMatrix P, int chainLen, IntegerVector state0);
2626
RcppExport SEXP _simstudy_markovChains(SEXP nchainsSEXP, SEXP PSEXP, SEXP chainLenSEXP, SEXP state0SEXP) {
2727
BEGIN_RCPP
2828
Rcpp::RObject rcpp_result_gen;
@@ -36,7 +36,7 @@ BEGIN_RCPP
3636
END_RCPP
3737
}
3838
// clipVec
39-
Rcpp::IntegerVector clipVec(IntegerVector id, IntegerVector seq, IntegerVector event);
39+
IntegerVector clipVec(IntegerVector id, IntegerVector seq, IntegerVector event);
4040
RcppExport SEXP _simstudy_clipVec(SEXP idSEXP, SEXP seqSEXP, SEXP eventSEXP) {
4141
BEGIN_RCPP
4242
Rcpp::RObject rcpp_result_gen;
@@ -49,22 +49,63 @@ BEGIN_RCPP
4949
END_RCPP
5050
}
5151
// chkNonIncreasing
52-
bool chkNonIncreasing(Rcpp::NumericMatrix adjmatrix);
52+
bool chkNonIncreasing(NumericMatrix adjmatrix);
5353
RcppExport SEXP _simstudy_chkNonIncreasing(SEXP adjmatrixSEXP) {
5454
BEGIN_RCPP
5555
Rcpp::RObject rcpp_result_gen;
5656
Rcpp::RNGScope rcpp_rngScope_gen;
57-
Rcpp::traits::input_parameter< Rcpp::NumericMatrix >::type adjmatrix(adjmatrixSEXP);
57+
Rcpp::traits::input_parameter< NumericMatrix >::type adjmatrix(adjmatrixSEXP);
5858
rcpp_result_gen = Rcpp::wrap(chkNonIncreasing(adjmatrix));
5959
return rcpp_result_gen;
6060
END_RCPP
6161
}
62+
// checkBoundsBin
63+
void checkBoundsBin(double p1, double p2, double d);
64+
RcppExport SEXP _simstudy_checkBoundsBin(SEXP p1SEXP, SEXP p2SEXP, SEXP dSEXP) {
65+
BEGIN_RCPP
66+
Rcpp::RNGScope rcpp_rngScope_gen;
67+
Rcpp::traits::input_parameter< double >::type p1(p1SEXP);
68+
Rcpp::traits::input_parameter< double >::type p2(p2SEXP);
69+
Rcpp::traits::input_parameter< double >::type d(dSEXP);
70+
checkBoundsBin(p1, p2, d);
71+
return R_NilValue;
72+
END_RCPP
73+
}
74+
// findRhoBin
75+
double findRhoBin(double p1, double p2, double d);
76+
RcppExport SEXP _simstudy_findRhoBin(SEXP p1SEXP, SEXP p2SEXP, SEXP dSEXP) {
77+
BEGIN_RCPP
78+
Rcpp::RObject rcpp_result_gen;
79+
Rcpp::RNGScope rcpp_rngScope_gen;
80+
Rcpp::traits::input_parameter< double >::type p1(p1SEXP);
81+
Rcpp::traits::input_parameter< double >::type p2(p2SEXP);
82+
Rcpp::traits::input_parameter< double >::type d(dSEXP);
83+
rcpp_result_gen = Rcpp::wrap(findRhoBin(p1, p2, d));
84+
return rcpp_result_gen;
85+
END_RCPP
86+
}
87+
// getRhoMat
88+
NumericMatrix getRhoMat(int N, NumericVector P, NumericMatrix TCORR);
89+
RcppExport SEXP _simstudy_getRhoMat(SEXP NSEXP, SEXP PSEXP, SEXP TCORRSEXP) {
90+
BEGIN_RCPP
91+
Rcpp::RObject rcpp_result_gen;
92+
Rcpp::RNGScope rcpp_rngScope_gen;
93+
Rcpp::traits::input_parameter< int >::type N(NSEXP);
94+
Rcpp::traits::input_parameter< NumericVector >::type P(PSEXP);
95+
Rcpp::traits::input_parameter< NumericMatrix >::type TCORR(TCORRSEXP);
96+
rcpp_result_gen = Rcpp::wrap(getRhoMat(N, P, TCORR));
97+
return rcpp_result_gen;
98+
END_RCPP
99+
}
62100

63101
static const R_CallMethodDef CallEntries[] = {
64102
{"_simstudy_matMultinom", (DL_FUNC) &_simstudy_matMultinom, 1},
65103
{"_simstudy_markovChains", (DL_FUNC) &_simstudy_markovChains, 4},
66104
{"_simstudy_clipVec", (DL_FUNC) &_simstudy_clipVec, 3},
67105
{"_simstudy_chkNonIncreasing", (DL_FUNC) &_simstudy_chkNonIncreasing, 1},
106+
{"_simstudy_checkBoundsBin", (DL_FUNC) &_simstudy_checkBoundsBin, 3},
107+
{"_simstudy_findRhoBin", (DL_FUNC) &_simstudy_findRhoBin, 3},
108+
{"_simstudy_getRhoMat", (DL_FUNC) &_simstudy_getRhoMat, 3},
68109
{NULL, NULL, 0}
69110
};
70111

‎src/srcRcpp.cpp

+103-7
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,11 @@
11
#include <Rcpp.h>
2-
using namespace Rcpp;
32

3+
// [[Rcpp::depends(pbv)]]
4+
#include <pbv.h>
5+
6+
#include<string.h>
7+
using namespace std;
8+
using namespace Rcpp;
49

510
int vecMultinom(NumericVector probs) {
611

@@ -19,11 +24,11 @@ int vecMultinom(NumericVector probs) {
1924
}
2025

2126
// [[Rcpp::export]]
22-
Rcpp::IntegerVector matMultinom(Rcpp::NumericMatrix probmatrix) {
27+
IntegerVector matMultinom(NumericMatrix probmatrix) {
2328

2429
int rows = probmatrix.nrow();
2530

26-
Rcpp::IntegerVector ans(rows);
31+
IntegerVector ans(rows);
2732

2833
for(int i = 0; i < rows; ++i) {
2934
ans[i] = vecMultinom(probmatrix(i, _));
@@ -32,7 +37,7 @@ Rcpp::IntegerVector matMultinom(Rcpp::NumericMatrix probmatrix) {
3237
return(ans);
3338
}
3439

35-
Rcpp::IntegerVector singleMarkovChain(NumericMatrix P,
40+
IntegerVector singleMarkovChain(NumericMatrix P,
3641
int chainLen, int state0) {
3742

3843
IntegerVector states(chainLen);
@@ -46,7 +51,7 @@ Rcpp::IntegerVector singleMarkovChain(NumericMatrix P,
4651
}
4752

4853
// [[Rcpp::export]]
49-
Rcpp::IntegerMatrix markovChains(int nchains, NumericMatrix P,
54+
IntegerMatrix markovChains(int nchains, NumericMatrix P,
5055
int chainLen, IntegerVector state0) {
5156

5257
IntegerMatrix stateMat(nchains, chainLen);
@@ -60,7 +65,8 @@ Rcpp::IntegerMatrix markovChains(int nchains, NumericMatrix P,
6065
}
6166

6267
// [[Rcpp::export]]
63-
Rcpp::IntegerVector clipVec(IntegerVector id, IntegerVector seq, IntegerVector event) {
68+
IntegerVector clipVec(IntegerVector id, IntegerVector seq,
69+
IntegerVector event) {
6470

6571
int uid = unique(id).length();
6672
IntegerVector last(uid);
@@ -87,7 +93,7 @@ Rcpp::IntegerVector clipVec(IntegerVector id, IntegerVector seq, IntegerVector e
8793
}
8894

8995
// [[Rcpp::export]]
90-
bool chkNonIncreasing(Rcpp::NumericMatrix adjmatrix) {
96+
bool chkNonIncreasing(NumericMatrix adjmatrix) {
9197

9298
int nr = adjmatrix.nrow(), nc = adjmatrix.ncol();
9399
bool unsorted = FALSE;
@@ -109,4 +115,94 @@ bool chkNonIncreasing(Rcpp::NumericMatrix adjmatrix) {
109115
return(unsorted);
110116
}
111117

118+
// [[Rcpp::export]]
119+
void checkBoundsBin(double p1, double p2, double d) {
120+
121+
double l = (p1 * p2) / ((1 - p1) * (1 - p2));
122+
double L = std::max(-sqrt(l), -sqrt(1 / l));
123+
124+
double u = (p1 * (1 - p2)) / (p2 * (1 - p1));
125+
double U = std::min(sqrt(u), sqrt(1 / u));
126+
127+
string LU;
128+
string stopText;
129+
130+
if ((d < L) | (d > U)) {
131+
LU = "(" + to_string(L) + " ... " + to_string(U) + ")";
132+
stopText = "Specified correlation " + to_string(d) + " out of range " + LU;
133+
stop(stopText);
134+
}
135+
}
136+
137+
// [[Rcpp::export]]
138+
double findRhoBin(double p1, double p2, double d) {
139+
140+
checkBoundsBin(p1, p2, d);
141+
142+
double target;
143+
double Max = 1;
144+
double Min = -1;
145+
double test = 0;
146+
bool found = FALSE;
147+
NumericVector bounds(2);
148+
double est;
149+
double rho;
150+
NumericVector check(2);
151+
152+
target = d * sqrt(p1 * p2 * (1 - p1) * (1 - p2)) + p1 * p2;
153+
bounds(0) = R::qnorm(p1, 0, 1, TRUE, FALSE);
154+
bounds(1) = R::qnorm(p2, 0, 1, TRUE, FALSE);
155+
156+
// given p1, p2 & d, bisection search for corresponding rho
157+
158+
while (!found) {
159+
160+
est = pbv::pbv_rcpp_pbvnorm0(bounds(0), bounds(1), test);
161+
162+
check(0) = est;
163+
check(1) = target;
164+
check = round(check, 5);
165+
166+
if (check(0) == check(1)) {
167+
found = TRUE;
168+
rho = test;
169+
}
170+
else if (est < target) {
171+
Min = test;
172+
test = (Min + Max) / 2;
173+
}
174+
else {
175+
Max = test;
176+
test = (Min + Max) / 2;
177+
}
178+
}
179+
180+
return(rho);
181+
}
182+
183+
// [[Rcpp::export]]
184+
NumericMatrix getRhoMat(int N, NumericVector P, NumericMatrix TCORR) {
185+
186+
NumericMatrix PCORR(TCORR.nrow(), TCORR.ncol());
187+
double p1;
188+
double p2;
189+
double rho;
190+
191+
for (int i = 0; i < (N - 1); i++) {
192+
for (int j = (i+1); j < N; j++) {
193+
p1 = P[i];
194+
p2 = P[j];
195+
rho = findRhoBin(p1, p2, TCORR(i, j));
196+
PCORR(i, j) = rho;
197+
PCORR(j, i) = rho;
198+
}
199+
}
200+
201+
for (int i = 0; i < N; i++) {
202+
PCORR(i, i) = 1;
203+
}
204+
205+
return(PCORR);
206+
207+
}
112208

‎tests/testthat/test-generate_correlated_data.R

+8-9
Original file line numberDiff line numberDiff line change
@@ -1,16 +1,15 @@
11
# .checkBoundsBin ----
22
test_that("Correlation boundaries for binary variables are correct", {
3-
x1 <- c(0, 0, 0, 1, 0)
4-
x2 <- c(1, 1, 1, 0, 0)
5-
6-
p1 <- mean(x1)
7-
p2 <- mean(x2)
3+
4+
p1 <- .5
5+
p2 <- .8
86

9-
expect_error(.checkBoundsBin(p1, p2, -1))
7+
expect_error(checkBoundsBin(p1, p2, d = .9))
8+
expect_error(checkBoundsBin(p1, p2, d = -.6))
109

11-
expect_silent(.checkBoundsBin(p1, p2, -0.6))
12-
expect_silent(.checkBoundsBin(p1, p2, 0.4))
13-
expect_silent(.checkBoundsBin(p1, p2, cor(x1, x2)))
10+
expect_silent(checkBoundsBin(p1, p2, -0.4))
11+
expect_silent(checkBoundsBin(p1, p2, 0.3))
12+
expect_silent(checkBoundsBin(p1, p2, 0.2))
1413
})
1514

1615
# .findRhoBin ----

0 commit comments

Comments
 (0)
Please sign in to comment.