library(ggplot2)
library(GGally)
colPalette <- c("#596791","#565318","#e8737b")
Se toma el conjunto de datos IRIS
ggplot(iris, aes(Sepal.Length, Sepal.Width)) +
geom_boxplot(aes(group=Species, fill=Species, alpha=0.3)) +
geom_point(aes(color=Species, alpha=0.3)) +
facet_grid(.~Species) +
scale_fill_manual(values=colPalette) +
scale_color_manual(values=colPalette) + theme_bw()
plot <- ggparcoord(iris,
columns=c(1:4),
showPoints=TRUE,
groupColumn = 'Species') +
scale_color_manual(values = colPalette) + theme_bw()
plot
plot <- plot + facet_grid(Species~.) + theme_bw()
plot