Persisting error in making a heatmap
1
0
Entering edit mode
beslinail • 0
@d4a633b9
Last seen 14 months ago
Turkey

Enter the body of text here

Code should be placed in three backticks as shown below

library(gplots)

x <- genes
y <- data.matrix(genes)
y
heatmap.2(genes)


?heatmap.2
heatmap.2(y, main="Sample", trace= "none", margins= c(23,24))


yb <- colorRampPalette(c("yellow", "white", "blue"))
heatmap.2(y, color=yb, main="Sample", trace= "none", margins= c(23,24), cexRow = 0.5, Rowv = FALSE, Colv = FALSE, key)

# include your problematic code here with any corresponding output 
# please also include the results of running the following in an R session 

sessionInfo( )

Error in .External.graphics(C_layout, num.rows, num.cols, mat, as.integer(num.figures), : invalid graphics state In addition: Warning messages: 1: In heatmap.2(y, color = yb, main = "Sample", trace = "none", margins = c(23, : Discrepancy: Rowv is FALSE, while dendrogram is both'. Omitting row dendogram. 2: In heatmap.2(y, color = yb, main = "Sample", trace = "none", margins = c(23, : Discrepancy: Colv is FALSE, while dendrogram iscolumn'. Omitting column dendogram.

heatmap.2(y, main="Sample", trace= "none", margins= c(23,24))

heatmaps gplots • 1.4k views
ADD COMMENT
0
Entering edit mode

Error in .External.graphics(C_layout, num.rows, num.cols, mat, as.integer(num.figures), : invalid graphics state

ADD REPLY
0
Entering edit mode
@james-w-macdonald-5106
Last seen 1 day ago
United States

The heatmap.2 function is part of the gplots package, which is not part of Bioconductor. Since this is a support site for Bioconductor packages, the question is off-topic. You could try r-help@r-project.org or maybe stackoverflow.com, or simply try restarting R.

ADD COMMENT
0
Entering edit mode

Thanks alot for the kind feedback

ADD REPLY

Login before adding your answer.

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