### R code from vignette source 'vignettes/beadarray/inst/doc/ImageProcessing.rnw'

###################################################
### code chunk number 1: options
###################################################
options(width = 70)


###################################################
### code chunk number 2: prelim
###################################################
library(beadarray)


###################################################
### code chunk number 3: readingTiff (eval = FALSE)
###################################################
## tiff <- readTIFF();
## data <- readBeadLevelTextFile();


###################################################
### code chunk number 4: standardProcessing (eval = FALSE)
###################################################
## bg <- illuminaBackground(tiff, data[,3:4]);
## tiffSharp <- illuminaSharpen(tiff);
## fg <- illuminaForeground(tiffSharp, data[,3:4]);
## finalIntensity <- fg - bg;


###################################################
### code chunk number 5: creatingObject (eval = FALSE)
###################################################
## BLData <- new(Class = "beadLevelData");
## BLData <- insertBeadData(BLData, array = 1, what = "Grn", data = finalIntensity)


###################################################
### code chunk number 6: usingReadIllumina (eval = FALSE)
###################################################
## BLData <- readIllumina();
## BLData <- insertBeadData(BLData, array = 1, what = "Grn", data = finalIntensity)
## BLData <- insertBeadData(BLData, array = 1, what = "GrnLog", data = log2(finalIntensity))


###################################################
### code chunk number 7: alternativeMethods (eval = FALSE)
###################################################
## bg <- medianBackground(tiff, data[,3:4]);


###################################################
### code chunk number 8: sessionInfo
###################################################
sessionInfo()