Data Preparation

xlsx package은 Excel 자료를 다루는 데 매우 유용한데, read.xlsx(filename, n)의 구조로 되어 있으며, 여기서 n은 엑셀 시트의 번호이다.

# install.packages("xlsx", repos="http://cran.rstudio.com")
library(xlsx)

Equality Trust에서 기부금을 받고 제공하는 두 종류의 자료 중 23개 국가의 각종 지표를 비교한 것을 읽어들이면,

data.full<-read.xlsx("../data/international-inequality.xls", 1)
str(data.full)
## 'data.frame':    23 obs. of  29 variables:
##  $ Country                          : chr  "Australia" "Austria" "Belgium" "Canada" ...
##  $ Income.inequality                : num  7 4.82 4.6 5.62 4.3 ...
##  $ Trust                            : num  39.9 33.9 30.7 38.8 66.5 ...
##  $ Life.expectancy                  : num  79.2 78.5 78.8 79.3 76.6 ...
##  $ Infant.mortality                 : num  4.9 4.8 5 5.3 5.3 3.7 4.4 4.4 5 5.9 ...
##  $ Obesity                          : num  18.4 14.5 13.5 12.8 15 ...
##  $ Mental.illness                   : num  23 NA 12 19.9 NA ...
##  $ Maths.and.literacy.scores        : num  524 498 518 530 503 ...
##  $ Teenage.births                   : num  18.4 14 9.9 20.2 8.1 ...
##  $ Homicides                        : num  16.9 11.6 13 17.3 12.7 ...
##  $ Imprisonment..log.               : num  4.61 4.52 4.28 4.77 4.17 ...
##  $ Social.mobility                  : num  NA NA NA 0.143 0.143 ...
##  $ Index.of.health...social_problems: num  0.0652 0.01 -0.2333 -0.0707 -0.1883 ...
##  $ Child.overweight                 : num  NA 11.9 10.4 19.5 10.3 ...
##  $ Drugs.index                      : num  1.7074 -0.0182 -0.1778 0.6068 -0.0948 ...
##  $ Calorie.intake                   : num  3142 3753 3632 3167 3405 ...
##  $ Public.health.expenditure        : num  67.9 69.3 71.7 70.8 82.4 75.6 76 74.9 56 76 ...
##  $ Child.wellbeing                  : num  -0.2147 -0.0679 0.047 0.0395 0.214 ...
##  $ Maths.education.science.score    : num  525 496 515 526 494 ...
##  $ Child.conflict                   : num  NA 0.309 0.329 0.237 -0.137 ...
##  $ Foreign.aid                      : num  0.25 0.52 0.53 0.34 0.81 ...
##  $ Recycling                        : num  7.4 NA NA NA NA ...
##  $ Peace.index                      : num  1.66 1.48 1.49 1.48 1.38 ...
##  $ Maternity.leave                  : num  0 16 15 17 18 18 16 14 17 18 ...
##  $ Advertising                      : num  1.24 0.97 0.82 0.77 0.75 ...
##  $ Police                           : num  304 305 357 186 192 160 NA 303 NA NA ...
##  $ Social.expenditure               : num  17.8 27.5 26.5 17.2 27.6 25.8 29 27.3 19.9 15.8 ...
##  $ Women.s_status                   : num  0.457 -0.808 0.606 0.563 0.827 ...
##  $ Lone.parents                     : num  21 15 12 17 22 19 12 21 3 14 ...

이 자료 중 소득불평등을 나타내는 지표는 5분위계수로서 두번째 컬럼에 Income.inequality라는 이름으로 나와 있고, 건강과 사회문제 지표는 13번째 컬럼에 Index.of.health...social_problems라는 이름으로 주어져 있다. 나라들은 Country라는 변수명으로 첫번째 컬럼에 나와 있다. 그리고, 건강과 사회문제 지표에 결측치들이 있기 때문에 먼저 이 나라들을 제외하고 분석작업을 수행하여야 한다.

which(is.na(data.full$Index.of.health...social_problems))
## [1] 11 18

결측치가 있는 나라를 빼고, 필요한 변수만 챙겨서 새로운 data frame 을 구성하기 위하여 건강과 사회문제 지표의 위치를 찾아보자.

names(data.full)
##  [1] "Country"                          
##  [2] "Income.inequality"                
##  [3] "Trust"                            
##  [4] "Life.expectancy"                  
##  [5] "Infant.mortality"                 
##  [6] "Obesity"                          
##  [7] "Mental.illness"                   
##  [8] "Maths.and.literacy.scores"        
##  [9] "Teenage.births"                   
## [10] "Homicides"                        
## [11] "Imprisonment..log."               
## [12] "Social.mobility"                  
## [13] "Index.of.health...social_problems"
## [14] "Child.overweight"                 
## [15] "Drugs.index"                      
## [16] "Calorie.intake"                   
## [17] "Public.health.expenditure"        
## [18] "Child.wellbeing"                  
## [19] "Maths.education.science.score"    
## [20] "Child.conflict"                   
## [21] "Foreign.aid"                      
## [22] "Recycling"                        
## [23] "Peace.index"                      
## [24] "Maternity.leave"                  
## [25] "Advertising"                      
## [26] "Police"                           
## [27] "Social.expenditure"               
## [28] "Women.s_status"                   
## [29] "Lone.parents"
which(names(data.full)=="Index.of.health...social_problems")
## [1] 13

새로운 data frame 을 data.1 으로 저장하자. 시각적 가독성을 높이기 위하여 자릿수를 조정한다.

options(digits=2)
data.1<-data.full[-c(11, 18), c(1, 2, 13)]
data.1
##        Country Income.inequality Index.of.health...social_problems
## 1    Australia               7.0                             0.065
## 2      Austria               4.8                             0.010
## 3      Belgium               4.6                            -0.233
## 4       Canada               5.6                            -0.071
## 5      Denmark               4.3                            -0.188
## 6      Finland               3.7                            -0.433
## 7       France               5.6                             0.051
## 8      Germany               5.2                            -0.065
## 9       Greece               6.2                             0.380
## 10     Ireland               6.1                             0.254
## 12       Italy               6.7                            -0.116
## 13       Japan               3.4                            -1.256
## 14 Netherlands               5.3                            -0.510
## 15 New Zealand               6.8                             0.291
## 16      Norway               3.9                            -0.633
## 17    Portugal               8.0                             1.180
## 19       Spain               5.6                            -0.304
## 20      Sweden               4.0                            -0.834
## 21 Switzerland               5.7                            -0.455
## 22          UK               7.2                             0.789
## 23         USA               8.5                             2.021

Plots

plot 과 기타 작업의 편의를 위하여 data.1을 검색 목록에 올린다.

attach(data.1)

우선 소득불평등과 건강 및 사회문제 지표의 관계를 대략적으로 살펴보면,

plot(Index.of.health...social_problems~Income.inequality, data=data.1)

매우 높은 양의 상관관계(r = 0.87) 가 관찰됨을 알 수 있다.

각 점이 어느 나라를 나타내는지 표시하기 위하여 text() 를 활용하자. 동그라미 대신 까만 점으로 표시하고, 나라 이름을 올려보자.

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20)
text(Income.inequality, Index.of.health...social_problems, labels=Country)

text label의 위치 기본값은 바로 점 위임을 알 수 있다. 위치 선정에 가능한 값들을 넣어보자.

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20)
text(Income.inequality, Index.of.health...social_problems, labels=Country, pos=1)

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20)
text(Income.inequality, Index.of.health...social_problems, labels=Country, pos=2)

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20)
text(Income.inequality, Index.of.health...social_problems, labels=Country, pos=3)

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20)
text(Income.inequality, Index.of.health...social_problems, labels=Country, pos=4)

우선 x-축과 y-축의 범위를 xlim=c(3, 9), ylim=c(-1.5, 2.5)로 하여 미국과 일본의 라벨이 도표 밖으로 나가지 않게 하자. pos=4로 하고 cex=0.8로 하여 글자 크기를 줄여보면,

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20, xlim=c(3, 9), ylim=c(-1.5, 2.5))
text(Income.inequality, Index.of.health...social_problems, labels=Country, pos=4, cex=0.8)

오스트리아, 덴마크, 독일, 네덜란드의 라벨만 점 왼편에 위치시켜 보자. 각 인덱스를 찾아보면,

which(Country %in% c("Austria", "Denmark", "Germany", "Netherlands"))
## [1]  2  5  8 13
text.left<-which(Country %in% c("Austria", "Denmark", "Germany", "Netherlands"))
text.left
## [1]  2  5  8 13
text.right<-(1:21)[-text.left]
text.right
##  [1]  1  3  4  6  7  9 10 11 12 14 15 16 17 18 19 20 21
plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20, xlim=c(3, 9), ylim=c(-1.5, 2.5))
text(Income.inequality[text.right], Index.of.health...social_problems[text.right], labels=Country[text.right], pos=4, cex=0.8)
text(Income.inequality[text.left], Index.of.health...social_problems[text.left], labels=Country[text.left], pos=2, cex=0.8)

독일의 라벨을 위로 붙이면 보기가 나아질 것으로 생각되므로,

which(Country == "Germany")
## [1] 8
text.up<-which(Country == "Germany")
text.up
## [1] 8
which(text.left==text.up)
## [1] 3
text.left<-text.left[!(text.left == text.up)]
text.left
## [1]  2  5 13

이제 조정된 text 외에 x-축과 y-축에 적절한 라벨과 메인 타이틀을 넣어보자.

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20, xlim=c(3, 9), ylim=c(-1.5, 2.5), ann=FALSE)
text(Income.inequality[text.right], Index.of.health...social_problems[text.right], labels=Country[text.right], pos=4, cex=0.8)
text(Income.inequality[text.left], Index.of.health...social_problems[text.left], labels=Country[text.left], pos=2, cex=0.8)
text(Income.inequality[text.up], Index.of.health...social_problems[text.up], labels=Country[text.up], pos=3, cex=0.8)
title(main="Income Inequality vs Index of Health and Social Problems", xlab="Income Inequality", ylab="Index of Health and Social Problems")

건강 및 사회문제 지표의 경우 어느 방향이 좋은지 알 수 없으므로 친절하게 도표의 주변에(margin)에 알려주려면,

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20, xlim=c(3, 9), ylim=c(-1.5, 2.5), ann=FALSE)
text(Income.inequality[text.right], Index.of.health...social_problems[text.right], labels=Country[text.right], pos=4, cex=0.8)
text(Income.inequality[text.left], Index.of.health...social_problems[text.left], labels=Country[text.left], pos=2, cex=0.8)
text(Income.inequality[text.up], Index.of.health...social_problems[text.up], labels=Country[text.up], pos=3, cex=0.8)
title(main="Income Inequality vs Index of Health and Social Problems", xlab="Income Inequality", ylab="Index of Health and Social Problems")
mtext("Worse", side=2, at=2.8, las=1)
mtext("Better", side=2, at=-1.8, las=1)

한글화 작업

국가명을 한글로 만들어 Country.kr로 저장하자.

Country.kr<-c("호주", "오스트리아", "벨기에", "캐나다", "덴마크",
"핀란드", "프랑스", "독일", "그리스", "아일랜드", "이탈리아",
"일본", "네덜란드", "뉴질랜드", "노르웨이", "포르투갈",
"스페인", "스웨덴", "스위스", "영국", "미국")
plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20, xlim=c(3, 9), ylim=c(-1.5, 2.5), ann=FALSE)
text(Income.inequality[text.right], Index.of.health...social_problems[text.right], labels=Country.kr[text.right], pos=4, cex=0.8)
text(Income.inequality[text.left], Index.of.health...social_problems[text.left], labels=Country.kr[text.left], pos=2, cex=0.8)
text(Income.inequality[text.up], Index.of.health...social_problems[text.up], labels=Country.kr[text.up], pos=3, cex=0.8)
title(main="소득불평등과 건강 및 사회문제 지수", xlab="소득불평등(소득5분위계수)", ylab="건강 및 사회문제 지수")
mtext("나쁨", side=2, at=2.8, las=1)
mtext("좋음", side=2, at=-1.8, las=1)

끝으로 두 변수 간의 상관계수 r = 0.87 를 도표 안에 표시하려면, 좌표를 잡아서

plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20, xlim=c(3, 9), ylim=c(-1.5, 2.5), ann=FALSE)
text(Income.inequality[text.right], Index.of.health...social_problems[text.right], labels=Country.kr[text.right], pos=4, cex=0.8)
text(Income.inequality[text.left], Index.of.health...social_problems[text.left], labels=Country.kr[text.left], pos=2, cex=0.8)
text(Income.inequality[text.up], Index.of.health...social_problems[text.up], labels=Country.kr[text.up], pos=3, cex=0.8)
text(x=5, y=1.5, labels=paste("r =", round(cor(data.1[,2], data.1[,3]), digits=2)))
title(main="소득불평등과 건강 및 사회문제 지수", xlab="소득불평등(소득5분위계수)", ylab="건강 및 사회문제 지수")
mtext("나쁨", side=2, at=2.8, las=1)
mtext("좋음", side=2, at=-1.8, las=1)

lm.ineq <- lm(Index.of.health...social_problems~Income.inequality, data = data.1)
plot(Index.of.health...social_problems~Income.inequality, data=data.1, pch=20, xlim=c(3, 9), ylim=c(-1.5, 2.5), ann=FALSE)
abline(lm.ineq$coefficients, col="red")
text(Income.inequality[text.right], Index.of.health...social_problems[text.right], labels=Country.kr[text.right], pos=4, cex=0.8)
text(Income.inequality[text.left], Index.of.health...social_problems[text.left], labels=Country.kr[text.left], pos=2, cex=0.8)
text(Income.inequality[text.up], Index.of.health...social_problems[text.up], labels=Country.kr[text.up], pos=3, cex=0.8)
text(x=5, y=1.5, labels=paste("r =", round(cor(data.1[,2], data.1[,3]), digits=2)))
title(main="소득불평등과 건강 및 사회문제 지수", xlab="소득불평등(소득5분위계수)", ylab="건강 및 사회문제 지수")
mtext("나쁨", side=2, at=2.8, las=1)
mtext("좋음", side=2, at=-1.8, las=1)

미국의 경우

xlsx 패키지를 이용하여 자료를 읽어들인다.

data.usa<-read.xlsx("../data/USA-inequality.xls", 1)
str(data.usa)
## 'data.frame':    50 obs. of  20 variables:
##  $ State                            : chr  "Alabama" "Alaska" "Arizona" "Arkansas" ...
##  $ State.Abbrev                     : chr  "AL" "AK" "AZ" "AR" ...
##  $ Income.Inequality                : num  0.475 0.402 0.45 0.458 0.475 ...
##  $ Trust                            : num  23 NA 47 29 43 46 49 NA 37 38 ...
##  $ Life.expectancy                  : num  74.6 76.7 77.5 75.1 78.3 ...
##  $ Infant.mortality                 : num  9.1 5.5 6.4 8.3 5.5 ...
##  $ Obesity                          : num  32 30 28.5 31 31 21.5 26.5 27 27.5 30.5 ...
##  $ Mental.health                    : num  3.3 2.8 2.2 3.2 3.3 ...
##  $ Maths.and.literacy.scores        : num  258 268 263 262 259 ...
##  $ Teenage.births                   : num  62.9 42.4 69.1 68.5 48.5 ...
##  $ Homicides                        : num  78.9 85.6 80.4 56.1 60.5 ...
##  $ Imprisonment                     : num  509 413 507 415 478 357 372 429 447 502 ...
##  $ Index.of.health...social.problems: num  1.385 0.137 0.212 0.948 0.327 ...
##  $ Overweight.children              : num  35 31 30 33 30 22 27 35 32 32 ...
##  $ Child.wellbeing                  : num  8.5 4.4 4.9 9.3 -3.4 ...
##  $ Women.s.status                   : num  -0.932 0.74 -0.147 -1.318 0.969 ...
##  $ Juvenile.homicides               : num  12 8 7 6 10 4 4 0 NA 8 ...
##  $ High.school.drop.outs            : num  24.7 11.7 19 24.7 23.2 ...
##  $ Child.mental.illness             : num  11.5 8.2 8.7 11.8 7.5 ...
##  $ Pugnacity                        : num  41.8 NA 36.3 38.4 37.7 ...

당장 필요한 변수들만 모아서 data frame으로 재구성한다. 변수명 설정에 유의한다.

data.usa.1<-data.frame(Abb=data.usa$State.Abbrev, Gini=data.usa$Income.Inequality, HS.index=data.usa$Index.of.health...social.problems)
options(digits=3)
data.usa.1
##    Abb  Gini HS.index
## 1   AL 0.475   1.3849
## 2   AK 0.402   0.1371
## 3   AZ 0.450   0.2122
## 4   AR 0.458   0.9480
## 5   CA 0.475   0.3270
## 6   CO 0.438  -0.5072
## 7   CT 0.477  -0.6597
## 8   DE 0.429   0.1334
## 9   FL 0.470   0.3596
## 10  GA 0.461   0.8956
## 11  HI 0.434  -0.3880
## 12  ID 0.427  -0.4291
## 13  IL 0.456   0.2065
## 14  IN 0.424   0.3698
## 15  IA 0.418  -0.8948
## 16  KS 0.435  -0.4423
## 17  KY 0.468   0.8738
## 18  LA 0.483   1.5948
## 19  ME 0.434  -0.7692
## 20  MD 0.434   0.1873
## 21  MA 0.463  -0.9586
## 22  MI 0.440   0.3494
## 23  MN 0.426  -1.2160
## 24  MS 0.478   1.6915
## 25  MO 0.449   0.3917
## 26  MT 0.436  -0.9058
## 27  NE 0.424  -0.5831
## 28  NV 0.436   0.8032
## 29  NH 0.414  -1.2417
## 30  NJ 0.460  -0.4022
## 31  NM 0.460   0.5636
## 32  NY 0.499  -0.1790
## 33  NC 0.452   0.4942
## 34  ND 0.429  -1.1450
## 35  OH 0.441   0.0583
## 36  OK 0.455   0.4935
## 37  OR 0.438  -0.3459
## 38  PA 0.452  -0.0155
## 39  RI 0.457  -0.3891
## 40  SC 0.454   0.8992
## 41  SD 0.434  -0.7585
## 42  TN 0.465   0.7881
## 43  TX 0.470   0.9299
## 44  UT 0.410  -0.7090
## 45  VT 0.423  -1.1828
## 46  VA 0.449  -0.0550
## 47  WA 0.436  -0.5156
## 48  WV 0.468   0.4817
## 49  WI 0.413  -0.4731
## 50  WY 0.428  -0.5512

간단한 산점도를 그리고, 추가 작업을 생각한다.

plot(HS.index~Gini, data=data.usa.1)

x-축과 y-축의 범위를 설정하고, pch=20으로 다시 그린다.

plot(HS.index~Gini, data=data.usa.1, pch=20, xlim=c(0.39, 0.51), ylim=c(-1.5, 2.0))

각 주의 약칭을 새겨넣는다.

plot(HS.index~Gini, data=data.usa.1, pch=20, xlim=c(0.39, 0.51), ylim=c(-1.5, 2.0))
text(data.usa.1$Gini, data.usa.1$HS.index, labels=data.usa.1$Abb, pos=4)

겹쳐보이는 주의 약칭들로부터 인덱스를 추출한다.

which(data.usa.1$Abb %in% c("VT", "ME", "NE", "WA", "VA", "HI", "RI", "SC", "AR", "NC", "GA", "KY"))
##  [1]  4 10 11 17 19 27 33 39 40 45 46 47

점 왼쪽에 약칭을 넣을 주들의 인덱스를 저장한다. 나머지 인덱스는 오른쪽에 넣을 것으로 따로 저장한다.

text.left<-which(data.usa.1$Abb %in% c("VT", "ME", "NE", "WA", "VA", "HI", "RI", "SC", "AR", "NC", "GA", "KY"))
text.right<-(1:50)[-text.left]

왼쪽, 오른쪽 위치를 조정한 주 약칭을 다시 넣는다.

plot(HS.index~Gini, data=data.usa.1, pch=20, xlim=c(0.39, 0.51), ylim=c(-1.5, 2.0))
text(data.usa.1$Gini[text.right], data.usa.1$HS.index[text.right], labels=data.usa.1$Abb[text.right], pos=4)
text(data.usa.1$Gini[text.left], data.usa.1$HS.index[text.left], labels=data.usa.1$Abb[text.left], pos=2)

점 아래에 약칭을 넣을 주들의 인덱스를 찾는다. 왼쪽 인덱스, 오른쪽 인덱스에서 조정한다.

text.down<-which(data.usa.1$Abb %in% c("WA", "AR", "GA", "MN"))
which(text.left %in% text.down)
## [1]  1  2 12
text.left<-text.left[!(text.left %in% text.down)]
text.right<-text.right[!(text.right %in% text.down)]

약칭 위치를 아래로 조정한 산점도를 다시 그린다.

plot(HS.index~Gini, data=data.usa.1, pch=20, xlim=c(0.39, 0.51), ylim=c(-1.5, 2.0))
text(data.usa.1$Gini[text.right], data.usa.1$HS.index[text.right], labels=data.usa.1$Abb[text.right], pos=4)
text(data.usa.1$Gini[text.left], data.usa.1$HS.index[text.left], labels=data.usa.1$Abb[text.left], pos=2)
text(data.usa.1$Gini[text.down], data.usa.1$HS.index[text.down], labels=data.usa.1$Abb[text.down], pos=1)

상관계수를 추가한다.

plot(HS.index~Gini, data=data.usa.1, pch=20, xlim=c(0.39, 0.51), ylim=c(-1.5, 2.0))
text(data.usa.1$Gini[text.right], data.usa.1$HS.index[text.right], labels=data.usa.1$Abb[text.right], pos=4)
text(data.usa.1$Gini[text.left], data.usa.1$HS.index[text.left], labels=data.usa.1$Abb[text.left], pos=2)
text(data.usa.1$Gini[text.down], data.usa.1$HS.index[text.down], labels=data.usa.1$Abb[text.down], pos=1)
text(x=0.42, y=1.5, labels=paste("r =", round(cor(data.usa.1$HS.index, data.usa.1$Gini), digits=2)), col="red", cex=2)

단순회귀선을 추가한다.

plot(HS.index~Gini, data=data.usa.1, pch=20, xlim=c(0.39, 0.51), ylim=c(-1.5, 2.0))
text(data.usa.1$Gini[text.right], data.usa.1$HS.index[text.right], labels=data.usa.1$Abb[text.right], pos=4)
text(data.usa.1$Gini[text.left], data.usa.1$HS.index[text.left], labels=data.usa.1$Abb[text.left], pos=2)
text(data.usa.1$Gini[text.down], data.usa.1$HS.index[text.down], labels=data.usa.1$Abb[text.down], pos=1)
text(x=0.42, y=1.5, labels=paste("r =", round(cor(data.usa.1$HS.index, data.usa.1$Gini), digits=2)), col="red", cex=2)
abline(lm(HS.index~Gini, data=data.usa.1)$coefficient)

주제목을 추가하고, xlab, ylab을 수정한다. 수직축의 의미를 명확히 한다.

plot(HS.index~Gini, data=data.usa.1, pch=20, xlim=c(0.39, 0.51), ylim=c(-1.5, 2.0), ann=FALSE)
text(data.usa.1$Gini[text.right], data.usa.1$HS.index[text.right], labels=data.usa.1$Abb[text.right], pos=4)
text(data.usa.1$Gini[text.left], data.usa.1$HS.index[text.left], labels=data.usa.1$Abb[text.left], pos=2)
text(data.usa.1$Gini[text.down], data.usa.1$HS.index[text.down], labels=data.usa.1$Abb[text.down], pos=1)
text(x=0.42, y=1.5, labels=paste("r =", round(cor(data.usa.1$HS.index, data.usa.1$Gini), digits=2)), col="red", cex=2)
abline(lm(HS.index~Gini, data=data.usa.1)$coefficient)
mtext("Worse", side=2, at=2.3, las=1)
mtext("Better", side=2, at=-1.8, las=1)
title(main="Income Inequality vs Health and Social Index (USA)", xlab="Gini Coefficients", ylab="Index of Health and Social Problems")

뒷 마무리