Data Visualizatoin I(Quiz4)
library(gapminder)
library(tidyverse)
## -- Attaching packages --------------------------------------- tidyverse 1.3.1 --
## v ggplot2 3.3.5 v purrr 0.3.4
## v tibble 3.1.4 v dplyr 1.0.7
## v tidyr 1.1.3 v stringr 1.4.0
## v readr 2.0.1 v forcats 0.5.1
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag() masks stats::lag()
gapminder %>%
filter(year=="2007") %>%
dplyr::select(-year) %>%
arrange(desc(pop)) %>%
mutate(country=factor(country,country)) %>%
ggplot(mapping=aes(x=gdpPercap, y=lifeExp,size=pop,fill=continent)) +
geom_point(alpha=0.5,shape=21,color="black")+
scale_size(range=c(.1,24),name="Population(M)") +
theme_minimal() +
theme(legend.position="right") +
labs(
subtitle="Life Expectancy vs. GDP per Capita",
y="Life Expectancy",
x="GDP per Capita",
title="Scatter Plot",
caption="Source:gapminder"
)
data:image/s3,"s3://crabby-images/34792/347920d8de0febd208da3feeabdec1d6525f5e51" alt=""
Quiz 4-1
gapminder %>%
filter(year=="2007") %>%
dplyr::select(-year) %>%
arrange(desc(pop)) %>%
mutate(country=factor(country,country)) %>%
ggplot(mapping=aes(lifeExp,size=pop,fill=continent))+geom_histogram()
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
data:image/s3,"s3://crabby-images/6bc0c/6bc0c6e6f675b938f9bf4edbb34631b74f26f26a" alt=""
Quiz 4-2
gapminder %>%
filter(year=="2007") %>%
dplyr::select(-year) %>%
arrange(desc(pop)) %>%
mutate(country=factor(country,country)) %>%
ggplot(mapping=aes(lifeExp,size=pop,fill=continent))+geom_histogram()+ facet_wrap(vars(continent))
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
data:image/s3,"s3://crabby-images/ecbe2/ecbe2b3b217e10416fa66942d7e4454aa2c1ae80" alt=""
Quiz 4-3
gapminder %>%
filter(year=="2007") %>%
dplyr::select(-year) %>%
arrange(desc(pop)) %>%
mutate(country=factor(country,country)) %>%
ggplot(mapping=aes(y=lifeExp,size=pop,fill=continent))+geom_boxplot()
data:image/s3,"s3://crabby-images/83cb1/83cb13376fd3b8dd9d07efbd78595c5f28136f44" alt=""
Quiz 4-4
gapminder %>%
ggplot(mapping=aes(x=year, y=lifeExp,color=continent,group=country))+geom_line()
data:image/s3,"s3://crabby-images/1cf4a/1cf4aee3026e8134a98b1ee0c896fa87daac94dd" alt=""
Quiz 4-5
gapminder %>%
ggplot(mapping=aes(x=year, y=lifeExp,color=continent,group=country))+geom_line() +
facet_wrap(vars(continent))
data:image/s3,"s3://crabby-images/498c9/498c9bcb155d2c3ddd75c2a45742633f79e0ccb2" alt=""
Quiz 4-6
## corrplot 0.90 loaded
gapminder %>%
filter(year=="2007") %>%
select(lifeExp, pop, gdpPercap) %>%
cor() %>%
corrplot.mixed()
data:image/s3,"s3://crabby-images/db1e7/db1e7a42e9bba013766ac7dca74b48df40390ea9" alt=""