limma comparison for small sample size and how to get covariance matrix
1
0
Entering edit mode
jiachengd • 0
@3cb053af
Last seen 3 hours ago
United States

Hi,

Thanks for your attention.

I am trying to use voomLmFit to compare 3 phenotypes to the same control while also blocking for subject_ID that are repeatedly measured in batch 1 and batch2.

Experimental design

# print meta data
> pb.colData
         condition subject_ID_unique subject_ID batch
01501_b2       0_1          01501_b2      01501    b2
04901_b2       0_0          04901_b2      04901    b2
21201_b2       1_1          21201_b2      21201    b2
31101_b1       1_0          31101_b1      31101    b1
31101_b2       1_0          31101_b2      31101    b2
44501_b1       0_0          44501_b1      44501    b2
45401_b2       0_0          45401_b2      45401    b2
51301_b1       0_0          51301_b1      51301    b1
51801_b1       1_1          51801_b1      51801    b1
51801_b2       1_1          51801_b2      51801    b2
51901_b1       0_1          51901_b1      51901    b1
51901_b2       0_1          51901_b2      51901    b2
52001_b2       0_0          52001_b2      52001    b2
53201_b1       0_1          53201_b1      53201    b1
53201_b2       0_1          53201_b2      53201    b2
57001_b2       0_0          57001_b2      57001    b2
61101_b1       0_0          61101_b1      61101    b1
62001_b1       1_0          62001_b1      62001    b1
65301_b2       0_0          65301_b2      65301    b2
71301_b2       0_0          71301_b2      71301    b2
71501_b2       0_0          71501_b2      71501    b2
73801_b2       0_0          73801_b2      73801    b2
77601_b1       1_0          77601_b1      77601    b1
77601_b2       1_0          77601_b2      77601    b2
81001_b2       0_0          81001_b2      81001    b2
87501_b1       1_1          87501_b1      87501    b1
87501_b2       1_1          87501_b2      87501    b2
89201_b1       0_0          89201_b1      89201    b2
A9501_b2       0_0          A9501_b2      A9501    b2

The above table is my meta data where condition has four unique elements, with 0_0 being control and others being diseases. subject_ID is the identifier for every sample. batch is a factor I wish to regress out. subject_ID_unique is subject_ID plus batch to make a unique identifier.

Design matrix and code for running comparison

# condition & batch are factors with set levels
group <- pb.colData$condition
subject_ID <- pb.colData$subject_ID
batch <- pb.colData$batch

design <- model.matrix(~0+group+batch)

# dpb is a DGEList
v <- voomLmFit(counts = dpb, 
                 design = design, 
                 block = subject_ID,
                 sample.weights = TRUE)

# example contrast
contrast <- makeContrasts(group1_1 - group0_0, levels=colnames(design))

fit <- contrasts.fit(v, contrasts = contrast)  
fit <- eBayes(fit)

If the above code makes sense to you (please correct, if not), by comparing 1_1 with 0_0, there were over 900 differentially expressed genes. However, it concerned me because I only have 3 unique samples in 1_1 group and the signals seem driven by outliers.

# print n unique samples per condition
>   print(pb.colData %>% 
+           distinct(subject_ID, .keep_all = TRUE) %>% select(condition) %>% table())
condition
0_0 0_1 1_0 1_1 
 14   3   3   3

Here is the PCA for all samples where you can see the major variance is driven by outliers. PCA plot

Question 1

How can I get a relatively robust result given the small sample size and outliers? I noticed eBayes has a robust argument. Can I use it? Is there any other methods worth trying?

========================

I am also trying to get the covariance matrix (diagonal and off diagonal) for using as an input for mashr. I read from the limma tutorial section 13.2:

The covariance matrix of the estimated Bhat is Sigma^2 CT (XT Vg X) -1C

Sorry about the format. The formula is on page 62

https://www.bioconductor.org/packages/devel/bioc/vignettes/limma/inst/doc/usersguide.pdf

Question 2

I understand X and C are design matrix and contrast matrix, but what is Vg? How to derive Vg?

Thank you very much for your time and help.

Jiacheng Ding

covariancematrix limma • 857 views
ADD COMMENT
0
Entering edit mode
@gordon-smyth
Last seen 13 hours ago
WEHI, Melbourne, Australia

limma has already downweighted the outlier samples, which is the purpose of sample.weights=TRUE in the voomLmFit() call. So limma has already conducted a robust analysis.

You can use robust=TRUE in the eBayes() call as well if you like. That may give an extra layer of protection, but it protects against outlier genes rather than outlier samples.

You don't explain how you constructed the PCA plot (it's not a limma plot) but it presumably doesn't take account of the limma precision weights or the batch correction.

The formula for Vg in this case is somewhat complicated because it involves both the blocking effect and the precision weights. It is equal to a block correlation matrix multiplied by diagonal matrices of 1/sqrt(weights).

Added later:

You could compute Vg like this (where g is in the row number of a particular gene):

subject_ID <- factor(subject_ID)
design.subject <- model.matrix(~0+subject_ID)
CorMatrix <- v$correlation * design.subject %*% t(design.subject)
diag(CorMatrix) <- 1
iswg <- 1/sqrt(v$weights[g,])
Vg <- diag(iswg) %*% CorMatrix %*% diag(iswg)

Note that outputing Vg is not part of the documented user interface of limma, so I offer this code as is. It should work fine, but it's not very efficient and I have not had time to check it.

ADD COMMENT
0
Entering edit mode

Thank you very much for your rapid response. Your answer makes a lot sense to me. I check the dimension reduction plot again using limma::plotMDS with the following code:

v <- voomLmFit(counts = dpb, 
                 design = design, 
                 block = subject_ID,
                 sample.weights = TRUE)

 v.test <- voom(dpb, design, block = subject_ID, correlation = v$correlation)

 limma::plotMDS(v.test, top = 1000, col=case_when(group == '1_1' ~ 'red',
                                                   group == '0_1' ~ 'orange',
                                                   group == '1_0' ~ 'cyan',
                                                   TRUE ~ 'green'))

plotMDS

It's indeed different from the original PCA plot I provided.

==========

Thanks for your explanation on Vg, however I still don't understand how to get the block correlation. Could you please provide more details on instructing me to calculate it? Thank you very much for your time!

Jiacheng Ding

ADD REPLY
0
Entering edit mode

I have edited my answer above to add code for Vg.

ADD REPLY
0
Entering edit mode

Thank you very very much for your time, professor!

Jiacheng

ADD REPLY
0
Entering edit mode

Thanks a lot for your answer again!

I am trying to validate the solution you provided by comparing the sqrt(diag(CT (XT Vg X) -1 C)) with fit$stdev.unscaled. Based on limma tutorial, they are supposed to be equal.

https://www.bioconductor.org/packages/devel/bioc/vignettes/limma/inst/doc/usersguide.pdf page 62

R Code for calculating first gene's stdev.unscaled


design <- model.matrix(~0+group+batch)
v <- voomLmFit(counts = dpb, 
                 design = design, 
                 block = subject_ID,
                 sample.weights = TRUE)

# this part is inconsistent with your answer, because there is no v$weights
v.test <- voom(dpb, design, block = subject_ID, correlation = v$correlation)

subject_ID <- factor(subject_ID)
design.subject <- model.matrix(~0+subject_ID)
CorMatrix <- v$correlation * design.subject %*% t(design.subject)
diag(CorMatrix) <- 1

# modified as v.test, instead of v
iswg <- 1/sqrt(v.test$weights[1,])
Vg <- diag(iswg) %*% CorMatrix %*% diag(iswg)

contMatrix <- makeContrasts(group1_1 - group0_0, levels=colnames(design))

designT <- t(design)
XtVgX <- designT %*% Vg %*% design
invXtVgX <- solve(XtVgX)

stdev.unscaled.calculated <- sqrt(diag(t(contMatrix) %*% invXtVgX %*% contMatrix))
>   stdev.unscaled.calculated
group1_1 - group0_0 
           0.423608 

fit <- contrasts.fit(v, contrasts = contMatrix)
fit <- eBayes(fit, trend=TRUE, robust=FALSE)

> fit$stdev.unscaled[1,]
[1] 0.3701154

My question

I think my way for getting 'weights' is wrong considering stdev.unscaled.calculated does not equal to fit$stdev.unscaled[1,]. I understand I can use fit$stdev.unscaled[1,] to back calculate weights with your solution, however, how to correctly get the weights for v?

Thank you very much!

Jiacheng Ding

ADD REPLY

Login before adding your answer.

Traffic: 456 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