BoxPlots

library(ggplot2)
## Warning: package 'ggplot2' was built under R version 4.0.3
# Plot Sepal

plot = ggplot(iris, aes(x=Sepal.Length, y=Sepal.Width)) + geom_boxplot(aes(group=Species, fill=Species, alpha=0.3))
plot = plot + geom_point(aes(color=Species, alpha=0.3))
plot = plot + facet_grid(.~Species)


# Mostrar Plot
plot

# Plot Petal

plot = ggplot(iris, aes(x=Species, y=Petal.Width)) + geom_boxplot(aes(group=Species, fill=Species, alpha=0.3))
plot = plot + geom_point(aes(color=Species, alpha=0.3))


# Mostrar Plot
plot

Coord Paralelas

#install.packages("GGally")
library(GGally)
## Warning: package 'GGally' was built under R version 4.0.3
## Registered S3 method overwritten by 'GGally':
##   method from   
##   +.gg   ggplot2
# Plot

plot2 = ggparcoord(iris,
                   columns=c(1:4),
                   groupColumn = "Species",
                   showPoints = TRUE
                   )

# Mostrar plot
plot2

# Facetas

plot2 = plot2 + facet_grid(Species~.)
plot2