pacman::p_load(tidyverse, gridExtra, ggExtra,
ggfortify, GGally, ggthemes, ggrepel,
gganimate, ggeffects)
## Warning: package 'gganimate' is not available (for R version 3.4.3)
## Warning in p_install(package, character.only = TRUE, ...):
## Warning in library(package, lib.loc = lib.loc, character.only = TRUE,
## logical.return = TRUE, : there is no package called 'gganimate'
## Warning in pacman::p_load(tidyverse, gridExtra, ggExtra, ggfortify, GGally, : Failed to install/load:
## gganimate

EX01

把兩個機率密度直方圖合併為金字塔圖

dta <- read.table("hs0.txt", h = T) %>%
 mutate(female = factor(female, levels(female), 
                 labels = c("Female", "Male")),
        race = factor(race, levels(race), 
               labels = c("Black", "Asian", "Hispanic", 
                          "White")),
        ses = ordered(ses, levels = c("low", "middle", 
                      "high"),
              labels = c("Low", "Middle", "High"))) %>%
 mutate(race = reorder(race, math, median))

str(dta)
## 'data.frame':    200 obs. of  11 variables:
##  $ id     : int  70 121 86 141 172 113 50 11 84 48 ...
##  $ female : Factor w/ 2 levels "Female","Male": 2 1 2 2 2 2 2 2 2 2 ...
##  $ race   : Factor w/ 4 levels "Black","Hispanic",..: 3 3 3 3 3 3 1 2 3 1 ...
##   ..- attr(*, "scores")= num [1:4(1d)] 45 61 47 54
##   .. ..- attr(*, "dimnames")=List of 1
##   .. .. ..$ : chr  "Black" "Asian" "Hispanic" "White"
##  $ ses    : Ord.factor w/ 3 levels "Low"<"Middle"<..: 1 2 3 3 2 2 2 2 2 2 ...
##  $ schtyp : Factor w/ 2 levels "private","public": 2 2 2 2 2 2 2 2 2 2 ...
##  $ prog   : Factor w/ 3 levels "academic","general",..: 2 3 2 3 1 1 2 1 2 1 ...
##  $ read   : int  57 68 44 63 47 44 50 34 63 57 ...
##  $ write  : int  52 59 33 44 52 52 59 46 57 55 ...
##  $ math   : int  41 53 54 47 57 51 42 45 54 52 ...
##  $ science: int  47 63 58 53 53 63 53 39 58 NA ...
##  $ socst  : int  57 61 31 56 61 61 61 36 51 51 ...
bw <- with(dta, IQR(math)/(length(math)^(1/3)))
ggplot() +
  #分別用男生女生數學成績作圖
 stat_bin(data = subset(dta, female=="Male"), binwidth = bw,
     aes(math, color = "Male", fill = "Male", y = - ..density.. )) +
 stat_bin(data = subset(dta, female == "Female"), binwidth = bw,
     aes(math, color = "Female", fill = "Female", y = ..density.. )) +
  #設定邊框顏色
  scale_color_manual(values = c("black", "black"),
      guide = guide_legend(title = NULL, direction = "horizontal",
       title.position = "top", reverse = TRUE,
       label.position = "bottom", label.hjust = .5, label.vjust = .5,
       label.theme = element_text(angle = 90) ) ) +
 #設定框內填滿顏色
  scale_fill_manual(values = c("White", "gray80"),
      guide = guide_legend(title = NULL, reverse = TRUE,
       direction = "horizontal", title.position = "top",
       label.position = "bottom", label.hjust = .5, label.vjust = .5,
       label.theme = element_text(angle = 90))) +
 #設定刻度範圍30~80,以5為間隔單位
 scale_x_continuous(limits = c(30, 80), breaks=seq(30, 80, by = 5)) +
 labs(x = "Mathematic score", y = "Density") +
 coord_flip() +
 theme_bw() +
 theme(legend.position=c(.9, .85))

EX02

library(ggeffects)

#p.39的圖(用預測值作圖)
m0 <- lm(math ~ read + write + science + socst + race +
female+ses, data = dta)
dta_m0 <- ggpredict(m0, terms = c("race", "female", "ses"))
plot(dta_m0) + labs(y = "Mean math score", x = "Race")

#Plots with error bars(用原始資料作圖)
ggplot(dta, aes(race, math, color = female))+
  stat_summary(fun.data = "mean_se", 
               geom = "pointrange")+
  facet_grid(~ses)
## Warning: Removed 3 rows containing missing values (geom_pointrange).

EX03

dta03 <- read.table("kdt.csv", sep="",header=T)
head(dta03)
##   Test  Format Accuracy  SE
## 1  KDT Picture     93.7 0.9
## 2  KDT    Word     96.4 0.7
## 3  PPT Picture     90.6 1.0
## 4  PPT    Word     88.9 1.0
ggplot(dta03,aes(Test, Accuracy,fill=Format))+
   coord_cartesian(ylim=c(85,100))+
  geom_bar(stat="identity",position='dodge', colour="black")+
  geom_errorbar(aes(ymin = Accuracy-SE , ymax= Accuracy+SE), width = .2,position=position_dodge(0.9))+scale_fill_manual(values=c("gray80","white"))

`