Read Count Normalisation and validation of analysis
2
0
Entering edit mode
Dinesh • 0
@9f6da218
Last seen 9 weeks ago
India

Hello I am new to NGS analysis and please excuse if the query is too naive. I am working on small RNA seq (tRNA fragments specifically) data. I have 3 samples each for the CONTROL and the TEST and all of them have different read numbers. I have aligned them using STAR aligner and have obtained the aligned BAM files. I am processing the aligned BAM through SALMON to obtain the transcript count matrix in terms of TPM. Since, DESeq analysis works on gene count matrix, I am using tiximport to map my transcript to gene IDs. Later I did DGE analysis through DESeq as per the following codes:

txi <- tximport(files, type="salmon", txIn = TRUE, txOut = FALSE, tx2gene=tx2gene, ignoreTxVersion=TRUE)

sampletype <- factor(c(rep("CONTROL", 3), rep("TEST", 3))) meta <- data.frame(sampletype, row.names = colnames(txi$counts))

all(colnames(txi$counts) %in% rownames(meta)) all(colnames(txi$counts) == rownames(meta))

dds <- DESeqDataSetFromTximport(txi, colData = meta, design = ~ sampletype) dds <- DESeq(dds) sizeFactors(dds) <- estimateSizeFactorsForMatrix(txi$counts) results <- results(dds) significant_genes <- subset(results, padj < 0.05)

Having a very little idea about the normalisation. I wanted to ask if the end results obtained in the significant_genes is over normalized data or not ? Also, if someone can please verify my workflow (mentioned above), it will be a great help.

Thank you.

DifferentialExpression DESeq2 • 574 views
ADD COMMENT
1
Entering edit mode
ATpoint ★ 4.0k
@atpoint-13662
Last seen 17 hours ago
Germany

Please read the manual: https://bioconductor.org/packages/release/bioc/vignettes/DESeq2/inst/doc/DESeq2.html

It tells you what the DESeq() function does in detail.

ADD COMMENT
0
Entering edit mode

Thank you !!

ADD REPLY

Login before adding your answer.

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