Project Description

Project Goal & Social Problem

Countries develop socially over the years and tend to develop by inferring from past crises. Although Turkey shows a trend in this direction, its social development has always been a matter of debate. We wanted to show what situation Turkey is in by visualizing the development of Turkey over the years, through the problems seen in the word cloud below, such as unemployment, literacy rate, and child workers.

Data Description

Data here cover child labor, gender issues, refugees, and asylum seekers. Children in many countries work long hours, often combining studying with work for pay. The data on their paid work are from household surveys conducted by the International Labour Organization (ILO), the United Nations Children’s Fund (UNICEF), the World Bank, and national statistical offices. Gender disparities are measured using a compilation of data on key topics such as education, health, labor force participation, and political participation. Data on refugees are from the United Nations High Commissioner for Refugees complemented by statistics on Palestinian refugees under the mandate of the United Nations Relief and Works Agency.

Access to data:

Data is a csv file.

Click here for accessing the data

Click here for download

Variables:

  • Country Name
  • Country ISO3
  • Year
  • Indicator Names (Adolescent fertility rate, Children in employment, Labor force participation rate, Labor force participation rate for ages 15-24, Life expectancy at birth, Literacy rate, Proportion of seats held by women in national parliaments, Refugee population by country or territory of asylum, Refugee population by country or territory of origin, School enrollment, Unemployment, Vulnerable employment)
  • Indicator Code
  • Value

School Enrollment Visualization Code

lit_rate = head(data, 17) # Subsetting for literacy rate data.
lit_rate <- lit_rate %>% mutate(score = ((3*(score-0.75207))/(1-0.75207))) 
# scaling range of geom_line

ggplot() +
  aes(x = date, y = score, fill = name, colour = name) +
  geom_area(data = data_school_env,datasize = 0.5, alpha = 0.9, colour = "white") +
  geom_line(data = lit_rate,
            aes(x = date, y = score),
            inherit.aes = F, # Because of using another data.
            colour = "#BF1363",
            size = 0.8) +
  scale_fill_brewer(palette = "Paired", direction = -1) +
  scale_color_brewer(palette = "Paired", direction = -1) +
  labs(
    x = "Years",
    y = "Score",
    title = "School Enrollment in Years",
    caption = "Graphic 1"
  ) +
  ggplot2::annotate("text", x=2016, y=3.1, label= "Literacy Rate", colour = "#BF1363") +
  theme_minimal() +
  theme(
    plot.title = element_text(
      size = 15L,
      face = "bold.italic",
      hjust = 0.5
    ),
    legend.position = "bottom",
    plot.caption = element_text(hjust = 0),
    axis.title.y = element_text(face = "bold"),
    axis.title.x = element_text(face = "bold"),
    legend.title = element_blank()
  ) 

Results and Discussion on School Enrollment in Years

This chart shows the enrollment rates in middle school, high school, and university, respectively. We can observe that the literacy rate in Turkey has been on an increasing trend since the 1970s. The main reason for this is that Turkey has to reach certain criteria during the membership process to the European Union.

Codes for Life Expectancy Variable

# Selecting required rows 
lifeexpectancy <- df %>%
  filter(df$words == "Life Expectancy") 

lifeexpectancy <- lifeexpectancy %>% 
  mutate(words = case_when(lifeexpectancy$id <= 807 ~ "Female",
                           lifeexpectancy$id >= 808  ~ "Male"))
lifeexpectancy_female <- lifeexpectancy  %>%
  filter(lifeexpectancy$words == "Female")
lifeexpectancy_male <- lifeexpectancy  %>%
  filter(lifeexpectancy$words == "Male")
lifeexpectancy %>%
  ggplot( aes(x=date, y=score, group=words, color=words)) +
  geom_line() +
  scale_color_viridis(discrete = TRUE) +
  labs(title = "Life Expectancy", x = "Year", y ="Life Span") +
  scale_colour_manual(values = c("#F44D5C", "#1E8FCB")) +
  theme_minimal() +
  theme( 
    plot.title = element_text(
      size = 15L,
      face = "bold.italic",
      hjust = 0.5
    ),
    legend.position = "bottom",
    plot.caption = element_text(hjust = 0),
    axis.title.y = element_text(face = "bold"),
    axis.title.x = element_text(face = "bold"),
    legend.title = element_blank()
)

Results and Discussion on Life Expactancy

Indexes have been developed to measure Social Development. One of these indexes is Life Expectancy. When we look at the Life Expectancy in Turkey, there is a noticeable high increase. Positive developments in the world and in Turkey have led to an increase in life expectancy. Life Expectancy, which was below 50 in 1960, is now 70 for men and over 80 for women.

Codes For Faceted Graphs

# Selecting and filtering required rows.
unemployment <- df %>%
  filter(df$words == "Unemployment") 
unemployment  <- unemployment  %>% 
  mutate(words = case_when(unemployment$id <= 558 ~ " Unemployment Female", 
                           unemployment$id >= 559  ~ "Unemployment Male"))
# Tidying data for using in faceting.
vul_employment <- data %>%
  mutate(id = c(1:866)) %>%
  select("indicator.name", "date","score", "id") %>% 
  filter((id >= 214 & id <= 587)) %>%
  filter(!(id >= 272 & id <= 529))
vul_employment <- vul_employment %>%
  mutate(gender = case_when(vul_employment$id <= 242 ~ "Female",
                            vul_employment$id >242 & vul_employment$id <= 271 ~ "Male",
                            vul_employment$id >= 272 & vul_employment$id <= 558 ~ "Female",
                            vul_employment$id >= 559 ~ "Male"))
  
                                            
labs <- c("Female Unemployment (standardized)", 
          "Male Unemployment (standardized)", 
          "Female Vulnerable Employment (standardized)", 
          "Male Vulnerable Employment (standardized)")

names(labs) <- c("Unemployment, female (% of female labor force) (modeled ILO estimate)", 
"Unemployment, male (% of male labor force) (modeled ILO estimate)",
"Vulnerable employment, female (% of female employment) (modeled ILO estimate)", 
"Vulnerable employment, male (% of male employment) (modeled ILO estimate)")

ggplot( vul_employment , aes(x=date, y=score, color = gender)) + 
  geom_line() +  
  facet_wrap(~indicator.name, labeller = labeller(indicator.name = labs)) + # faceting
  theme_minimal() +
  labs(x = "Year", y ="Percentage") +
  theme(legend.position="none",
        plot.title = element_text(
      size = 15L,
      face = "bold.italic",
      hjust = 0.5
    ),
    plot.caption = element_text(hjust = 0),
    axis.title.y = element_text(face = "bold"),
    axis.title.x = element_text(face = "bold"),
  )

Results and Discussion on Vulnerable Employment

Vulnerable Employment, defined as uninsured and unsafe work, has decreased over the years. Thus, progress has been made. There appears to be a small increase in women in 2009. We think that the reason for this increase is the economic crisis that took place in 2009.

Code For Unemployment Graph

unemployment %>%
  ggplot(aes(x=date, y=score, group=words, color=words)) +
  geom_line() +
  scale_color_viridis(discrete = TRUE) +
  labs(title = "Unemployment", x = "Year", y ="Unemployment %")+
  scale_colour_manual(values = c("#F44D5C", "#1E8FCB")) +
  theme_minimal() +
  theme( 
    plot.title = element_text(
      size = 15L,
      face = "bold.italic",
      hjust = 0.5
    ),
    legend.position = "bottom",
    plot.caption = element_text(hjust = 0),
    axis.title.y = element_text(face = "bold"),
    axis.title.x = element_text(face = "bold"),
    legend.title = element_blank()
)

Results and Discussion on Unemployment

One of the Social Development indexes is the unemployment rate. Due to various events in Turkey, the unemployment rate varies sharply over the years. Due to the crisis in 2009, the unemployment rate increased sharply. Afterwards, it decreased for a short time, but unemployment started to increase due to the decrease in Turkey’s growth rate. Increasing population and lack of sufficient job opportunities also led to an increase in unemployment. In addition, the unemployment rate of women has increased faster than men in recent years. We think the reason for this is political reasons.

Code For Labor Force Participation Graph

# Selecting required rows
laborforce <- df %>%
  filter(df$words == "Labor Force Participation") 

laborforce  <- laborforce  %>% 
  mutate(words = case_when(laborforce$id <= 319 ~ " 14-25 Age Laborforce Female",
                        laborforce$id >= 320 & laborforce$id <= 349  ~ "14-25 Age Laborforce Male",
                        laborforce$id >= 350 & laborforce$id <= 379 ~ "14-25 age Total",
                        laborforce$id >= 380 & laborforce$id <= 409 ~ "15-64 Age Laborforce Female",
                        laborforce$id >= 410 & laborforce$id <= 439 ~ "15-64 Age Laborforce Male",
                        laborforce$id >= 440 & laborforce$id <= 469 ~ "15-64 Age Laborforce Total",
                        laborforce$id >= 470 & laborforce$id <= 499 ~ "Laborforce Female Total",
                        laborforce$id >= 500 ~ "Laborforce Male Total"))

# Visualizing by using ggplot
laborforce %>%
  ggplot( aes(x=date, y=score, group=words, color=words)) +
  geom_line() +
  labs(title = "Laborforce Rate", x = "Year", y ="Rate %")+
  scale_colour_manual(values = c("#F44D5C", "#1E8FCB","#01937C","#E798AE", 
                                 "#04009A","#064420","#FFBBCC","#77ACF1" )) +
  theme_minimal() +
  theme( 
      legend.text = element_text(size = 8),
      plot.title = element_text(
      size = 15L,
      face = "bold.italic",
      hjust = 0.5
    ),
    plot.caption = element_text(hjust = 0),
    axis.title.y = element_text(face = "bold"),
    axis.title.x = element_text(face = "bold"),
    legend.title = element_blank()
)

Results and Discussion on Labor Force

The labor force participation rate of men is higher than that of women. Although there are various fluctuations over the years, the labor force participation rate of the young population is decreasing. The reason for this may be that young people continue their education and start working later. While female labor force participation decreased until 2005, it seems to increase after 2005. The increase in the education rate of women may also be a reason for the increase in their participation in the workforce.

Results and Discussion on Refugee Population

While the asylum-seeking refugee population was progressing in its normal course, the intense refugee influx that started in 2011 caused a sharp increase in the number of refugees in the country. Since the war situation in Syria has not ended, the number of refugees has increased over the years.

Codes For ‘Woman in Parliaments’ Chart

womeninparliaments <- data %>%
  filter(df$words == "Woman in Parliaments") 

ggplot(womeninparliaments, aes(x=date, y=score)) +
  geom_area( fill="#F5C0C0", alpha=0.6) +
  geom_line(color="#FF7171", size=1) +
  geom_point(size=1.5, color="#FF7171") +
    theme_minimal() +
  scale_color_viridis(discrete = TRUE) +
  labs(title = "Woman in Parliaments", x = "Year", y ="Rate %")+
  theme( legend.text = element_text(size = 8),
    legend.position="bottom",
        plot.title = element_text(
      size = 15L,
      face = "bold.italic",
      hjust = 0.5
    ),
    plot.caption = element_text(hjust = 0),
    axis.title.y = element_text(face = "bold"),
    axis.title.x = element_text(face = "bold"),
    legend.title = element_blank()
    )

Results and Discussion on Woman in Parliaments

The proportion of women in parliament has increased with each election. Over the years, women have had a greater say in the administration of the country. Stable places on the chart are when there is no election. Small decreases in stable places are the resignations of parliamentarians, etc. for such reasons.



Actions Taken

Importing

We load our dataset ‘datasets/social-development_tur.csv’ into a DataFrame and assign it to a variable. While doing these, also changed colume names of the data frame.

Reshaping and cleaning

We assigned an ID for each row to make our job easier. After that we simplified the values of ‘words’ and column a bit by using case_when in a mutate function. Also, our data had some missing values, instead of deleting this missing values we filled out these values by using statistical methods for ‘Chart 1’.

Visualizing

  • Graph 1: Stacked area graph used for visualizing ‘School Enrollment in Years’ graph. Also, for a better aestethic we used RColorbrewer library palettes.

  • Graph 2: We used multi groups line chart with ggplot2 library for visualizing both female and male ‘Life Expactancy’.

  • Graph 3: We used multi groups line chart with ggplot2 library for visualizing both female and male ‘Unemployment Rate’.

Conclusion

According to the inferences we have made from the tables, while Turkey has shown social development in certain areas, it has not shown any improvement in certain areas. If we interpret all the tables as a whole, we can see that Turkey shows social development. Turkey made significant progress over the past 29 years in this index as a measure of human development. Turkey’s HDI value was 0.583 in 1990, and increased by 40.7 percent to 0.820 in 2019. When we look at the human development indexes, we see that a person living in Turkey does not have difficulty in her/his management of basic needs, but prevents her/his from reaching a self-confident socioeconomic level by developing and working. When evaluated in general, life expectancy, literacy rate, school enrollment rate increased and showed a good development. On the other hand, unemployment has risen and the labor force has declined, although fluctuating. In addition, there has been an intense influx of refugees since 2011.

References

[1] TUIK. (2021, February). Adrese Dayalı Nüfus Kayıt Sistemi Sonuçları. Retrieved on 15 May 2021 from https://data.tuik.gov.tr/Bulten/Index?p=Adrese-Dayali-Nufus-Kayit-Sistemi-Sonuclari-2020-37210

[2] Directorate for EU Affairs.(2020, March) CHRONOLOGY OF TURKEY- EUROPEAN UNION RELATIONS Retrieved on 15 May 2021 from https://www.ab.gov.tr/siteimages/birimler/kpb/chronology-_en-_1959-_ocak2020.pdf

[3] United Nations Development Programme. (2020, December) Turkey is in the top human development category for the second time in the Human Development Index. Retrieved on 15 May 2021 from https://www.tr.undp.org/content/turkey/en/home/presscenter/articles/2020/12/hdr-2020.html

[4] TEPAV. (2014, June) Sosyal Gelişme Endeksi Türkiye İçin Ne İfade Ediyor? Retrieved on 15 May 2021 from https://www.tepav.org.tr/upload/files/1403700250-6.Sosyal_Gelisme_Endeksi_Turkiye_Icin_Ne_Ifade_Ediyor.pdf

[5] from Data to Viz. (2018). Retrieved from https://www.data-to-viz.com/

[6] stackoverflow. (2011). Case Statement Equivalent in R. Retrieved from https://stackoverflow.com/questions/4622060/case-statement-equivalent-in-r

[7] Spotlight on Work Statistics. (2018) Retrieved from https://www.ilo.org/wcmsp5/groups/public/---dgreports/---stat/documents/publication/wcms_631497.pdf