rlog() is not working ?
1
0
Entering edit mode
shn_yns • 0
@shn_yns-21933
Last seen 4.4 years ago

I have a dataset which contain 18 variables in 6 different condition with three replicates. the codes as below.

readcounts <- read.table("../u_counts.txt", header = TRUE)
row.names(readcounts) <- readcounts$Geneid
readcounts <- readcounts[,-c(1:6)]

names(readcounts) <- c("100_1","100_2","100_3",
                        "200_1","200_2","200_3",
                        "300_1","300_2","300_3",
                        "400_1","400_2","400_3",
                        "500_1","500_2","500_3",
                        "600_1","600_2","600_3")

growscale <- c(rep(c("100","200","300","400","500","600"), each=3))
sample_info <- data.frame(condition=growscale, row.names=names(readcounts))
DESeq.ds <- DESeqDataSetFromMatrix (countData = readcounts,
                                                colData = sample_info,
                                                design = ~ condition )

DESeq.ds <- DESeq.ds[rowSums(counts(DESeq.ds)) > 0,] #eleminate counts that are less than zero

DESeq.ds <- estimateSizeFactors(DESeq.ds)
sizeFactors(DESeq.ds)

DESeq.rlog <- rlog(counts(DESeq.ds), blind = TRUE)

and i am getting a error as below;

Error in approx(cumsum(wts), x, xout = c(low, high), method = "constant",  : 
  zero non-NA points
In addition: Warning message:
In xy.coords(x, y, setLab = FALSE) : NAs introduced by coercion

Could anyone please help? Thanks in advance.

deseq2 • 687 views
ADD COMMENT
0
Entering edit mode
@mikelove
Last seen 44 minutes ago
United States

Can you use vst() instead? I haven’t seen this error but it probably means the rlog() model isn’t a good fit. Anyway I prefer vst() for transformation.

ADD COMMENT
0
Entering edit mode

Thank you very much for reply. I have tried vst() instead of rlog(). It worked well.

ADD REPLY

Login before adding your answer.

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