Heat map for Basketball 2008 Data (https://flowingdata.com/)
A heat map is a graphical representation of data where the individual values contained in a matrix are represented as colors. Colors correspond to the level of the measurement.
To analyze the data first we will load data using read.csv()
.
nba <- read.csv("http://datasets.flowingdata.com/ppg2008.csv", sep=",")
Sort the data from least to greatest as follows:
nba <- nba[order(nba$PTS),]
To name the rows by player name instead of row number, the following code is used:
row.names(nba) <- nba$Name
The following code is used to get rid of first column:
nba <- nba[,2:20]
The data was loaded into a data frame, but it has to be a data matrix to make your heatmap.
nba_matrix <- data.matrix(nba)
The heatmap is built by using the following code:
nba_heatmap <- heatmap(nba_matrix, Rowv=NA, Colv=NA, col = cm.colors(256), scale="column", margins=c(5,10))
nba_heatmap <- heatmap(nba_matrix, Rowv=NA, Colv=NA, col = heat.colors(256), scale="column", margins=c(5,10))
RColorBrewer is an R
package that allows users to create colourful graphs with pre-made color palettes that visualize data in a clear and distinguishable manner.
#install.packages("RColorBrewer")
library("RColorBrewer")
#display all colour schemes
#display.brewer.all()
heatmap(nba_matrix,Rowv=NA, Colv=NA, col=brewer.pal(9,"Blues"),scale="column", margins=c(5,10))
heatmap(nba_matrix,Rowv=NA, Colv=NA, col=brewer.pal(9,"Greens"),scale="column", margins=c(5,10))
In information visualization and computing, treemapping is a method for displaying hierarchical data using nested figures, usually rectangles.
data <- read.csv("http://datasets.flowingdata.com/post-data.txt")
#install.packages("portfolio")
library(portfolio)
map.market(id=data$id, area=data$views, group=data$category, color=data$comments, main="FlowingData Map")
library(treemap)
library(RColorBrewer)
treemap(data, index="category", vSize="views",
vColor="comments", mapping=c(-10, 10, 30), type="value", palette="RdYlGn")
A streamgraph, or stream graph, is a type of stacked area graph which is displaced around a central axis, resulting in a flowing, organic shape.
devtools::install_github("hrbrmstr/streamgraph")
library(dplyr)
library(babynames)
library(streamgraph)
babynames %>%
filter(grepl("^Kr", name)) %>%
group_by(year, name) %>%
tally(wt=n) %>%
streamgraph("name", "n", "year")
babynames %>%
filter(grepl("^I", name)) %>%
group_by(year, name) %>%
tally(wt=n) %>%
streamgraph("name", "n", "year", offset="zero", interpolate="linear") %>%
sg_legend(show=TRUE, label="I- names: ")
babynames %>%
filter(grepl("^I", name)) %>%
group_by(year, name) %>%
tally(wt=n) %>%
streamgraph("name", "n", "year", interpolate="step", offset="silhouette") %>%
sg_legend(show=TRUE, label="I- names: ")