Hi Im following RNAseq workflow for differential gene expression
Im using R command line.
library(gplots)
library(RColorBrewer)
sampleDists<- dist(t(assay(rld)))
sampleDistsMatrix<- as.matrix(sampleDists)
xnames<- paste(colData(ddsFull)$SampleName,colData(ddsFull)$Sex,colData(ddsFull)$treatment)
dimnames(sampleDistsMatrix)<- list(xnames,xnames)
colors<- colorRampPalette(rev(brewer.pal(9,"Blues")))(255)
heatmap.2(sampleDistsMatrix,trace="none",col=colors,margins=c(10,10))
But i got this error: Error in plot.new() : internal read error in PDF_endpage Error in par(op) : parameter "i" in "mfg" is out of range what is what Im doing wrong?