Adjustments + bugs fixing
[morpheus.git] / pkg / R / sampleIO.R
CommitLineData
cbd88fe5
BA
1#' Generate sample inputs-outputs
2#'
3#' Generate input matrix X of size nxd and binary output of size n, where Y is subdivided
4#' into K groups of proportions p. Inside one group, the probability law P(Y=1) is
5#' described by the corresponding column parameter in the matrix β + intercept b.
6#'
ab35f610
BA
7#' @name generateSampleIO
8#'
cbd88fe5 9#' @param n Number of individuals
0f5fbd13 10#' @param p Vector of K(-1) populations relative proportions (sum (<)= 1)
cbd88fe5
BA
11#' @param β Vectors of model parameters for each population, of size dxK
12#' @param b Vector of intercept values (use rep(0,K) for no intercept)
13#' @param link Link type; "logit" or "probit"
14#'
15#' @return A list with
16#' \itemize{
17#' \item{X: the input matrix (size nxd)}
18#' \item{Y: the output vector (size n)}
19#' \item{index: the population index (in 1:K) for each row in X}
20#' }
21#'
2b3a6af5
BA
22#' @examples
23#' # K = 3 so we give first two components of p: 0.3 and 0.3 (p[3] = 0.4)
24#' io <- generateSampleIO(1000, c(.3,.3),
25#' matrix(c(1,3,-1,1,2,1),ncol=3), c(.5,-1,0), "logit")
26#' io$index[1] #number of the group of X[1,] and Y[1] (in 1...K)
27#'
cbd88fe5 28#' @export
ab35f610 29generateSampleIO <- function(n, p, β, b, link)
cbd88fe5 30{
6dd5c2ac 31 # Check arguments
ab35f610 32 tryCatch({n <- as.integer(n)}, error=function(e) stop("Cannot convert n to integer"))
6dd5c2ac
BA
33 if (length(n) > 1)
34 warning("n is a vector but should be scalar: only first element used")
35 if (n <= 0)
36 stop("n: positive integer")
37 if (!is.matrix(β) || !is.numeric(β) || any(is.na(β)))
38 stop("β: real matrix, no NAs")
0f5fbd13
BA
39 K <- ncol(β)
40 if (!is.numeric(p) || length(p)<K-1 || any(is.na(p)) || any(p<0) || sum(p) > 1)
41 stop("p: positive vector of size >= K-1, no NA, sum(<)=1")
42 if (length(p) == K-1)
43 p <- c(p, 1-sum(p))
6dd5c2ac
BA
44 if (!is.numeric(b) || length(b)!=K || any(is.na(b)))
45 stop("b: real vector of size K, no NA")
cbd88fe5 46
0f5fbd13
BA
47 # Random generation of the size of each population in X~Y (unordered)
48 classes <- rmultinom(1, n, p)
cbd88fe5 49
0f5fbd13
BA
50 d <- nrow(β)
51 zero_mean <- rep(0,d)
52 id_sigma <- diag(rep(1,d))
53 X <- matrix(nrow=0, ncol=d)
54 Y <- c()
55 index <- c()
56 for (i in 1:K)
6dd5c2ac 57 {
0f5fbd13
BA
58 index <- c(index, rep(i, classes[i]))
59 newXblock <- MASS::mvrnorm(classes[i], zero_mean, id_sigma)
60 arg_link <- newXblock %*% β[,i] + b[i]
61 probas <-
6dd5c2ac
BA
62 if (link == "logit")
63 {
64 e_arg_link = exp(arg_link)
65 e_arg_link / (1 + e_arg_link)
66 }
67 else #"probit"
68 pnorm(arg_link)
69 probas[is.nan(probas)] = 1 #overflow of exp(x)
0f5fbd13
BA
70 X <- rbind(X, newXblock)
71 Y <- c( Y, vapply(probas, function(p) (rbinom(1,1,p)), 1) )
6dd5c2ac 72 }
0f5fbd13
BA
73 shuffle <- sample(n)
74 list("X"=X[shuffle,], "Y"=Y[shuffle], "index"=index[shuffle])
cbd88fe5 75}