How does being a participant in the labor force affect the Human Development Index (HDI) for females?
GII <- GII %>% mutate_at(c('GII VALUE', 'GII RANK','Maternal_mortality','Adolescent_birth_rate','Seats_parliamentt(% held by women)','F_secondary_educ','M_secondary_educ','F_Labour_force','M_Labour_force'), as.numeric) #convert columns to numeric
GII$F_Labour_force <-as.numeric(GII$F_Labour_force)
F1 <- aggregate(F_Labour_force ~ `HUMAN DEVELOPMENT`, data = GII, median)
barplot(with(F1,setNames(F_Labour_force,`HUMAN DEVELOPMENT`)),main="Female Labor Force vs. Human Development",xlab = "Human Development", ylab ="% of Females in Labor Force", col=coul1)
The above visualization shows that for females that if you are considered “LOW” on the human development stage, that you are more than likely to be participate in the labor force. Obviously without a more in depth analysis this could mean little because the visual also shows that the people who have “VERY HIGH” HDI, also participate in the labor force more, but not as much as the “LOW”
How does human development effect the GII Value (Gender Inequality Index) for both males and females?
F1 <- aggregate(`GII VALUE` ~ `HUMAN DEVELOPMENT`, data = GII, median)
barplot(with(F1,setNames(`GII VALUE`,`HUMAN DEVELOPMENT`)),main="GII VALUE vs. Human Development",xlab = "Human Development", ylab ="GII VALUE", col=coul1)
GII$`GII VALUE` <-as.numeric(GII$`GII VALUE`)
F2 <- aggregate(`GII VALUE` ~ `HUMAN DEVELOPMENT`, data = GII, median)
barplot(with(F2,setNames(`GII VALUE`,`HUMAN DEVELOPMENT`)),main="GII VALUE vs. Human Development",xlab = "Human Development", ylab ="GII VALUE", col=coul2)
Using the visualization above for both males and females, the GII value(Gender Inequality Index) is considerably high when the human development is lower.
Does having a high birth rate effect the level of education that females receive?
How does the human development effect the level of education that females received?
Does human development contribute to a lower adolescent birth rate?
p <- ggplot(GII, aes(x = Adolescent_birth_rate , y = F_secondary_educ , col = `HUMAN DEVELOPMENT`)) +
geom_point() +
labs(x = "Adolescent Birth Rate", y = "Female Secondary Education Rate",
title = "Female Education vs. Adolescent Birth Rate",
caption = "Voronyak 2023") +
theme(plot.title = element_text(hjust = 0.5), plot.subtitle = element_text(hjust = 0.5))
p
It appears that the higher the birth rate the lower the education rate
is.
We can also see that as the lower human development shows that there is a lower education rate.
Lastly, if the human development rate is low, there seems to be a lot higher adolescent birth rate.
Does having a smaller adolescent birth rate help female mortality?
p <- ggplot(GII, aes(x = Maternal_mortality , y = Adolescent_birth_rate , col = `HUMAN DEVELOPMENT`)) +
geom_point() +
labs(x = "Maternal Mortality Ratio", y = "Adolescent Birth Rate",
title = "Adolescent Birth Rate vs. Maternal Mortality Ratio",
caption = "Voronyak 2023") +
theme(plot.title = element_text(hjust = 0.5), plot.subtitle = element_text(hjust = 0.5))
p
It appears as the adolescent birth rate is smaller, the meternal morality rate is also lower. You can also see that the higher human development also appears to play a role in this.