Histogramas
library(RColorBrewer)
data(VADeaths)
par(mfrow=c(2,3))
hist(VADeaths,breaks=10, col=brewer.pal(3,"Set3"),main="Set3 3 colors")
hist(VADeaths,breaks=5, col=brewer.pal(3,"Set2"),main="Set3 2 colors")
hist(VADeaths,breaks=3, col=brewer.pal(3,"Set1"),main="Set3 1 colors")
hist(VADeaths,breaks=10, col=brewer.pal(3,"Spectral"),main="Set Spectral")
hist(VADeaths,breaks=5, col=brewer.pal(3,"Blues"),main="Set Blues")
hist(VADeaths,breaks=3, col=brewer.pal(3,"Greys"),main="Set Greys")

LÃneas simples
par(mfrow=c(1,1))
plot(AirPassengers,type="l")

Barras simples
par(mfrow=c(2,1))
barplot(iris$Petal.Length)
barplot(table(iris$Species,iris$Sepal.Length),col = brewer.pal(3,"Set1"))

Boxplot
data(iris)
par(mfrow=c(1,2))
boxplot(iris$Sepal.Length,col="red")
boxplot(iris$Sepal.Length~iris$Species,col=topo.colors(3))

Scatterplots
par(mfrow=c(1,2))
plot(x=iris$Petal.Length, main = "Simple")
plot(x=iris$Petal.Length,y=iris$Species, main = "Multivariado")

Múltiples
plot(iris,col=brewer.pal(3,"Set1"))

Hexbin
if (!require("hexbin")) {
install.packages("hexbin", repos="http://cran.rstudio.com/")
library("hexbin")
}
## Loading required package: hexbin
library(ggplot2); data(diamonds)
a=hexbin(diamonds$price,diamonds$carat,xbins=40)
library(RColorBrewer)
plot(a)

Otro con hexbin
rf <- colorRampPalette(rev(brewer.pal(12,'Set3')))
hexbinplot(diamonds$price~diamonds$carat, data=diamonds, colramp=rf)

Mosaico
par(mfrow=c(1,2))
data(HairEyeColor)
mosaicplot(HairEyeColor)
mosaicplot(HairEyeColor, shade = T)

Heatmap
heatmap(as.matrix(mtcars))
