edgeR and Normalization of RNAseq data using ERCC controls
2
0
Entering edit mode
John ▴ 10
@john-7115
Last seen 5.6 years ago
United Kingdom

Dear List,

I have read a useful segment from a BioStar post on using DESeq with ERCC controls to normalize RNAseq counts. 

Contained on the page (https://www.biostars.org/p/81803/), is the statement;

"Read in the count data, subset the resulting matrix such that it includes only the spike-ins, create a DESeqDataSet from that and then just estimateSizeFactors() on the results. The size factors can then be placed in the appropriate slot on the DESeqDataSet for the full count matrix."

However, with edgeR, the process is possibly not as straightforward; DESeq has a sizeFactor slot in the CountDataSet object, whilst edgeR has lib.size and norm.factors slots in a DGEList object. lib size and size factor are different things. I can adjust the lib.size values based on weights calculated from estimateSizeFactors(). But is that valid to do (I make the assumption that norm.factors is produced by the TMM normalization step)? 

I understand EdgeR does a TMM normalization step, so if the library sizes are changed manually, will the TMM normalization still be right?

So code I was thinking of could look something like;

library(DESeq)

cds = newCountDataSet( Just_ERCC_Bclass, group )
cds = estimateSizeFactors( cds )

library(edgeR)
my <- DGEList(counts=Not_ERCC, group=group)
my$samples$lib.size<-my$samples$lib.size/sizeFactors( cds )
my <- calcNormFactors(my)
.... and so on as in the manual. 

What would be the right way to do this? 

Thank you. 

John.

 

 

 

 

 

 

 

 

edger ercc • 5.2k views
ADD COMMENT
5
Entering edit mode

Before you go down this path, you might consider what the SEQC/MAQC-III consortium has to say about using the ERCC controls for, like, anything. http://www.nature.com/nbt/journal/v32/n9/abs/nbt.2957.html

The short story is that they determined that the apparent amounts of the ERCC spike in samples varied widely, most likely due (IMO) to the fact that you have to aliquot microliter amounts of the spike-in solution, and most people use vacuum aspirating pipettes for this step, which is almost impossible to do accurately.

In other words, the manual for the ERCC spike in samples says you should aliquot 1 µl of a 1:10 dilution. So most people will do something laughably inaccurate like putting 1 µl of the concentrated solution into 9 µl RNAse free water, vortex, and then aliquot 1 µl out of that, using their trusty Rainin pipette, and you can see how that turns out by taking a look at the SEQC/MAQC-III paper I reference above.

ADD REPLY
2
Entering edit mode
@ryan-c-thompson-5618
Last seen 8 months ago
Scripps Research, La Jolla, CA

edgeR will not compute normalization factors unless you use the "calcNormFactors" function. If you have computed your own normalized library sizes, you can pass them as the "lib.size" argument to the "DGEList" constructor and then skip the "calcNormFactors" step and proceed as usual.

 

But keep in mind James MacDonald's comment above, and consider using TMM or some other method instead. At the very least, compare your spike-in-based normalization to a TMM-based one using MDS plots and the like.

ADD COMMENT
0
Entering edit mode

How to compute ERCC normalized library sizes for your own samples? Can edgeR do this? Thank you.

ADD REPLY
1
Entering edit mode

You are asking how to do something as a comment to a post that tells you exactly how you would do it! You compute your own normalized library sizes and pass them as the lib.size argument.
 

ADD REPLY
0
Entering edit mode
John ▴ 10
@john-7115
Last seen 5.6 years ago
United Kingdom

Dear James and Ryan,

That information is interesting and very helpful, thank you. 

John.

ADD COMMENT

Login before adding your answer.

Traffic: 986 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6