Entering edit mode
amoaristotle
▴
10
@user-24704
Last seen 3.9 years ago
So I had succeeded in conducting my DESeq2 without any problem> However, I want to go further to show 30 most expressed genes so I used the following code:
Note: The count.data.set.object is the DESeqDataset
vsd <- vst(count.data.set.object)
vsd <- varianceStabilizingTransformation(count.data.set.object)
norm.data = assay(vsd)
#for the heat map for the most expressed genes
library("pheatmap")
select <- order(rowMeans(counts(count.data.set.object,normalized=TRUE)),
decreasing=TRUE)[1:100]
df <- as.data.frame(colData(count.data.set.object)[,c("condition")])
pheatmap(assay(vsd)[select,], cluster_rows=FALSE, show_rownames=FALSE,
cluster_cols=FALSE, annotation_col=df)
After running the last code it the said:
Error in check.length("fill") :
'gpar' element 'fill' must not be length 0.
How can I resolve this?