Exercise 5-1
library(gcookbook)
library(tidyverse)
library(dplyr)
library(ggplot2)
ggplot(heightweight, aes(x=ageYear, y=heightIn, size=weightLb, color=sex))+geom_point()
data:image/s3,"s3://crabby-images/27c91/27c91cc43c227fba333053535528dae3ad255cd9" alt=""
ggplot(heightweight, aes(x=ageYear, y=heightIn, size=weightLb, color=sex))+geom_point(alpha=0.3)
data:image/s3,"s3://crabby-images/12ae4/12ae4d07ab316b5e2121a3c4d2e455da9283a083" alt=""
ggplot(heightweight, aes(x=ageYear, y=heightIn, size=weightLb, color=sex))+geom_point(alpha=0.3) +
labs(title="Height and weight of school children",
subtitle="Height vs Weight",
caption="Source: heightweight",
x="Age (year)",
y="Height (inches)",
size="Weight(Lb)",
color="Gender")
data:image/s3,"s3://crabby-images/ba4e6/ba4e670cfec7d6d795dc8ede837b399714c7368b" alt=""
ggplot(heightweight, aes(x=ageYear, y=heightIn, size=weightLb, color=sex))+geom_point(alpha=0.3) +
labs(title="Height and weight of school children",
subtitle="Height vs Weight",
caption="Source: heightweight",
x="Age (year)",
y="Height (inches)",
size="Weight(Lb)",
color="Gender") + theme_classic()
data:image/s3,"s3://crabby-images/984e2/984e217217f766bf7c813038112c98590b1d789c" alt=""
Exercise 5-2
ggplot(heightweight, aes(x=heightIn)) + geom_histogram()
data:image/s3,"s3://crabby-images/078ae/078aeeef65774012082a3d77eb0c450489cd5bcd" alt=""
ggplot(heightweight, aes(x=weightLb, fill=sex)) + geom_histogram()
data:image/s3,"s3://crabby-images/92833/92833ebc7587f0fdec8445d35fa70801fe8376da" alt=""
ggplot(heightweight, aes(x=weightLb, fill=sex)) +
geom_histogram(alpha=0.4) +
scale_fill_manual(values=c("orange", "yellow"))
data:image/s3,"s3://crabby-images/dc7c5/dc7c567fb6873abb86cd9f08ed16a22f7a4e4d0d" alt=""
ggplot(heightweight, aes(x=weightLb, fill=sex)) +
geom_histogram(alpha=0.4) +
scale_fill_manual(values=c("orange", "yellow")) +
labs(title = "A histogram of the weight of school children",
subtitle = "By gender",
x="WeightLb",
y="Count",
fill="Gender") + theme_minimal()
data:image/s3,"s3://crabby-images/57493/574932e9576d435ceb9b75b4903f06ea6129a535" alt=""
Exercise 5-4
ggplot(midwest, aes(x = area, y = poptotal)) +
geom_point(alpha=0.4, aes(size = popdensity, color = state)) +
geom_smooth(se=FALSE) +
xlim(c(0, 0.1)) +
ylim(c(0, 500000)) +
labs(title = "Scatterplot",
subtitle = "Area Vs Population",
x = "Area",
y = "Population",
caption = "midwest") +
theme_classic()
## Warning: Removed 15 rows containing non-finite values (stat_smooth).
## Warning: Removed 15 rows containing missing values (geom_point).
data:image/s3,"s3://crabby-images/33a6d/33a6d7b4bb1a0f18ba343440063f5d9fca3b626a" alt=""
Exercise 5-5
ggplot(iris, aes(x=Sepal.Length, y=Sepal.Width, shape=Species, color=Species)) +
geom_point(alpha=0.5, size=6) +
theme_minimal() +
labs(title = "Scatterplot",
subtitle = "Sepal.Length Vs Sepal.Width",
caption = "Source: iris")
data:image/s3,"s3://crabby-images/b316d/b316d9b6ade28ad1e4454f02cf9b7c7ef7550754" alt=""
Exercise 5-6
ggplot(heightweight, aes(x=heightIn, y=weightLb, color=sex)) +
geom_point(alpha=0.5, size=3) +
geom_smooth(se=FALSE, method="lm") +
theme_classic() +
labs(title = "Scatterplot",
subtitle = "Weight Vs Height",
caption = "Source: heightweight")
data:image/s3,"s3://crabby-images/8b500/8b50013155376da08070da5e0622ac1df0623aa0" alt=""
Exercise 5-8
ggplot(cabbage_exp, aes(x=Date, y=Weight, fill=Cultivar)) +
geom_bar(stat='identity', position="dodge") +
geom_text(aes(label = Weight), colour = "white", size = 4, vjust = 1.5, position = position_dodge(.9)) +
theme_minimal()
data:image/s3,"s3://crabby-images/ed6d3/ed6d37051a9d77064961c731d4cb4a079c39169c" alt=""