Is it necessary to standardize Combat in R?
1
0
Entering edit mode
takemoto • 0
@7076e2a6
Last seen 22 months ago
Japan

I am trying to use the ComBat() function of the R package sva for batch effect correction of RNA microarrays. In the data, each column represents each sample, and each row represents each gene.

My question is, do I need to standardize or centralize before ComBat? I know the results will be different for patterns 1-3, but which is the correct analysis? Or tell me which method you are using? Thank you.

library(sva)
# read normalized data
nor_data <- read.csv("RNA_input.csv", header=T)
# for mod
group_mod <- data.frame(group=group_label)
mod <- model.matrix(~ as.factor(group), data = group_mod)

pattern 1

Without standardization

dat_for_ComBat <- nor_dat
ComBat_data <- ComBat(dat=dat_for_ComBat, batch=as.factor(batch_label), mod=mod, par.prior = TRUE, prior.plots = FALSE)

pattern 2

With standardization

dat_for_ComBat <- scale(nor_dat, center = TRUE, scale = TRUE)
ComBat_data <- ComBat(dat=dat_for_ComBat, batch=as.factor(batch_label), mod=mod, par.prior = TRUE, prior.plots = FALSE)

pattern 3

With centralization

dat_for_ComBat <- scale(nor_dat, center = TRUE, scale = FALSE)
ComBat_data <- ComBat(dat=dat_for_ComBat, batch=as.factor(batch_label), mod=mod, par.prior = TRUE, prior.plots = FALSE)
RNA Combat sva R • 1.6k views
ADD COMMENT
1
Entering edit mode
@james-w-macdonald-5106
Last seen 1 hour ago
United States

If you already have normalized data, then there is no reason to do something else like centering or scaling the data.

ADD COMMENT
0
Entering edit mode

Thank you very much!

ADD REPLY

Login before adding your answer.

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