Entering edit mode
Saket Choudhary
▴
130
@saket-choudhary-6350
Last seen 11.2 years ago
I am working on a Proteomics microarray data using only the Red
Channel, though there are both R and G channels. The objective is find
DE genes in Grade2 samples of cancer as compared to Controls.
I created a gist here :
Targets file:
Volcano Plot: http://share.pho.to/4e1QT
I am a bit skeptical about the nature of my volcano plot, showing
quite high log odds and skewed. Have I, in the process of playing
around with the code, committed a mistake somewhere?
Saket
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
| library(limma) | |
| Cy5 <- "F635 Median" | |
| Cy5b <- "B635 Mean" | |
| targets <- readTargets("Grade2_targets.csv") | |
| f <- factor(targets$Condition, levels = unique(targets$Condition)) | |
| design <- model.matrix(~0 + f) | |
| cont.matrix <- makeContrasts(Grade2vsControl=Grade2-Control, levels=design) | |
| colnames(design) <- levels(f) | |
| RG <- read.maimages( targets$FileName, | |
| source="genepix.custom", green.only=TRUE, | |
| columns=list(G=Cy5,Gb=Cy5b)) | |
| RG.bc=backgroundCorrect(RG, method="normexp", offset=15) | |
| controls <- grep("CONTROL", RG.bc$genes[,"ID"]) | |
| other.genes <- grep("empty|Empty|CONTROL", invert=TRUE, RG.bc$genes[,"ID"]) | |
| RG.nba <- normalizeBetweenArrays(RG.bc, method="quantile") | |
| RG.final <- RG.nba[other.genes, ] | |
| rownames(RG.final) <- RG.final$genes$ID | |
| RG.final <- RG.final[order(rownames(RG.final)), ] | |
| corfit <- duplicateCorrelation(RG.final, design, ndups=2, spacing=1) | |
| fit <- lmFit(RG.final, design, ndups=2, correlation=corfit$consensus) | |
| fit2 <- contrasts.fit(fit, cont.matrix) | |
| fit2 <- eBayes(fit2) | |
| #topTable(fit2, adjust="BH") | |
We can make this file beautiful and searchable if this error is corrected: No commas found in this CSV file in line 0.
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
| FileName Condition | |
| Control_H-02_2000153953.gpr Control | |
| Control_H-25_2000153952.gpr Control | |
| Control_H-35_2000153943.gpr Control | |
| Control_H-58_2000153935.gpr Control | |
| Control_HC-25_2000153932.gpr Control | |
| Grade II_CF 10729_2000154012.gpr Grade2 | |
| Grade II_CF 20468_2000153947.gpr Grade2 | |
| Grade II_CF 29538_2000154020.gpr Grade2 | |
| Grade II_CF 8551_2000153940.gpr Grade2 | |
| Grade II_CH 13717_2000144447.gpr Grade2 | |
| Grade II_CH 27095_2000154014.gpr Grade2 | |
| Grade II_CH 32225_2000154033.gpr Grade2 | |
| Grade II_CJ 16084_2000153931.gpr Grade2 | |
| Grade II_CJ 17734_2000154015.gpr Grade2 | |
| Grade II_CJ 33350_2000144452.gpr Grade2 | |
| Grade II_CJ 7132_2000154028.gpr Grade2 | |
| Grade II_CK 40_2000144445.gpr Grade2 |
