### R code from vignette source 'vignettes/codelink/inst/doc/codelink.Rnw' ### Encoding: UTF-8 ################################################### ### code chunk number 1: input (eval = FALSE) ################################################### ## # NOT RUN # ## library(codelink) ## foo <- readCodelink() ## summaryFlag(foo) # will show a summary of flag values. ## # NOT RUN # ################################################### ### code chunk number 2: data ################################################### data(codelink.example) codelink.example ################################################### ### code chunk number 3: input-flag (eval = FALSE) ################################################### ## foo <- readCodelink(flag = list(M = 0.01) ) ################################################### ### code chunk number 4: bkgcorrect (eval = FALSE) ################################################### ## foo <- bkgdCorrect(foo, method = "half") ################################################### ### code chunk number 5: normalize (eval = FALSE) ################################################### ## foo <- normalize(foo, method = "quantiles") ################################################### ### code chunk number 6: plotMA ################################################### plotMA(codelink.example) ################################################### ### code chunk number 7: plotDensity ################################################### plotDensities(codelink.example) ################################################### ### code chunk number 8: image (eval = FALSE) ################################################### ## imageCodelink(foo) ## imageCodelink(foo, what = "snr") ################################################### ### code chunk number 9: createWeights ################################################### w <- createWeights(codelink.example, type = list(FIDUCIAL = 0.01, NEGATIVE = 0.1)) w[1:10,] ################################################### ### 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()