1. I am new to R and limma.
2. Experimental overview: Patient samples containing antibodies against many, many targets are incubated on high-density peptide arrays. The arrays are composed of approximately 330,000 11-mer sequences. I am trying to distinguish case from control based on differential binding. The two colors are different antibody classes, and I would like to handle them independently of each other. Final comparison would be control 635 vs case 635 and control 532 vs case 532.
3. Issue: I am not sure how to import only the red color so I imported green only and replaced those values with the red values in 'R635' (below). The 'normalizeBetweenArrays' resulted in an EList data class which is not accepted by the 'lmFit' function. Please see below for error message. I believe the normalization should result in a MAList object. Please let me know where I'm wrong.
Mycode starts below (I realize I could have imported my files once and duplicated)
library(limma)
targets = readTargets("targets.txt")
RG = read.maimages(targets,source='genepix')
#RG532 and 635 are EListRaw class
RG532 = read.maimages(targets, green.only=TRUE, source='genepix')
RG635 = read.maimages(targets, green.only=TRUE, source='genepix')
#replacing the green (E) with the Red (R) from the full RG
RG635$E = RG$R
#this resulted in EList class data
MAr=normalizeBetweenArrays(RG635,method="scale")
MAg=normalizeBetweenArrays(RG532,method="scale")
design=model.matrix(~0+factor(c(1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2)))
colnames(design) <-c("case","control")
#MAr at this stage is an EList
rfit=lmFit(MAr, design)
Error in lm.fit(design, t(M)) : NA/NaN/Inf in 'y'
#lm.fit Needs MAList class to work
sessionInfo()
R version 3.1.3 (2015-03-09)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows 7 x64 (build 7601) Service Pack 1
locale:
[1] LC_COLLATE=English_United States.1252
[2] LC_CTYPE=English_United States.1252
[3] LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C
[5] LC_TIME=English_United States.1252
attached base packages:
[1] stats graphics grDevices utils datasets methods
[7] base
other attached packages:
[1] limma_3.22.7
loaded via a namespace (and not attached):
[1] tools_3.1.3
