DESeq2 analysis without Replicate
1
0
Entering edit mode
@sushant-pawar-9287
Last seen 7.5 years ago
Nashik

Hi all ,

I am new to this field of Transcriptome analysis , so please help me in this.

         I just want to know that can we run DESeq2 for without replicate of treated and Untreated .If yes then what should the change in the syntax of DESeq2 .Below is the syntax i am using for with Replicate samples.

And if no , then what is the other tool should i use for this type of analysis.

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

library(DESeq2)
library(DESeq2)
directory<-"/home/dgl/projects/110_AmpliseqRNA/all_samples_with-replicates/Cervical-Liver"
sampleFiles <- grep("treated",list.files(directory),value=TRUE)
sampleCondition<-c("treated","treated","treated","untreated","untreated","untreated")
sampleTable<-data.frame(sampleName=sampleFiles, fileName=sampleFiles, condition=sampleCondition)
sampleTable
ddsHTSeq<-DESeqDataSetFromHTSeqCount(sampleTable=sampleTable, directory=directory, design=~condition)
colData(ddsHTSeq)$condition<-factor(colData(ddsHTSeq)$condition, levels=c("untreated","treated"))
dds<-DESeq(ddsHTSeq,fitType="mean")
res<-results(dds)
res<-res[order(res$padj),]
head(res)

mcols(res,use.names=TRUE)
write.csv(as.data.frame(res),file="Raw_File_deseq2.csv")

FileforIpathway=res[,c(2,6)]
write.csv(as.data.frame(FileforIpathway),file="File_for_iPathway_deseq2.csv")

pdf("DEseq2_MA_plot.pdf")
plotMA(dds,ylim=c(-10,10),main="DESeq2")
dev.off()

pdf("DESeq2_Dispersion_plot.pdf")
plotDispEsts(dds)
dev.off()

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

without Replicate deseq2 • 4.8k views
ADD COMMENT
0
Entering edit mode
@mikelove
Last seen 2 days ago
United States

There's no change to the syntax. You just run DESeq() and it detects there are no replicates. It should direct you to read a section of ?DESeq for more information.

ADD COMMENT
0
Entering edit mode

It should direct you to read a section of ?DESeq for more information. It redirected there. From there, I am not getting how to change conditions when object is created by DataSetfromHTSeqcount. Kindly guide me.

ADD REPLY
0
Entering edit mode

You can use a design of ~1 to build the object, then you can modify the variables as you like, then change the design to what you want with:

design(dds) <- ...

before running DESeq().

ADD REPLY
0
Entering edit mode

ddsHTSeq <- DESeqDataSetFromHTSeqCount(sampleTable = sampleTable, directory = directory2, design =~ condition) Warning message: In DESeqDataSet(se, design = design, ignoreRank) : some variables in design formula are characters, converting to factors

ddsHTSeq class: DESeqDataSet dim: 47051 100 metadata(1): version assays(1): counts rownames(47051): A1BG A1BG-AS1 ... ZZZ3 bA395L14.12 rowData names(0): colnames(100): C1.bam.count C10.bam.count ... N8.bam.count N9.bam.count colData names(1): condition

ddsHTSeq <- DESeq(ddsHTSeq) estimating size factors estimating dispersions Error in checkForExperimentalReplicates(object, modelMatrix) :

The design matrix has the same number of samples and coefficients to fit,

so estimation of dispersion is not possible. Treating samples as replicates was deprecated in v1.20 and no longer supported since v1.

Kindly make it clear to me....I did not get point design <-....

I am new for R and DeSeq2 as well.

ADD REPLY
0
Entering edit mode

Here Please tell me: What I have to write design(dds) <-......

ADD REPLY
0
Entering edit mode

dds <- DESeq(ddsHTSeq) estimating size factors estimating dispersions Error in checkForExperimentalReplicates(object, modelMatrix) :

The design matrix has the same number of samples and coefficients to fit, so estimation of dispersion is not possible. Treating samples as replicates was deprecated in v1.20 and no longer supported since v1.22.

ADD REPLY
0
Entering edit mode

Yes, it is true this is not supported in DESeq2.

ADD REPLY
0
Entering edit mode

Dear Please help me ..I have to submit the task till this week.

ADD REPLY
0
Entering edit mode

This is not an appropriate request for a Bioconductor developer. Sorry I won't have additional feedback here.

ADD REPLY
0
Entering edit mode

I did not get you as I asked for help . I need help to resolve my issue. If you will guide me, how can I correct my errors. Then it will be very helpful. Sorry if I said something wrong.

dsHTSeq <- DESeqDataSetFromHTSeqCount(sampleTable = sampleTable, directory = directory2, design =~ condition) Warning message: In DESeqDataSet(se, design = design, ignoreRank) : some variables in design formula are characters, converting to factors

ddsHTSeq class: DESeqDataSet dim: 47051 100 metadata(1): version assays(1): counts rownames(47051): A1BG A1BG-AS1 ... ZZZ3 bA395L14.12 rowData names(0): colnames(100): C1.bam.count C10.bam.count ... N8.bam.count N9.bam.count colData names(1): condition

ddsHTSeq <- DESeq(ddsHTSeq) estimating size factors estimating dispersions Error in checkForExperimentalReplicates(object, modelMatrix) :

The design matrix has the same number of samples and coefficients to fit,

so estimation of dispersion is not possible. Treating samples as replicates was deprecated in v1.20 and no longer supported since v1.

Kindly make it clear to me....I did not get point design <-....

I am new for R and DeSeq2 as well.

ADD REPLY

Login before adding your answer.

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