최근 결혼이 필수가 아니라 선택이라는 인식이 높아지면서 혼인율율이 급격하게 감소하고 있는 추세이다. 비혼을 주장하는 사람들은 다른 사람을 신경 쓰지 않고 자신만의 시간을 갖고 인생을 살 수 있다는 점을 들어 주장을 뒷받침한다. 취업난과 경제력 등을 이유로 결혼은 물론 연애도 엄두를 내지 못하는 사람도 있다. 기혼을 주장하는 사람들은 결혼하여 느끼는 안정감과 자녀가 주는 행복감을 이유로 결혼의 중요성을 언급한다. 나이가 차기 전에 결혼을 해야 한다는 사회적 인식 때문에 결혼을 재촉하는 사람도 있다. 비혼 주의가 팽배한 세상에서, 비혼을 주장하고 평생 혼자 사는 사람은 과연 결혼을 하여 가정을 꾸리는 사람보다 더 행복할지 의문이 생겨 이 주제를 선정하게 되었다. 결혼과 미혼 각각의 장단점이 있겠지만 나는 여러 가지 측면에서 이 두 집단의 특징을 비교해 보려고 한다.
복지패널 데이터는 국민의 복지욕구 및 복지 실태를 보여줄 수 있는 우리나라의 대표 패널 데이터다. 이번 연구에는 2022년 17차 한국복지패널조사 데이터를 사용하였다. 결혼을 하는 것과 안 하는 것 둘 중 어느 것이 더 나은지는 개인의 판단이기 때문에 나는 객관적인 데이터를 바탕으로 해, 두 집단의 특징을 비교하는 방향으로 연구를 진행하겠다.
기본적으로 혼인상태 데이터를 이용해 결혼과 미혼으로 나눌 것이다. 이 두 집단을 소득, 건강, 주거, 사회적 관계, 여가생활, 가족생활, 외로움 등의 데이터를 이용해 비교해 볼 것이며 소득의 경우 혼인 여부뿐만 아니라 성별과 나이도 영향을 미칠 것이라 판단되어 성별 데이터와 나이 데이터도 사용할 것이다.
raw_welfare <- read.spss(file = "Koweps_hpwc17_2022_beta1.sav", to.data.frame = T)
## Warning in read.spss(file = "Koweps_hpwc17_2022_beta1.sav", to.data.frame = T):
## Koweps_hpwc17_2022_beta1.sav: Compression bias (0) is not the usual value of
## 100
## Warning in read.spss(file = "Koweps_hpwc17_2022_beta1.sav", to.data.frame = T):
## Koweps_hpwc17_2022_beta1.sav: Very long string record(s) found (record type 7,
## subtype 14), each will be imported in consecutive separate variables
welfare <- raw_welfare
welfare <- welfare %>% select(marriage = h17_g10, #혼인상태
sex = h17_g3, #성별
age = h17_g4, #태어난 연도
health = p1703_5, #건강상태 만족도
home = p1703_7, #주거 환경 만족도
social = p1703_10, #사회적 친분관계 만족
leisure = p1703_11, #여가생활 만족
fail = p1705_22, #나는 실패한 사람이라는 느낌이 든다
family = p1705_aq1, #가족생활 만족도
lonely = p1705_14, #외로움
sad = p1705_17, #마음이 슬펐다
income = p1702_8aq1) #일한달의 월 평균 임금
위의 데이터들은 복지패널 데이터 중 내가 사용할 데이터를 가져와 보기 편한 이름으로 바꾼 것이다.
결측치가 없는 것을 확인한 후 데이터를 가공했다. 혼인상태 데이터에 6가지의 혼인상태가 포함되어 있기 때문에 ’1.유배우’와 ’5.미혼’만 추출한 뒤 알아보기 쉽게 이름을 붙여주었다. 두 변수에 18세 이상이라는 전제가 깔려있기 때문에 나이는 따로 처리하지 않았다.
#혼인여부
table(is.na(welfare$marriage))
##
## FALSE
## 16591
welfare <- welfare %>%
filter(welfare$marriage %in% c(1,5))
welfare$marriage <- ifelse(welfare$marriage == 1, "결혼", "미혼")
table(welfare$marriage)
##
## 결혼 미혼
## 8500 2654
성별변수 역시 같은 과정을 반복했다.
#성별
table(is.na(welfare$sex))
##
## FALSE
## 11154
welfare$sex <- ifelse(welfare$sex == 1, "male", "female")
table(welfare$sex)
##
## female male
## 5433 5721
잠시 연령 별 혼인율을 살펴보았다.
qplot(welfare$age, fill = welfare$marriage)
## Warning: `qplot()` was deprecated in ggplot2 3.4.0.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
나이가 많을수록 혼인율이 높고 나이가 어릴수록 혼인율이 낮은 것을 알 수 있다. 따라서 단순히 결혼/미혼으로만 집단을 나눈다면 나이라는 변수가 의도치 않게 영향을 미칠 수도 있다고 판단되었다. 결혼한 사람과 안 한 사람의 비율이 가장 비슷하고, 결혼에 대한 고민이 가장 많을 것으로 예상되는 30대를 표본집단으로 설정할 것이다.
태어난 연연도는 나이로 바꿔주고 나이를 30대로 제한하였다. 소득을 비교할 때는 모든 연령이 필요하기 때문에 welfare는 남겨두고 30대만 포함하는 welfare_new를 새로 만들었다.
welfare<- welfare %>%
mutate(age_new = 2023 - welfare$age + 1)
welfare_new <- welfare %>%
filter(age_new >30 & age_new <40)
가족생활 만족도 변수의 경우’0’은 ’비해당’이기 때문에 필터를 사용해 제외했다.
#가족생활 만족도
welfare_new <- welfare_new %>% filter(family != 0)
table(welfare_new$family)
##
## 1 2 3 4 5 6 7 9
## 7 7 17 108 102 594 209 80
소득의 극단치를 제거했다. welfare와 welfare_new 둘 다 진행했다.
boxplot(welfare_new$income)$stats
## [,1]
## [1,] 29
## [2,] 230
## [3,] 295
## [4,] 376
## [5,] 594
welfare_new$income <- ifelse(welfare_new$income < 29 | welfare_new$income > 594, NA, welfare_new$income)
boxplot(welfare$income)$stats
## [,1]
## [1,] 0
## [2,] 176
## [3,] 260
## [4,] 393
## [5,] 718
welfare$income <- ifelse(welfare$income > 718, NA, welfare$income)
결측치를 제거하고 결혼한 사람과 미혼인 사람의 소득을 비교해보았다. 성별에 따라 차이가 있을 것으로 예상됐기 때문에 남성과 여성으로 구분하였다.
welfare <- welfare %>% filter(!is.na(welfare$income))
table(is.na(welfare$income))
##
## FALSE
## 4491
welfare_income <- welfare %>%
group_by(marriage, sex) %>%
summarise(mean_income = mean(income))
## `summarise()` has grouped output by 'marriage'. You can override using the
## `.groups` argument.
welfare_income
## # A tibble: 4 × 3
## # Groups: marriage [2]
## marriage sex mean_income
## <chr> <chr> <dbl>
## 1 결혼 female 206.
## 2 결혼 male 346.
## 3 미혼 female 241.
## 4 미혼 male 275.
남성의 경우 기혼집단이 미혼집단에 비해 약 70만원 정도 평균 소득이 높다. 여성의 경우 미혼집단이 기혼집단에 비해 약 35만원 정도 평균 소득이 높다.
<만족도>
만족도를 나타내는
건강 상태 만족도, 3. 주거환경 만족도, 4. 사회적 친분관계 만족도, 5. 여가생활 만족도, 6. 가족생활 만족도는 모두 같은 방식으로 데이터를 분석했다. 결측치를 제거하고 항목별 응답 빈도를 계산한 후에 항목별 비율을 계산했다. 이 모든 과정은 기혼집단과 미혼집단을 구분하여 진행했다. 또한 low, medium, high 세 단계로 만족도를 구분하여 알아보기 쉽게 표시했다.
건강상태 만족도
table(is.na(welfare_new$health))
##
## FALSE TRUE
## 1044 80
health_new <- welfare_new %>%
filter(health != 9) %>%
count(health, marriage)
health_new <- health_new %>%
filter(!is.na(health_new$health))
health_new <- health_new %>%
mutate(ratio = ifelse(marriage=="결혼", n/483*100, n/561*100)) %>%
mutate(satis = ifelse(health_new$health <= 2, "low_satis",
ifelse(health_new$health == 3, "medium_satis", "high_satis")))
health_new
## health marriage n ratio satis
## 1 1 결혼 4 0.8281573 low_satis
## 2 1 미혼 5 0.8912656 low_satis
## 3 2 결혼 24 4.9689441 low_satis
## 4 2 미혼 45 8.0213904 low_satis
## 5 3 결혼 84 17.3913043 medium_satis
## 6 3 미혼 96 17.1122995 medium_satis
## 7 4 결혼 330 68.3229814 high_satis
## 8 4 미혼 366 65.2406417 high_satis
## 9 5 결혼 41 8.4886128 high_satis
## 10 5 미혼 49 8.7344029 high_satis
table(is.na(welfare_new$home))
##
## FALSE TRUE
## 1044 80
home_new <- welfare_new %>%
filter(home != 9) %>%
count(home, marriage)
home_new <- home_new %>%
filter(!is.na(home_new$home))
home_new <- home_new %>%
mutate(ratio = ifelse(marriage=="결혼", n/483*100, n/561*100)) %>%
mutate(satis = ifelse(home_new$home <= 2, "low_satis",
ifelse(home_new$home == 3, "medium_satis", "high_satis")))
home_new
## home marriage n ratio satis
## 1 1 결혼 1 0.2070393 low_satis
## 2 1 미혼 4 0.7130125 low_satis
## 3 2 결혼 20 4.1407867 low_satis
## 4 2 미혼 57 10.1604278 low_satis
## 5 3 결혼 95 19.6687371 medium_satis
## 6 3 미혼 143 25.4901961 medium_satis
## 7 4 결혼 324 67.0807453 high_satis
## 8 4 미혼 320 57.0409982 high_satis
## 9 5 결혼 43 8.9026915 high_satis
## 10 5 미혼 37 6.5953654 high_satis
table(is.na(welfare_new$social))
##
## FALSE TRUE
## 1044 80
social_new <- welfare_new %>%
filter(social != 9) %>%
count(social, marriage)
social_new <- social_new %>%
filter(!is.na(social_new$social))
social_new <- social_new %>%
mutate(ratio = ifelse(marriage=="결혼", n/483*100, n/561*100)) %>%
mutate(satis = ifelse(social_new$social <= 2, "low_satis",
ifelse(social_new$social == 3, "medium_satis", "high_satis")))
social_new
## social marriage n ratio satis
## 1 1 결혼 3 0.6211180 low_satis
## 2 1 미혼 2 0.3565062 low_satis
## 3 2 결혼 11 2.2774327 low_satis
## 4 2 미혼 20 3.5650624 low_satis
## 5 3 결혼 70 14.4927536 medium_satis
## 6 3 미혼 134 23.8859180 medium_satis
## 7 4 결혼 366 75.7763975 high_satis
## 8 4 미혼 354 63.1016043 high_satis
## 9 5 결혼 33 6.8322981 high_satis
## 10 5 미혼 51 9.0909091 high_satis
table(is.na(welfare_new$leisure))
##
## FALSE TRUE
## 1044 80
leisure_new <- welfare_new %>%
filter(leisure != 9|0) %>%
count(leisure, marriage)
leisure_new <- leisure_new %>%
filter(!is.na(leisure_new$leisure))
leisure_new <- leisure_new %>%
mutate(ratio = ifelse(marriage=="결혼", n/483*100, n/561*100)) %>%
mutate(satis = ifelse(leisure_new$leisure <= 2, "low_satis",
ifelse(leisure_new$leisure == 3, "medium_satis", "high_satis")))
leisure_new
## leisure marriage n ratio satis
## 1 1 결혼 7 1.4492754 low_satis
## 2 1 미혼 4 0.7130125 low_satis
## 3 2 결혼 46 9.5238095 low_satis
## 4 2 미혼 66 11.7647059 low_satis
## 5 3 결혼 160 33.1262940 medium_satis
## 6 3 미혼 194 34.5811052 medium_satis
## 7 4 결혼 255 52.7950311 high_satis
## 8 4 미혼 268 47.7718360 high_satis
## 9 5 결혼 15 3.1055901 high_satis
## 10 5 미혼 29 5.1693405 high_satis
table(is.na(welfare_new$family))
##
## FALSE
## 1124
family_new <- welfare_new %>%
filter(family != 9|0) %>%
count(family, marriage)
family_new <- family_new %>%
mutate(ratio = ifelse(marriage=="결혼", n/483*100, n/561*100)) %>%
mutate(satis = ifelse(family_new$family <= 3, "low_satis",
ifelse(family_new$family == 4, "medium_satis", "high_satis")))
family_new
## family marriage n ratio satis
## 1 1 결혼 4 0.8281573 low_satis
## 2 1 미혼 3 0.5347594 low_satis
## 3 2 결혼 2 0.4140787 low_satis
## 4 2 미혼 5 0.8912656 low_satis
## 5 3 결혼 3 0.6211180 low_satis
## 6 3 미혼 14 2.4955437 low_satis
## 7 4 결혼 23 4.7619048 medium_satis
## 8 4 미혼 85 15.1515152 medium_satis
## 9 5 결혼 38 7.8674948 high_satis
## 10 5 미혼 64 11.4081996 high_satis
## 11 6 결혼 273 56.5217391 high_satis
## 12 6 미혼 321 57.2192513 high_satis
## 13 7 결혼 140 28.9855072 high_satis
## 14 7 미혼 69 12.2994652 high_satis
<건강상태>
건강상태를 나타내는
외로움, 8. 슬픔, 9. 실패한 사람이라는 생각 항목 역시 같은 과정으로 데이터를 분석했다.
외로움
table(is.na(welfare_new$lonely))
##
## FALSE
## 1124
lonely_new <- welfare_new %>%
filter(lonely != 9) %>%
count(lonely, marriage)
lonely_new <- lonely_new %>%
mutate(ratio = ifelse(marriage=="결혼", n/483*100, n/561*100)) %>%
mutate(lonely_feel = ifelse(lonely_new$lonely ==1, "low_feel",
ifelse(lonely_new$lonely == 2, "medium_feel", "high_feel")))
lonely_new
## lonely marriage n ratio lonely_feel
## 1 1 결혼 448 92.7536232 low_feel
## 2 1 미혼 479 85.3832442 low_feel
## 3 2 결혼 25 5.1759834 medium_feel
## 4 2 미혼 67 11.9429590 medium_feel
## 5 3 결혼 7 1.4492754 high_feel
## 6 3 미혼 13 2.3172906 high_feel
## 7 4 결혼 3 0.6211180 high_feel
## 8 4 미혼 2 0.3565062 high_feel
table(is.na(welfare_new$sad))
##
## FALSE
## 1124
sad_new <- welfare_new %>%
filter(sad != 9) %>%
count(sad, marriage)
sad_new <- sad_new %>%
mutate(ratio = ifelse(marriage=="결혼", n/483*100, n/561*100)) %>%
mutate(sad_feel = ifelse(sad_new$sad ==1, "low_feel",
ifelse(sad_new$sad == 2, "medium_feel", "high_feel")))
sad_new
## sad marriage n ratio sad_feel
## 1 1 결혼 428 88.6128364 low_feel
## 2 1 미혼 476 84.8484848 low_feel
## 3 2 결혼 46 9.5238095 medium_feel
## 4 2 미혼 66 11.7647059 medium_feel
## 5 3 결혼 6 1.2422360 high_feel
## 6 3 미혼 16 2.8520499 high_feel
## 7 4 결혼 3 0.6211180 high_feel
## 8 4 미혼 3 0.5347594 high_feel
table(is.na(welfare_new$fail))
##
## FALSE
## 1124
fail_new <- welfare_new %>%
filter(fail != 9) %>%
count(fail, marriage)
fail_new <- fail_new %>%
mutate(ratio = ifelse(marriage=="결혼", n/505*100, n/619*100)) %>%
mutate(fail_feel = ifelse(fail_new$fail ==1, "low_feel",
ifelse(fail_new$fail == 2, "medium_feel", "high_feel")))
fail_new
## fail marriage n ratio fail_feel
## 1 1 결혼 436 86.3366337 low_feel
## 2 1 미혼 448 72.3747981 low_feel
## 3 2 결혼 38 7.5247525 medium_feel
## 4 2 미혼 91 14.7011309 medium_feel
## 5 3 결혼 8 1.5841584 high_feel
## 6 3 미혼 20 3.2310178 high_feel
## 7 4 결혼 1 0.1980198 high_feel
## 8 4 미혼 2 0.3231018 high_feel
혼인여부에 따른 소득을 비교하기 위해 여성과 남성으로 구분했다. 연속적인 변수인 나이에 따른 소득을 살펴보기 위해 선그래프를 사용했다.
f <- welfare %>%
filter(sex == "female") %>%
group_by(age_new, marriage) %>%
summarise(mean_income = mean(income))
## `summarise()` has grouped output by 'age_new'. You can override using the
## `.groups` argument.
ggplot(data = f, aes(x = age_new, y = mean_income, col = marriage)) + geom_line() +
ggtitle("여성의 혼인 여부와 소득 관계")+
scale_color_manual(values = c("lightskyblue4", "violetred4"))+
theme(plot.title = element_text(face = "bold",
size = 20))
먼저, 여성의 그래프이다. 선 그래프로 확인하였을 때 기혼여성과 미혼 여성의 소득 차이에서 유의미한 결과를 도출할 수는 없었다. 다만, 미혼 여성의 경우 나이에 따른 소득 편차가 크고 기혼 여성은 나이에 따른 소득 편차가 안정적인 경향을 확인하였다. 또한 두 집단 모두 나이가 들수록 소득이 감소했다.
m <- welfare %>%
filter(sex == "male") %>%
group_by(age_new, marriage) %>%
summarise(mean_income = mean(income))
## `summarise()` has grouped output by 'age_new'. You can override using the
## `.groups` argument.
ggplot(data = m, aes(x = age_new, y = mean_income, col = marriage)) + geom_line() +
ggtitle("남성의 혼인 여부와 소득 관계")+
scale_color_manual(values = c("lightskyblue4", "violetred4"))+
theme(plot.title = element_text(face = "bold",
size = 20))
여성과 다르게 남성의 경우 혼인여부 별 소득 편차가 상당히 컸다. 기혼 남성이 미혼 남성에 비해 모든 연령대에서 평균 소득이 높다는 것을 알 수 있다. 선그래프를 사용하였기 때문에 나이가 들수록 소득이 감소하는 경향을 확인할 수 있다. 이는 여성에게도 나타났듯이 혼인 여부와 상관없이 공통적인 특징이다.
welfare_marriage <- welfare %>%
group_by(marriage, sex) %>%
summarise(mean_income = mean(income))
## `summarise()` has grouped output by 'marriage'. You can override using the
## `.groups` argument.
ggplot(data = welfare_marriage , aes(x = sex, y = mean_income, fill = marriage)) +
geom_col(position = "dodge") + ggtitle("남성과 여성의 혼인 여부와 소득 관계")+
scale_fill_manual(values = c("lightskyblue3", "violetred4"))+
theme(plot.title = element_text(face = "bold",
size = 20))
선그래프를 사용하면 연령대별 소득을 알 수 있어서 유용했지만 전체적인 평균값은 비교할 수 없었다. 따라서 막대그래프를 이용해서 전체적인 평균 소득을 비교해 보았다 역시나 선그래프를 통해서는 확인하기 어려웠던 결과가 여성에게서 나타났다. 여성의 경우 미혼여성이 기혼여성보다 평균소득이 높지만 남성의 경우 앞서 확인했듯 기혼남성이 미혼남성에 비해 평균소득이 높았다.
ggplot(data = health_new, aes(x = satis, y = ratio, fill = marriage)) +
geom_col(position = "dodge")+
ggtitle("혼인 여부별 건강 상태 만족도")+
scale_fill_manual(values = c("yellowgreen", "yellow3"))+
theme(plot.title = element_text(face = "bold",
size = 20))
ggplot(data = home_new, aes(x = satis, y = ratio, fill = marriage)) +
geom_col(position = "dodge")+
ggtitle("혼인 여부별 주거 환경 만족도")+
scale_fill_manual(values = c("yellowgreen", "yellow3"))+
theme(plot.title = element_text(face = "bold",
size = 20))
ggplot(data = social_new, aes(x = satis, y = ratio, fill = marriage)) +
geom_col(position = "dodge")+
ggtitle("혼인 여부별 사회적 친분 관계 만족도")+
scale_fill_manual(values = c("yellowgreen", "yellow3"))+
theme(plot.title = element_text(face = "bold",
size = 20))
ggplot(data = leisure_new, aes(x = satis, y = ratio, fill = marriage)) +
geom_col(position = "dodge")+
ggtitle("혼인 여부별 여가 생활 만족도")+
scale_fill_manual(values = c("yellowgreen", "yellow3"))+
theme(plot.title = element_text(face = "bold",
size = 20))
ggplot(data = family_new, aes(x = satis, y = ratio, fill = marriage)) +
geom_col(position = "dodge")+
ggtitle("혼인 여부별 가족 생활 만족도")+
scale_fill_manual(values = c("yellowgreen", "yellow3"))+
theme(plot.title = element_text(face = "bold",
size = 20))
ggplot(data = lonely_new, aes(x = lonely_feel, y = ratio, fill = marriage)) +
geom_col(position = "dodge")+
ggtitle("혼인 여부별 외로움을 느끼는 정도")+
scale_fill_manual(values = c("lightskyblue3", "violetred4"))+
theme(plot.title = element_text(face = "bold",
size = 20))
ggplot(data = sad_new, aes(x = sad_feel, y = ratio, fill = marriage)) +
geom_col(position = "dodge")+
ggtitle("혼인 여부별 슬픔을 느끼는 정도")+
scale_fill_manual(values = c("lightskyblue3", "violetred4"))+
theme(plot.title = element_text(face = "bold",
size = 20))
ggplot(data = fail_new, aes(x = fail_feel, y = ratio, fill = marriage)) +
geom_col(position = "dodge")+
ggtitle("혼인 여부별 실패한 사람이라고 느끼는 정도")+
scale_fill_manual(values = c("lightskyblue3", "violetred4"))+
theme(plot.title = element_text(face = "bold",
size = 20))
정신 상태에 관한 항목의 응답들을 살펴보면 공통점을 찾을 수 있다. 3개의 항목 모두 high_feel은 미혼 집단이 높고 low_feel은 결혼집단이 높다는 것이다. 이는 미혼 집단이 부정적인 감정을 더 많이 느낀다는 것을 의미한다.
만족도 역시 high_satis는 결혼집단이 더 높고 low_satis는 미혼집단이 더 높았다. 단, 가족생활만족도 항목은 high_satis 응답의 경우 미혼 집단의 비율이 더 높았다. 이러한 결괏값으로는 ’결혼한 집단이 삶의 만족도가 더 높다’라라고 결론지을 수 없다. 따라서 모든 만족도 항목을 총합해 최종 만족도 그래프를 하나 더 그려볼 것이다. 결혼과 미혼을 더 쉽게 비교할 수 있도록 원 그래프를 사용할 것이다.
먼저, high_satis를 혼인여부에 따라 비교해보려고 한다. 비율의 합계 값을 구하여 더한 뒤 데이터프레임을 만들어서 넣어줬다.
combined_data <- bind_rows(health_new, home_new, social_new, leisure_new, family_new)
m_total_high_satis_sum <- combined_data %>%
filter(marriage == "결혼") %>%
filter(satis == "high_satis") %>%
summarise(high_satis_sum = sum(ratio))
n_total_high_satis_sum <- combined_data %>%
filter(marriage == "미혼") %>%
filter(satis == "high_satis") %>%
summarise(high_satis_sum = sum(ratio))
marriage <- c("결혼", "미혼")
ratio_sum <- c(384.6791, 343.672)
total_high_satis <- data.frame(marriage, ratio_sum)
ggplot(total_high_satis, aes(x = "", y = ratio_sum, fill = marriage)) +
geom_bar(stat = "identity") +
coord_polar(theta = "y") +
theme_void()+
ggtitle("'만족한다' 항목에 응답한 비율")+
scale_fill_manual(values = c("yellowgreen", "yellow3"))+
theme(plot.title = element_text(face = "bold",
size = 20))
그 결과, 결혼한 집단의 비율이 더 높았다.
low_satis 역시 원 그래프로 비교해보겠다.
m_total_low_satis_sum <- combined_data %>%
filter(marriage == "결혼") %>%
filter(satis == "low_satis") %>%
summarise(low_satis_sum = sum(ratio))
n_total_low_satis_sum <- combined_data %>%
filter(marriage == "미혼") %>%
filter(satis == "low_satis") %>%
summarise(low_satis_sum = sum(ratio))
marriage <- c("결혼", "미혼")
ratio_sum <- c(25.87992, 40.10695 )
total_low_satis <- data.frame(marriage, ratio_sum)
ggplot(total_low_satis, aes(x = "", y = ratio_sum, fill = marriage)) +
geom_bar(stat = "identity") +
coord_polar(theta = "y") +
theme_void()+
ggtitle("'불만족한다' 항목에 응답한 비율")+
scale_fill_manual(values = c("yellowgreen", "yellow3"))+
theme(plot.title = element_text(face = "bold",
size = 20))
역시 만족도가 낮다고 답한 집단은 미혼인 사람들의 비율이 더 높았다.
이 연구에서는 결혼과 비혼의 장단점을 소득, 만족도, 정신 건강 등의 측면에서 비교하였다. 결혼한 집단과 미혼인 집단 사이에는 분명한 차이가 있었다. 소득의 경우 여성은 미혼집단이, 남성은 기혼 집단이 더 높았다. 기혼남성은 가족을 부양하고 경제적 안정성을 도모하기 위해 경제적 책임을 질 가능성이 크다. 이와같은 사회적 인식과 현실적인 제약 때문에 경제적 안정성이 없다고 판단한 남성들이 결혼을 하지 않은 것일 수도 있고 결혼을 한 남성이 가정의 안정을 위해 더 높은 소득을 위해 노력한 결과일 수도 있다. 남성과 달리 미혼 여성이 기혼 여성보다 평균 소득이 높다는 것은 일반적으로 가사 및 육아에 집중하는 경향이 있기 때문일 수 있다. 또한 성공적인 경제적 독립을 달성하는 여성들이 늘어나고 있다는 것을 시사할 수도도 있다. 만족도의 경우 기혼자들은 건강, 주거 환경, 사회적 친분관계, 여가 생활 등 다양한 측면에서 만족도가 높게 나타났다. 가족관계만족도 항목만 예외가 있었지만 최종적인 만족도는 기혼집단이 높게 나타났다. 이는 결혼이 개인의 행복과 안정을 높일 수 있는 요인임을 시사한다. 정신건강의 경우 모든 항목에 대한 응답이 일관성을 가졌다. 외로움, 슬픔, 실패한 사람이라고 느끼는 정도 세 항목 모두 미혼인 집단이 이를 더 많이 느꼈다. 비혼인 사람들은 기혼인 사람들보다 정신 건강에 불안감이나 외로움을 느끼는 경우가 더 많다는 점을 알 수 있다.
위 연구 결과를 종합해보면, 결혼은 다양한 측면에서 삶의 만족도를 높일 수 있다는 장점을 가지고 있다. 하지만 결혼을 선택할지 여부는 개인의 상황과 성향에 따라 다를 수 있으며 이 연구의 결괏값은 통계자료일 뿐이다. 결혼은 개인의 삶에 큰 변화와 책임을 가져올 수 있으며, 미혼으로서의 자유와 독립성을 유지할 수 없다는 한계점 역시 가지고 있을 수 있기 때문에 신중하게 결정해야 할 것이다.