EBarrays.Rcheck/tests_i386/test.Rout
R version 3.4.4 (2018-03-15) -- "Someone to Lean On"
Copyright (C) 2018 The R Foundation for Statistical Computing
Platform: i386-w64-mingw32/i386 (32-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> library(EBarrays)
Loading required package: Biobase
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
clusterExport, clusterMap, parApply, parCapply, parLapply,
parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
Filter, Find, Map, Position, Reduce, anyDuplicated, append,
as.data.frame, cbind, colMeans, colSums, colnames, do.call,
duplicated, eval, evalq, get, grep, grepl, intersect, is.unsorted,
lapply, lengths, mapply, match, mget, order, paste, pmax, pmax.int,
pmin, pmin.int, rank, rbind, rowMeans, rowSums, rownames, sapply,
setdiff, sort, table, tapply, union, unique, unsplit, which,
which.max, which.min
Welcome to Bioconductor
Vignettes contain introductory material; view with
'browseVignettes()'. To cite Bioconductor, see
'citation("Biobase")', and for packages 'citation("pkgname")'.
Loading required package: lattice
> demo(ebarrays)
demo(ebarrays)
---- ˜˜˜˜˜˜˜˜
> library(EBarrays)
> ## EM algorithm
> ## Lognormal-Normal Demo
>
> ## mu10,sigma2,tau are parameters in the LNNB model; pde is the
> ## proportion of differentially expressed genes; n is the
> ## total number of genes; nr1 and nr2 are the number of replicate
> ## arrays in each group.
>
> lnnb.sim <- function(mu10, sigmasq, tausq, pde, n, nr1, nr2)
+ {
+ de <- sample(c(TRUE, FALSE), size = n, replace = TRUE, prob = c(pde, 1 - pde))
+ x <- matrix(NA, n, nr1)
+ y <- matrix(NA, n, nr2)
+ mu1 <- rnorm(n, mu10, sqrt(tausq))
+ mu2.de <- rnorm(n, mu10, sqrt(tausq))
+ mu2 <- mu1
+ mu2[de] <- mu2.de[de]
+ for(j in 1:nr1) {
+ x[, j] <- rnorm(n, mu1, sqrt(sigmasq))
+ }
+ for(j in 1:nr2) {
+ y[, j] <- rnorm(n, mu2, sqrt(sigmasq))
+ }
+ outmat <- exp(cbind(x, y))
+ list(mu1 = mu1, mu2 = mu2, outmat = outmat, de = de)
+ }
> ## simulating data with
> ## mu_0 = 2.33, sigma^2 = 0.1, tau^2 = 2
> ## P(DE) = 0.2
>
> sim.data1 <- lnnb.sim(2.33, 0.1, 2, 0.2, 2000, nr1 = 3, nr2 = 3)
> de.true1 <- sim.data1$de ## true indicators of differential expression
> sim.data2 <- lnnb.sim(1.33, 0.01, 2, 0.2, 2000, nr1 = 3, nr2 = 3)
> de.true2 <- sim.data2$de ## true indicators of differential expression
> testdata <- rbind(sim.data1$outmat,sim.data2$outmat)
> hypotheses <- ebPatterns(c("1 1 1 1 1 1", "1 1 1 2 2 2"))
> em.out <- emfit(testdata, family = "LNN", hypotheses,
+ cluster = 1:5,
+ type = 2,
+ verbose = TRUE,
+ num.iter = 10)
Checking for negative entries...
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 0.46 seconds user time
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 1.08 seconds user time
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 1.52 seconds user time
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 2.13 seconds user time
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 2.92 seconds user time
> em.out
EB model fit
Family: LNN ( Lognormal-Normal )
Model parameter estimates:
mu_0 sigma.2 tao_0.2
Cluster 1 2.314221 0.09767206 2.051198
Cluster 2 1.368594 0.01004463 2.025296
Estimated mixing proportions:
Pattern.1 Pattern.2
Cluster 1 0.4003285 0.09656864
Cluster 2 0.3955725 0.10753031
> post.out <- postprob(em.out, testdata)
> table(post.out$pattern[, 2] > .5, c(de.true1,de.true2))
FALSE TRUE
FALSE 3150 148
TRUE 36 666
> table((post.out$cluster[, 2] > .5)+1, c(rep("Cluster 1",2000),rep("Cluster 2",2000)))
Cluster 1 Cluster 2
1 1857 49
2 143 1951
> plotMarginal(em.out,testdata)
> par(ask=TRUE)
> plotCluster(em.out,testdata)
> par(ask=FALSE)
> lnnmv.em.out <- emfit(testdata, family = "LNNMV", hypotheses, groupid=c(1,1,1,2,2,2),
+ verbose = TRUE,
+ num.iter = 10,
+ p.init = c(0.95, 0.05))
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 0.65 seconds user time
> lnnmv.em.out
EB model fit
Family: LNNMV ( Lognormal-Normal with modified variances )
Model parameter estimates:
mu_0 tao_0.2
1 1.844932 2.255239
Estimated mixing proportions:
Pattern.1 Pattern.2
p.temp 0.7796422 0.2203578
> post.out <- postprob(lnnmv.em.out, testdata, groupid=c(1,1,1,2,2,2))
> table(post.out$pattern[, 2] > .5, c(de.true1,de.true2))
FALSE TRUE
FALSE 3114 135
TRUE 72 679
There were 50 or more warnings (use warnings() to see the first 50)
>
>
>
> proc.time()
user system elapsed
10.65 0.10 10.75
|
EBarrays.Rcheck/tests_x64/test.Rout
R version 3.4.4 (2018-03-15) -- "Someone to Lean On"
Copyright (C) 2018 The R Foundation for Statistical Computing
Platform: x86_64-w64-mingw32/x64 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> library(EBarrays)
Loading required package: Biobase
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
clusterExport, clusterMap, parApply, parCapply, parLapply,
parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
Filter, Find, Map, Position, Reduce, anyDuplicated, append,
as.data.frame, cbind, colMeans, colSums, colnames, do.call,
duplicated, eval, evalq, get, grep, grepl, intersect, is.unsorted,
lapply, lengths, mapply, match, mget, order, paste, pmax, pmax.int,
pmin, pmin.int, rank, rbind, rowMeans, rowSums, rownames, sapply,
setdiff, sort, table, tapply, union, unique, unsplit, which,
which.max, which.min
Welcome to Bioconductor
Vignettes contain introductory material; view with
'browseVignettes()'. To cite Bioconductor, see
'citation("Biobase")', and for packages 'citation("pkgname")'.
Loading required package: lattice
> demo(ebarrays)
demo(ebarrays)
---- ˜˜˜˜˜˜˜˜
> library(EBarrays)
> ## EM algorithm
> ## Lognormal-Normal Demo
>
> ## mu10,sigma2,tau are parameters in the LNNB model; pde is the
> ## proportion of differentially expressed genes; n is the
> ## total number of genes; nr1 and nr2 are the number of replicate
> ## arrays in each group.
>
> lnnb.sim <- function(mu10, sigmasq, tausq, pde, n, nr1, nr2)
+ {
+ de <- sample(c(TRUE, FALSE), size = n, replace = TRUE, prob = c(pde, 1 - pde))
+ x <- matrix(NA, n, nr1)
+ y <- matrix(NA, n, nr2)
+ mu1 <- rnorm(n, mu10, sqrt(tausq))
+ mu2.de <- rnorm(n, mu10, sqrt(tausq))
+ mu2 <- mu1
+ mu2[de] <- mu2.de[de]
+ for(j in 1:nr1) {
+ x[, j] <- rnorm(n, mu1, sqrt(sigmasq))
+ }
+ for(j in 1:nr2) {
+ y[, j] <- rnorm(n, mu2, sqrt(sigmasq))
+ }
+ outmat <- exp(cbind(x, y))
+ list(mu1 = mu1, mu2 = mu2, outmat = outmat, de = de)
+ }
> ## simulating data with
> ## mu_0 = 2.33, sigma^2 = 0.1, tau^2 = 2
> ## P(DE) = 0.2
>
> sim.data1 <- lnnb.sim(2.33, 0.1, 2, 0.2, 2000, nr1 = 3, nr2 = 3)
> de.true1 <- sim.data1$de ## true indicators of differential expression
> sim.data2 <- lnnb.sim(1.33, 0.01, 2, 0.2, 2000, nr1 = 3, nr2 = 3)
> de.true2 <- sim.data2$de ## true indicators of differential expression
> testdata <- rbind(sim.data1$outmat,sim.data2$outmat)
> hypotheses <- ebPatterns(c("1 1 1 1 1 1", "1 1 1 2 2 2"))
> em.out <- emfit(testdata, family = "LNN", hypotheses,
+ cluster = 1:5,
+ type = 2,
+ verbose = TRUE,
+ num.iter = 10)
Checking for negative entries...
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 0.53 seconds user time
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 1.19 seconds user time
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 1.88 seconds user time
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 2.75 seconds user time
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 3.62 seconds user time
> em.out
EB model fit
Family: LNN ( Lognormal-Normal )
Model parameter estimates:
mu_0 sigma.2 tao_0.2
Cluster 1 1.359116 0.01017677 2.021918
Cluster 2 2.339414 0.09950804 2.023820
Estimated mixing proportions:
Pattern.1 Pattern.2
Cluster 1 0.3966964 0.10264602
Cluster 2 0.4057613 0.09489632
> post.out <- postprob(em.out, testdata)
> table(post.out$pattern[, 2] > .5, c(de.true1,de.true2))
FALSE TRUE
FALSE 3181 151
TRUE 26 642
> table((post.out$cluster[, 2] > .5)+1, c(rep("Cluster 1",2000),rep("Cluster 2",2000)))
Cluster 1 Cluster 2
1 141 1927
2 1859 73
> plotMarginal(em.out,testdata)
> par(ask=TRUE)
> plotCluster(em.out,testdata)
> par(ask=FALSE)
> lnnmv.em.out <- emfit(testdata, family = "LNNMV", hypotheses, groupid=c(1,1,1,2,2,2),
+ verbose = TRUE,
+ num.iter = 10,
+ p.init = c(0.95, 0.05))
Checking for negative entries...
Generating summary statistics for patterns.
This may take a few seconds...
Starting EM iterations (total 10 ).
This may take a while
Starting iteration 1 ...
Starting iteration 2 ...
Starting iteration 3 ...
Starting iteration 4 ...
Starting iteration 5 ...
Starting iteration 6 ...
Starting iteration 7 ...
Starting iteration 8 ...
Starting iteration 9 ...
Starting iteration 10 ...
Fit used 1.03 seconds user time
> lnnmv.em.out
EB model fit
Family: LNNMV ( Lognormal-Normal with modified variances )
Model parameter estimates:
mu_0 tao_0.2
1 1.853285 2.256451
Estimated mixing proportions:
Pattern.1 Pattern.2
p.temp 0.7884572 0.2115428
> post.out <- postprob(lnnmv.em.out, testdata, groupid=c(1,1,1,2,2,2))
> table(post.out$pattern[, 2] > .5, c(de.true1,de.true2))
FALSE TRUE
FALSE 3145 139
TRUE 62 654
There were 50 or more warnings (use warnings() to see the first 50)
>
>
>
> proc.time()
user system elapsed
13.10 0.06 13.15
|