### R code from vignette source 'Codelink_Legacy.Rnw' ### Encoding: UTF-8 ################################################### ### code chunk number 1: Codelink_Legacy.Rnw:21-24 ################################################### library(codelink) library(knitr) opts_chunk$set(fig.align = 'center', concordance=TRUE) ################################################### ### code chunk number 2: input (eval = FALSE) ################################################### ## # NOT RUN # ## library(codelink) ## foo <- readCodelink() ## summaryFlag(foo) # will show a summary of flag values. ## # NOT RUN # ################################################### ### code chunk number 3: data ################################################### data(codelink.example) codelink.example ################################################### ### code chunk number 4: input-flag (eval = FALSE) ################################################### ## foo <- readCodelink(flag = list(M = 0.01) ) ################################################### ### code chunk number 5: bkgcorrect (eval = FALSE) ################################################### ## foo <- bkgdCorrect(foo, method = "half") ################################################### ### code chunk number 6: normalize (eval = FALSE) ################################################### ## foo <- normalize(foo, method = "quantiles") ################################################### ### code chunk number 7: plotMA ################################################### plotMA(codelink.example) ################################################### ### code chunk number 8: plotDensity ################################################### plotDensities(codelink.example) ################################################### ### code chunk number 9: image (eval = FALSE) ################################################### ## imageCodelink(foo) ## imageCodelink(foo, what = "snr") ################################################### ### code chunk number 10: merge (eval = FALSE) ################################################### ## foo <- mergeArray(foo, class = c(1, 1, 2, 2), names = c("A", "B")) ## plotCV(foo) ################################################### ### code chunk number 11: read-fix (eval = FALSE) ################################################### ## foo <- readCodelink(fix = TRUE) ################################################### ### code chunk number 12: read-codelinkSet (eval = FALSE) ################################################### ## foo <- readCodelinkSet()