Sys.setlocale(category = "LC_ALL", locale = "Hebrew_Israel.1255")
## [1] "LC_COLLATE=Hebrew_Israel.1255;LC_CTYPE=Hebrew_Israel.1255;LC_MONETARY=Hebrew_Israel.1255;LC_NUMERIC=C;LC_TIME=Hebrew_Israel.1255"
knitr::opts_chunk$set(message = FALSE)
library(haven)
library(ggplot2)
library(reshape2)
library(ggthemes)
library(dplyr)
library(qualtRics)
library(tidyr)
library(stringr)
library(gridExtra)
library(scales)
library(gtsummary)
#read data with qualtRics 
data <- read_spss("survey_5.3.2023.sav")

#create a new dataset with combined variables for men and women
new_data <- data[, 1:19]


#combine variables for men and women
new_data$Q2 <- coalesce(data$Q2_cs_filter, data$Q2_f)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1

#Q4 - influence past
new_data$Q4_1 <- coalesce(data$Q4_influence_past_1, data$Q4_f_influence_past_1)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q4_2 <- coalesce(data$Q4_influence_past_2, data$Q4_f_influence_past_2)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q4_3 <-coalesce(data$Q4_influence_past_3, data$Q4_f_influence_past_3)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7

#Q5 - influence future
new_data$Q5 <- coalesce(data$Q5_influence_future, data$Q5_f_influence_futur)

#Q6 - influence comments
new_data$Q6 <- coalesce(data$Q6_influence_comment, data$Q6_f_influence_comme)

#Q10 - meritocracy - past
new_data$Q10_1 <- coalesce(data$Q10_meritocracy_past_1, data$Q10_f_meritocracy_pa_1)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q10_2 <- coalesce(data$Q10_meritocracy_past_2, data$Q10_f_meritocracy_pa_2)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q10_3 <- coalesce(data$Q10_meritocracy_past_3, data$Q10_f_meritocracy_pa_3)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7

#Q11 - meritocracy - future
new_data$Q11 <- coalesce(data$Q11_meritocracy_futu, data$Q11_f_meritocracy_fu)

#Q12 - meritocracy - comments
new_data$Q12 <- coalesce(data$Q12_meritocracy_comm, data$Q12_f_meritocracy_co)

#Q13 - functioning - past
new_data$Q13 <- coalesce(data$Q13_functioning_poli,data$Q13_f_functioning_po)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, and 5

#Q14 - functioning - hr
new_data$Q14 <- coalesce(data$Q14_functioning_hr, data$Q14_f_functioni_hr)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, and 5

#Q15 - democratic decline - future expectations
new_data$Q15 <- coalesce(data$Q15_democracy_future, data$Q15_f_democracy_futu)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, and 999

#Q16 - democratic decline - protest
new_data$Q16_1 <- coalesce(data$Q16_democracy_1, data$Q16_f_democracy_1)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q16_2 <- coalesce(data$Q16_democracy_2, data$Q16_f_democracy_2)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q16_3 <- coalesce(data$Q16_democracy_3, data$Q16_f_democracy_3)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q16_4 <- coalesce(data$Q16_democracy_4, data$Q16_f_democracy_4)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q16_5 <- coalesce(data$Q16_democracy_5, data$Q16_f_democracy_5)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7

#Q17 - democratic decline - comments
new_data$Q17 <- coalesce(data$Q17_democracy_commen, data$Q17_f_democracy_comm) 

#Q19 - investment at work - past
new_data$Q19 <- coalesce(data$Q19_investment_past, data$Q19_f_investment_pa) 

#Q20 - investment at work - collegaues
new_data$Q20 <- coalesce(data$Q20_investment_compa, data$Q20_f_investment_com) 

#Q21 - investment at work - future
new_data$Q21 <- coalesce(data$Q21_investment_futur, data$Q21_f_investment_fut)

#Q21_a - investment at work - comments
new_data$Q21_a <- coalesce(data$Q21_comment, data$Q21_f_comment)

#Q22 - voice - past
new_data$Q22_1 <- coalesce(data$Q22_voice_past_1, data$Q22_f_voice_past_1)
new_data$Q22_2 <- coalesce(data$Q22_voice_past_2, data$Q22_f_voice_past_2)
new_data$Q22_3 <- coalesce(data$Q22_voice_past_3, data$Q22_f_voice_past_3)

#Q22_a - voice - collegaues
new_data$Q22_a <- coalesce(data$Q22a_voice_compare, data$Q22a_f_voice_compare)

#Q23 - voice - future
new_data$Q23 <- coalesce(data$Q23_voice_future, data$Q23_f_voice_future)

#Q24 - voice - comments
new_data$Q24 <- coalesce(data$Q24_voice_comment, data$Q24_f_voice_comment)

#Q25 - exit 
new_data$Q25 <- coalesce(data$Q25_CS_resign, data$Q25_f_CS_resign)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, and 5

#Q26 - exit - private sector's equal salary
new_data$Q26 <- coalesce(data$Q26_CS_resign_money, data$Q26_f_CS_resign_mone)

#Q27-  reutrn to CS
new_data$Q27 <- coalesce(data$Q27_CS_return_money, data$Q27_f_CS_return_mon)

#Q27_a- comments
new_data$Q27_a <- coalesce(data$Q27_comment, data$Q27_f_comment)

#Q28 - PSM
new_data$Q28_1 <- coalesce(data$Q28_PSM_1, data$Q28_f_PSM_1)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q28_2 <- coalesce(data$Q28_PSM_2, data$Q28_f_PSM_2)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q28_3 <- coalesce(data$Q28_PSM_3, data$Q28_f_PSM_3)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7
new_data$Q28_4 <- coalesce(data$Q28_PSM_4, data$Q28_f_PSM_4)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7

#Q29 - subotage
new_data$Q29_1 <- coalesce(data$Q29_subotage_1, data$Q29_f_subotage_1)
new_data$Q29_2 <- coalesce(data$Q29_subotage_2, data$Q29_f_subotage_2)
new_data$Q29_3 <- coalesce(data$Q29_subotage_3, data$Q29_f_subotage_3)
new_data$Q29_4 <- coalesce(data$Q29_subotage_4, data$Q29_f_subotage_4)
new_data$Q29_5 <- coalesce(data$Q29_subotage_5, data$Q29_f_subotage_5)
new_data$Q29_6 <- coalesce(data$Q29_subotage_6, data$Q29_f_subotage_6)
new_data$Q29_7 <- coalesce(data$Q29_subotage_7, data$Q29_f_subotage_7)
new_data$Q29_8 <- coalesce(data$Q29_subotage_8, data$Q29_f_subotage_8)
new_data$Q29_9 <- coalesce(data$Q29_subotage_9, data$Q29_f_subotage_9)

#Q29_a - subotage comments
new_data$Q29_a <- coalesce(data$Q29a_subotage_commen, data$Q29a_f_subotage_comm)

#Q31 - unit (if still works)
new_data$Q31 <- coalesce(data$Q31_unit, data$Q31_f_unit)

#Q31_a - unit (if still works) - other
new_data$Q31_a <- coalesce(data$Q31_unit_26_TEXT, data$Q31_f_unit_26_TEXT)

#Q32 - unit (if left)
new_data$Q32 <- coalesce(data$Q32_unit_left, data$Q32_f_unit_left)

#Q32_a - unit (if left) - other
new_data$Q32_a <- coalesce(data$Q32_unit_left_26_TEXT, data$Q32_unit_left_26_TEXT)

#Q33 - seniority (if still works)
new_data$Q33 <- coalesce(data$Q33_seniority, data$Q33_f_seniority)

#Q34 - seniority (if left)
new_data$Q34 <- coalesce(data$Q34_seniority_left, data$Q34_f_seniority_left)

#Q35 - appointing (if still works)
new_data$Q35 <- coalesce(data$Q35_appointing, data$Q35_f_appointing) 

#Q35_a - appointing (if still works) - other
new_data$Q35_a <- coalesce(data$Q35_appointing_4_TEXT, data$Q35_f_appointing_4_TEXT) 

#Q36 - appointing (if left)
new_data$Q36 <- coalesce(data$Q36_appointing_left, data$Q36_f_appointing_lef) 

#Q36_a - appointing (if left) - other
new_data$Q36_a <- coalesce(data$Q36_appointing_left_4_TEXT, data$Q36_f_appointing_lef_4_TEXT) 

#Q37 - percieved seniority (if still works)
new_data$Q37 <- coalesce(data$Q37_senior_per, data$Q37_f_senior_per) 

#Q38 - percieved seniority (if left)
new_data$Q38 <- coalesce(data$Q38_senior_per_left, data$Q38_f_senior_per_le) 

#Q39 - jewish
new_data$Q39 <- coalesce(data$Q39_jewish, data$Q39_f_jewish) 
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 0 and 1

#Q40 - age
new_data$Q40 <- coalesce(data$Q40_age, data$Q40_f_age) 

#Q41 - religion
new_data$Q41 <- coalesce(data$Q41_religion, data$Q41_f_religion) 
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 0, 1, 2, 3, and 4

#Q42 - education
new_data$Q42 <- coalesce(data$Q42_education, data$Q42_f_education)

#Q42_a - education - other
new_data$Q42_a <- coalesce(data$Q42_education_999_TEXT, data$Q42_f_education_999_TEXT)

#Q43 - education field
new_data$Q43 <- coalesce(data$Q43_education_field, data$Q43_f_education_fiel)

#Q44 - survey feelings
new_data$Q44 <- coalesce(data$Q44_feelings, data$Q44_f_feelings)

#Q45 - survey formulation
new_data$Q45 <- coalesce(data$Q45_common_method_va, data$Q45_f_common_meth_va)
## Warning: `..1` and `..2` have conflicting value labels.
## i Labels for these values will be taken from `..1`.
## x Values: 1, 2, 3, 4, 5, 6, and 7

Sabotage

Q29_1 <- as.data.frame(
  new_data %>%
    group_by(Q29_1) %>%
    filter(!is.na(Q29_1))%>%
    summarize(N = n()))

Q29_1_new <- Q29_1 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_1) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_1_new) +
  geom_bar(aes(factor(x=Q29_1), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_1), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("העמיתים שלי ינסו לעכב את יישום ההחלטה בניגוד")

Q29_2 <- as.data.frame(
  new_data %>%
    group_by(Q29_2) %>%
    filter(!is.na(Q29_2))%>%
    summarize(N = n()))

Q29_2_new <- Q29_2 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_2) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_2_new) +
  geom_bar(aes(factor(x=Q29_2), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_2), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("יפעלו מאחורי הקלעים לשכנע אחרים במשרד להימנע ככל שניתן מיישום ההחלטה")

Q29_3 <- as.data.frame(
  new_data %>%
    group_by(Q29_3) %>%
    filter(!is.na(Q29_3))%>%
    summarize(N = n()))

Q29_3_new <- Q29_3 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_3) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_3_new) +
  geom_bar(aes(factor(x=Q29_3), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_3), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("ידליפו מידע לתקשורת בדבר ההחלטה והנזקים שהיא עלולה לגרום")

Q29_4 <- as.data.frame(
  new_data %>%
    group_by(Q29_4) %>%
    filter(!is.na(Q29_4))%>%
    summarize(N = n()))

Q29_4_new <- Q29_4 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_4) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_4_new) +
  geom_bar(aes(factor(x=Q29_4), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_4), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("יפנו למשרדים אחרים בניסיון לשכנע את הגורמים שם להתערב ולמנוע את יישום ההחלטה")

Voice

Q29_5 <- as.data.frame(
  new_data %>%
    group_by(Q29_5) %>%
    filter(!is.na(Q29_5))%>%
    summarize(N = n()))

Q29_5_new <- Q29_5 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_5) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_5_new) +
  geom_bar(aes(factor(x=Q29_5), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_5), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("ינסו לשכנע את הדרגים הבכירים שאין מקום ליישם את ההחלטה")

Q29_6 <- as.data.frame(
  new_data %>%
    group_by(Q29_6) %>%
    filter(!is.na(Q29_6))%>%
    summarize(N = n()))

Q29_6_new <- Q29_6 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_6) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_6_new) +
  geom_bar(aes(factor(x=Q29_6), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_6), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("יעמדו על כך שהדרגים הבכירים יקשיבו למה שיש להם לומר על ההשלכות השליליות של ההחלטה")

Q29_7 <- as.data.frame(
  new_data %>%
    group_by(Q29_7) %>%
    filter(!is.na(Q29_7))%>%
    summarize(N = n()))

Q29_7_new <- Q29_7 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_7) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_7_new) +
  geom_bar(aes(factor(x=Q29_7), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_7), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("ינסו לשכנע את הדרגים הבכירים שיש לקיים הליך מסודר על מנת לבחון לעומק את ההשלכות של ההחלטה
")

Exit

Q29_8 <- as.data.frame(
  new_data %>%
    group_by(Q29_8) %>%
    filter(!is.na(Q29_8))%>%
    summarize(N = n()))

Q29_8_new <- Q29_8 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_8) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_8_new) +
  geom_bar(aes(factor(x=Q29_8), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_8), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("אם ייאלצו ליישם את ההחלטה כמו שהיא, יתפטרו מתפקידם")

Q29_9 <- as.data.frame(
  new_data %>%
    group_by(Q29_9) %>%
    filter(!is.na(Q29_9))%>%
    summarize(N = n()))

Q29_9_new <- Q29_9 %>% 
  type.convert(as.is=TRUE) %>% 
  group_by(Q29_9) %>% 
  summarise(N=sum(N, na.rm = TRUE))%>% 
  mutate(freq = N / sum(N))%>% round(2)%>%
  mutate(freq.lab=str_c(100*freq,"%"))

ggplot(Q29_9_new) +
  geom_bar(aes(factor(x=Q29_9), y=freq), stat="identity")+
  geom_text(aes(x=factor(Q29_9), y=freq, label = freq.lab),vjust=-0.3,size=4)+
  scale_x_discrete(labels = c("נמוכה מאוד", "נמוכה", "בינונית", "גבוהה", "גבוהה מאוד"))+
  scale_y_continuous(labels = function(x) paste0(x*100, "%"), limits=c(0,1))+
  theme(strip.text = element_text(size=24),
        axis.text = element_text(size =12),
        axis.line = element_line(colour = "black"),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        legend.title=element_blank(),
        legend.text=element_text(size=20),
        legend.position='bottom',
        legend.direction ='horizontal',
        legend.key=element_blank(),
        legend.margin = unit(0.2, "line"),
        legend.key.height=unit(0.6,"line"), 
        plot.title=element_text(size=12,face="bold", hjust = 0.5),
        axis.title.x=element_text(size=24),
        axis.title.y=element_text(size=24))+
  xlab("")+
  ylab("")+
  ggtitle("אם יראו שהבכירים במשרד לא מעוניינים להקשיב לטענותיהם, יתפטרו מתפקידם")