fastqc <seq1.fastq seq2.fastq ... seqN.fastq>
multiqc </path/to/*_fastqc.zip>
STAR --runThreadN <NumberOfThreads> \
--runMode genomeGenerate \
--genomeDir </path/to/STARgenomeDir> \
--genomeFastaFiles </path/to/genome/fasta> \
--sjdbGTFfile </path/to/annotations.gtf> \
--sjdbOverhang <ReadLength-1> \
--genomeSAindexNbases <indexNbases>
STAR --twopassMode Basic \
--runThreadN <NumberOfThreads> \
--outSAMtype BAM Unsorted \
--outFilterMultimapNmax 1 \
--chimSegmentMin 20 \
--quantMode TranscriptomeSAM \
--genomeDir </path/to/genomeDir> \
--sjdbGTFfile </path/to/reads> \
--outFileNamePrefix </path/to/output/dir/prefix> \
--readFilesIn </path/to/fastq_file> \
--readFilesCommand <uncompressedMethod>
rsem-prepare-reference -p <NumberOfThreads> \
--gtf </path/to/annotations.gtf> \
</path/to/genome/fasta> \
</path/to/RSEMgenomeDir>
rsem-calculate-expression -p <NumberOfThreads> \
--quiet \
--bam \
--no-bam-output \
[--paired-end] \
</path/to/Aligned.toTranscriptome.out.bam> \
</path/to/RSEMindexDir> \
<output_prefix>
#R code
library(edgeR)
all.data <- DGEList(counts = count.table, group = group)
all.data <- all.data[rowSums(cpm(all.data) > count_threshold) >= rep_threshold, , keep.lib.sizes=FALSE]
all.data <- calcNormFactors(all.data)
lcpm <- cpm(all.data, log=TRUE)
#R code
library(factoextra)
pca <- PCA(t(lcpm), graph = FALSE)
fviz_eig(pca, addlabels = TRUE)
get_pca_var(pca)
fviz_pca_ind(pca, geom = c("point"), habillage = group)
#R code
library(edgeR)
triplicate Examples
grp <- factor(c("ctrl", "ctrl", "ctrl", "test", "test", “test”), levels = c(ctrl, test), labels = c(ctrl, test))
design <- model.matrix(~grp)
colnames(design) <- levels(grp)
rownames(design) <- colnames(all.data)
all.data <- estimateDisp(all.data, design, robust=TRUE)
et <- exactTest(all.data)
is.de <- decideTestsDGE(et, p.value = 0.05, lfc = 1, adjust.method = “fdr”)
degsum <- summary(is.de)
degtable <- et$table
degtable$Pvalue <- p.adjust(method="fdr",p=et$table$PValue)
degtable$DGEtest <- is.de@.Data
GOItable <- lcpm[deglist,]
pheatmap(GOItable, cex=1, scale = "row", show_rownames = FALSE)
STAR --twopassMode Basic --outSAMtype BAM Unsorted --outFilterMultimapNmax 1 --chimSegmentMin 20 --quantMode TranscriptomeSAM --genomeDir path_to_ref_genome/star_index --sjdbGTFfile path_to_ref_genome/ref.gtf --outFileNamePrefix star_rsem/sample --readFilesIn sample_R1.fastq.gz sample_R2.fastq.gz --runThreadN 16 --readFilesCommand zcat
rsem-calculate-expression --quiet -p 8 --bam --no-bam-output --paired-end star_rsem/sampleAligned.toTranscriptome.out.bam path_to_ref_genome/rsem_index/ref sample
samtools sort -@ 8 -o sorted_bam/sample.bam star_rsem/sampleAligned.out.bam