### R code from vignette source 'PROPER.Rnw' ################################################### ### code chunk number 1: style ################################################### BiocStyle::latex(use.unsrturl=FALSE) ################################################### ### code chunk number 2: PROPER.Rnw:123-126 (eval = FALSE) ################################################### ## library(PROPER) ## sim.opts.Cheung = RNAseq.SimOptions.2grp(ngenes = 20000, p.DE=0.05, ## lOD="cheung", lBaselineExpr="cheung") ################################################### ### code chunk number 3: PROPER.Rnw:130-132 (eval = FALSE) ################################################### ## sim.opts.Bottomly = RNAseq.SimOptions.2grp(ngenes = 20000, p.DE=0.05, ## lOD="bottomly", lBaselineExpr="bottomly") ################################################### ### code chunk number 4: PROPER.Rnw:182-184 (eval = FALSE) ################################################### ## simres = runSims(Nreps = c(3, 5, 7, 10), sim.opts=sim.opts.Cheung, ## DEmethod="edgeR", nsims=20) ################################################### ### code chunk number 5: PROPER.Rnw:217-219 (eval = FALSE) ################################################### ## powers = comparePower(simres, alpha.type="fdr", alpha.nominal=0.1, ## stratify.by="expr", delta=0.5) ################################################### ### code chunk number 6: PROPER.Rnw:227-228 (eval = FALSE) ################################################### ## summaryPower(powers) ################################################### ### code chunk number 7: PROPER.Rnw:252-253 (eval = FALSE) ################################################### ## plotPower(powers) ################################################### ### code chunk number 8: PROPER.Rnw:269-270 (eval = FALSE) ################################################### ## plotPowerTD(powers) ################################################### ### code chunk number 9: PROPER.Rnw:282-283 (eval = FALSE) ################################################### ## plotFDcost(powers) ################################################### ### code chunk number 10: PROPER.Rnw:293-294 (eval = FALSE) ################################################### ## plotAll(powers) ################################################### ### code chunk number 11: PROPER.Rnw:310-311 (eval = FALSE) ################################################### ## power.seqDepth(simres, powers) ################################################### ### code chunk number 12: PROPER.Rnw:342-345 (eval = FALSE) ################################################### ## powers = comparePower(simres, alpha.type="fdr", alpha.nominal=0.1, ## strata = c(0, 10, 2^(1:7)*10, Inf), filter.by="expr", ## strata.filtered=1, stratify.by="expr", delta=0.5) ################################################### ### code chunk number 13: PROPER.Rnw:376-378 (eval = FALSE) ################################################### ## powers = comparePower(simres, alpha.type="fdr", alpha.nominal=0.1, ## stratify.by="dispersion", target.by="effectsize", delta=1) ################################################### ### code chunk number 14: PROPER.Rnw:389-391 (eval = FALSE) ################################################### ## powers = comparePower(simres, alpha.type="pval", alpha.nominal=0.001, ## stratify.by="dispersion", target.by="effectsize", delta=1) ################################################### ### code chunk number 15: PROPER.Rnw:403-404 ################################################### sessionInfo()