This document is used to deliver the heatmap plot with interactive way.

library(gplots)
## 
## Attaching package: 'gplots'
## 
## The following object is masked from 'package:stats':
## 
##     lowess
library(d3heatmap)

Static heatmap plots. For the ABC_CP dataset.

rcolor = c("#0000FF","#FF0000","#0000FF","#FF0000","#0000FF","#FF0000");
set = as.matrix(ABC.Data[,c(3:8)]);
col_breaks=sort(c(seq(-3,-0.049,length=100),seq(-0.05,0.05,length=98),seq(0.051,3,length=100)))
heatmap.2(set, Colv=,
          col=bluered,       # use on color palette defined earlier 
          breaks=col_breaks,
          scale="none",
          density.info="histogram",trace="none",
          labRow=NA, 
          margins=c(12,7),
          ColSideColors=rcolor,
          main = "ABC_CP", cex.axis=1.0, cex.main=.6)    

For the BCAA data set.

set = as.matrix(BCAA.Data[,c(3:8)]);
heatmap.2(set, Colv=,
          col=bluered,       # use on color palette defined earlier 
          #breaks=col_breaks,
          scale="none",
          density.info="histogram",trace="none",
          labRow=BCAA.Data[,2], 
          margins=c(12,7),
          ColSideColors=rcolor,
          main = "BCAA", cex.axis=1.0, cex.main=.6)

For the FAO data set.

set = as.matrix(FAO.Data[,c(3:8)]);
heatmap.2(set, Colv=,
          col=bluered,       # use on color palette defined earlier 
          #breaks=col_breaks,
          scale="none",
          density.info="histogram",trace="none",
          labRow=FAO.Data[,2], 
          margins=c(12,7),
          ColSideColors=rcolor,
          main = "FAO", cex.axis=1.0, cex.main=.6)

For the OXPHOS dataset.

set = as.matrix(OXPHOS.Data[,c(3:8)]);
heatmap.2(set, Colv=,
          col=bluered,       # use on color palette defined earlier 
          #breaks=col_breaks,
          scale="none",
          density.info="histogram",trace="none",
          labRow=OXPHOS.Data[,2], 
          margins=c(12,7),
          ColSideColors=rcolor,
          main = "OXPHOS", cex.axis=0.5, cex.main=.1)

Interactive heatmap plots

BCAA Dataset

set = as.matrix(BCAA.Data[,c(3:8)]);
d3heatmap(set, scale = "none", color="Blues",labRow=BCAA.Data[,2])

FAO Dataset

set = as.matrix(FAO.Data[,c(3:8)]);
d3heatmap(set, scale = "none", color="Blues",labRow=FAO.Data[,2])

OXPHOS Dataset

set = as.matrix(OXPHOS.Data[,c(3:8)]);
d3heatmap(set, scale = "none", color="Blues",labRow=OXPHOS.Data[,2])