Heatmap correlation matrix

library(caret)
## Loading required package: lattice
## Loading required package: ggplot2
library(d3heatmap)

meteo_data=read.csv("~/Dropbox/ongoing-work/meteo/data/reg-caba-winter-s2-p12.csv")
correlated=cor(meteo_data[,2:ncol(meteo_data)-1])

correlated is a matrix of 167x167

Excluding predictors above 0.75 for reducing memory and heatmap response

highcorr=findCorrelation(correlated,cutoff = 0.75)
meteo_data_reduced=meteo_data[,-highcorr]
correlated2=cor(meteo_data_reduced[,2:ncol(meteo_data_reduced)-1])

correlated2 is a matrix of 42x42

Interactive heatmap using the full set of predictors

d3heatmap(correlated,symm=T,show_grid = F)

Interactive heatmap using the reduced set of predictors

d3heatmap(correlated2,symm=T,show_grid = F)