###################################################################################################################### # # #######################Autocratic Heterogeneity in the Provision of Environmental Protection ######################### # doi: # # [r] Replication script # ###################################################################################################################### rm(list=ls()) #set working directory getwd() setwd("") ############################ #Accesss data # ############################ library("readxl") #data for each DV and respective lagged IVs data is accessed through a individual data set CCC_outcome <- read_xlsx(path = "...\\data.xlsx", sheet = "1_CCC_outcome") CCC_output <- read_xlsx(path = "...\\data.xlsx", sheet = "2_CCC_output") EPI <- read_xlsx(path = "...\\data.xlsx", sheet = "3_EPI") Footprint <- read_xlsx(path = "...\\data.xlsx", sheet = "4_Footprint") CO2 <- read_xlsx(path = "...\\data.xlsx", sheet = "5_CO2") Nitrous <- read_xlsx(path = "...\\data.xlsx", sheet = "6_Nitrous") Methane <- read_xlsx(path = "...\\data.xlsx", sheet = "7_Methane") SFG <- read_xlsx(path = "...\\data.xlsx", sheet = "8_SFG") RenO <- read_xlsx(path = "...\\data.xlsx", sheet = "9_RenO") RenC <- read_xlsx(path = "...\\data.xlsx", sheet = "10_RenC") PBD <- read_xlsx(path = "...\\data.xlsx", sheet = "11_PBD") WWT <- read_xlsx(path = "...\\data.xlsx", sheet = "12_WWT") Protected <- read_xlsx(path = "...\\data.xlsx", sheet = "13_Protected") PAR <- read_xlsx(path = "...\\data.xlsx", sheet = "14_PAR") SPI <- read_xlsx(path = "...\\data.xlsx", sheet = "15_SPI") Forest <- read_xlsx(path = "...\\data.xlsx", sheet = "16_Forest") ############################ #Figure 1 # ############################ library(ggplot2) library(ggpubr) data <- read_xlsx(path = "...\\data.xlsx", sheet = "0_regimes") data <- subset(data, year>2016) data <- subset(data, liec!=-999) summary(data$liec[data$DD.regime<=2]) sd(na.omit(data$liec[data$DD.regime<=2])) summary(data$liec[data$DD.regime==3]) sd(na.omit(data$liec[data$DD.regime==3])) summary(data$liec[data$DD.regime==4]) sd(na.omit(data$liec[data$DD.regime==4])) summary(data$liec[data$DD.regime==5]) sd(na.omit(data$liec[data$DD.regime==5])) data$DD.category[data$DD.regime<=2] <- "Democracy" data$DD.category[data$DD.category=="Mixed democratic"] <- "Democracy" data$DD.categoty[data$DD.regime==3] <- "Civilian dictatorship" data$DD.category <- as.factor(data$DD.category) data$DD.category <- ordered(data$DD.category, levels=c("Royal dictatorship", "Military dictatorship", "Civilian dictatorship", "Democracy")) data$Regime <- data$DD.category p1 <- ggboxplot(data, x = "Regime", y = "polity2", bxp.errorbar = T, ylab = "Combined Polity Score",xlab = "", fill = "Regime", color="Regime", palette = c("black","black","black","black", "grey", "grey"), title = "Democratic Quality", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+rremove("x.text") p2 <- ggboxplot(data, x = "Regime", y = "liec", bxp.errorbar = T, ylab = "LIEC",xlab = "", fill = "Regime",color="Regime", palette = c("black","black","black","black", "grey", "grey"), title = "Legislative Electoral Competitiveness", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+rremove("x.text") p3 <- ggboxplot(data, x = "Regime", y = "durable", bxp.errorbar = T, ylab = "Years",xlab = "", fill = "Regime",color="Regime", palette = c("black","black","black","black", "grey", "grey"), title = "Regime durability", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+rremove("x.text") ggarrange(p1, p2,p3, nrow = 1, common.legend = T, legend="bottom") ############################ #Table 2: t-tests # ############################ vars <- c( "demaut t","p", "demroy t","p", "demmil t", "p", "demhar t", "p", "demcar t", "p", "carhar t", "p") CCCoutcomedemaut <- t.test(CCC_outcome$outcome~CCC_outcome$demaut) #t-test Democracy vs. Autocracy CCCoutcomedemroy <- t.test(CCC_outcome$outcome~CCC_outcome$demroy) #t-test Democracy vs. royal dictatorships CCCoutcomedemmil <- t.test(CCC_outcome$outcome~CCC_outcome$demmil) #t-test Democracy vs. military dictatorships CCCoutcomedemheg <- t.test(CCC_outcome$outcome~CCC_outcome$demheg) #t-test Democracy vs. hegemonic autocracies CCCoutcomedemcar <- t.test(CCC_outcome$outcome~CCC_outcome$demcar) #t-test Democracy vs. competitive autocracies CCCoutcomecarhar <- t.test(CCC_outcome$outcome~CCC_outcome$carhar) #t-test competitive autocracies vs. hegemonic autocracies #cind t.test data CCCoutcome.t <- rbind(c(CCCoutcomedemaut$statistic, CCCoutcomedemroy$statistic, CCCoutcomedemmil$statistic, CCCoutcomedemheg$statistic, CCCoutcomedemcar$statistic), c(CCCoutcomedemaut$p.value, CCCoutcomedemroy$p.value, CCCoutcomedemmil$p.value, CCCoutcomedemheg$p.value, CCCoutcomedemcar$p.value), c(length(CCC_outcome$demaut[!is.na(CCC_outcome$demaut)]), length(CCC_outcome$demroy[!is.na(CCC_outcome$demroy)]), length(CCC_outcome$demmil[!is.na(CCC_outcome$demmil)]), length(CCC_outcome$demheg[!is.na(CCC_outcome$demheg)]), length(CCC_outcome$demcar[!is.na(CCC_outcome$demcar)]))) #repeat for each DV CCCoutputdemaut <- t.test(CCC_output$output~CCC_output$demaut) CCCoutputdemroy <- t.test(CCC_output$output~CCC_output$demroy) CCCoutputdemmil <- t.test(CCC_output$output~CCC_output$demmil) CCCoutputdemheg <- t.test(CCC_output$output~CCC_output$demheg) CCCoutputdemcar <- t.test(CCC_output$output~CCC_output$demcar) CCCoutputcarhar <- t.test(CCC_output$output~CCC_output$carhar) CCCoutput.t <- rbind(c(CCCoutputdemaut$statistic, CCCoutputdemroy$statistic, CCCoutputdemmil$statistic, CCCoutputdemheg$statistic, CCCoutputdemcar$statistic), c(CCCoutputdemaut$p.value, CCCoutputdemroy$p.value, CCCoutputdemmil$p.value, CCCoutputdemheg$p.value, CCCoutputdemcar$p.value), c(length(CCC_output$demaut[!is.na(CCC_output$demaut)]), length(CCC_output$demroy[!is.na(CCC_output$demroy)]), length(CCC_output$demmil[!is.na(CCC_output$demmil)]), length(CCC_output$demheg[!is.na(CCC_output$demheg)]), length(CCC_output$demcar[!is.na(CCC_output$demcar)]))) EPIdemaut <- t.test(EPI$EPI.current~EPI$demaut) EPIdemroy <- t.test(EPI$EPI.current~EPI$demroy) EPIdemmil <- t.test(EPI$EPI.current~EPI$demmil) EPIdemheg <- t.test(EPI$EPI.current~EPI$demheg) EPIdemcar <- t.test(EPI$EPI.current~EPI$demcar) EPIcarhar <- t.test(EPI$EPI.current~EPI$carhar) EPI.t <- rbind(c(EPIdemaut$statistic, EPIdemroy$statistic, EPIdemmil$statistic, EPIdemheg$statistic, EPIdemcar$statistic), c(EPIdemaut$p.value, EPIdemroy$p.value, EPIdemmil$p.value, EPIdemheg$p.value, EPIdemcar$p.value), c(length(EPI$demaut[!is.na(EPI$demaut)]), length(EPI$demroy[!is.na(EPI$demroy)]), length(EPI$demmil[!is.na(EPI$demmil)]), length(EPI$demheg[!is.na(EPI$demheg)]), length(EPI$demcar[!is.na(EPI$demcar)]))) Footprintdemaut <- t.test(Footprint$total~Footprint$demaut) Footprintdemroy <- t.test(Footprint$total~Footprint$demroy) Footprintdemmil <- t.test(Footprint$total~Footprint$demmil) Footprintdemheg <- t.test(Footprint$total~Footprint$demheg) Footprintdemcar <- t.test(Footprint$total~Footprint$demcar) Footprintcarhar <- t.test(Footprint$total~Footprint$carhar) Footprint.t <- rbind(c(Footprintdemaut$statistic, Footprintdemroy$statistic, Footprintdemmil$statistic, Footprintdemheg$statistic, Footprintdemcar$statistic), c(Footprintdemaut$p.value, Footprintdemroy$p.value, Footprintdemmil$p.value, Footprintdemheg$p.value, Footprintdemcar$p.value), c(length(Footprint$demaut[!is.na(Footprint$demaut)]), length(Footprint$demroy[!is.na(Footprint$demroy)]), length(Footprint$demmil[!is.na(Footprint$demmil)]), length(Footprint$demheg[!is.na(Footprint$demheg)]), length(Footprint$demcar[!is.na(Footprint$demcar)]))) CO2demaut <- t.test(CO2$CO2.X2014*-1~CO2$demaut) CO2demroy <- t.test(CO2$CO2.X2014*-1~CO2$demroy) CO2demmil <- t.test(CO2$CO2.X2014*-1~CO2$demmil) CO2demheg <- t.test(CO2$CO2.X2014*-1~CO2$demheg) CO2demcar <- t.test(CO2$CO2.X2014*-1~CO2$demcar) CO2carhar <- t.test(CO2$CO2.X2014*-1~CO2$carhar) CO2.t <- rbind(c(CO2demaut$statistic, CO2demroy$statistic, CO2demmil$statistic, CO2demheg$statistic, CO2demcar$statistic), c(CO2demaut$p.value, CO2demroy$p.value, CO2demmil$p.value, CO2demheg$p.value, CO2demcar$p.value), c(length(CO2$demaut[!is.na(CO2$demaut)]), length(CO2$demroy[!is.na(CO2$demroy)]), length(CO2$demmil[!is.na(CO2$demmil)]), length(CO2$demheg[!is.na(CO2$demheg)]), length(CO2$demcar[!is.na(CO2$demcar)]))) Nitrousdemaut <- t.test(Nitrous$Nitrous.X2012~Nitrous$demaut) Nitrousdemroy <- t.test(Nitrous$Nitrous.X2012~Nitrous$demroy) Nitrousdemmil <- t.test(Nitrous$Nitrous.X2012~Nitrous$demmil) Nitrousdemheg <- t.test(Nitrous$Nitrous.X2012~Nitrous$demheg) Nitrousdemcar <- t.test(Nitrous$Nitrous.X2012~Nitrous$demcar) Nitrouscarhar <- t.test(Nitrous$Nitrous.X2012~Nitrous$carhar) Nitrous.t <- rbind(c(Nitrousdemaut$statistic, Nitrousdemroy$statistic, Nitrousdemmil$statistic, Nitrousdemheg$statistic, Nitrousdemcar$statistic), c(Nitrousdemaut$p.value, Nitrousdemroy$p.value, Nitrousdemmil$p.value, Nitrousdemheg$p.value, Nitrousdemcar$p.value), c(length(Nitrous$demaut[!is.na(Nitrous$demaut)]), length(Nitrous$demroy[!is.na(Nitrous$demroy)]), length(Nitrous$demmil[!is.na(Nitrous$demmil)]), length(Nitrous$demheg[!is.na(Nitrous$demheg)]), length(Nitrous$demcar[!is.na(Nitrous$demcar)]))) Methanedemaut <- t.test(Methane$Methane.X2012~Methane$demaut) Methanedemroy <- t.test(Methane$Methane.X2012~Methane$demroy) Methanedemmil <- t.test(Methane$Methane.X2012~Methane$demmil) Methanedemheg <- t.test(Methane$Methane.X2012~Methane$demheg) Methanedemcar <- t.test(Methane$Methane.X2012~Methane$demcar) Methanecarhar <- t.test(Methane$Methane.X2012~Methane$carhar) Methane.t <- rbind(c(Methanedemaut$statistic, Methanedemroy$statistic, Methanedemmil$statistic, Methanedemheg$statistic, Methanedemcar$statistic), c(Methanedemaut$p.value, Methanedemroy$p.value, Methanedemmil$p.value, Methanedemheg$p.value, Methanedemcar$p.value), c(length(Methane$demaut[!is.na(Methane$demaut)]), length(Methane$demroy[!is.na(Methane$demroy)]), length(Methane$demmil[!is.na(Methane$demmil)]), length(Methane$demheg[!is.na(Methane$demheg)]), length(Methane$demcar[!is.na(Methane$demcar)]))) SFGdemaut <- t.test(SFG$SFG.X2010~SFG$demaut) SFGdemroy <- t.test(SFG$SFG.X2010~SFG$demroy) SFGdemmil <- t.test(SFG$SFG.X2010~SFG$demmil) SFGdemheg <- t.test(SFG$SFG.X2010~SFG$demheg) SFGdemcar <- t.test(SFG$SFG.X2010~SFG$demcar) SFGcarhar <- t.test(SFG$SFG.X2010~SFG$carhar) SFG.t <- rbind(c(SFGdemaut$statistic, SFGdemroy$statistic, SFGdemmil$statistic, SFGdemheg$statistic, SFGdemcar$statistic), c(SFGdemaut$p.value, SFGdemroy$p.value, SFGdemmil$p.value, SFGdemheg$p.value, SFGdemcar$p.value), c(length(SFG$demaut[!is.na(SFG$demaut)]), length(SFG$demroy[!is.na(SFG$demroy)]), length(SFG$demmil[!is.na(SFG$demmil)]), length(SFG$demheg[!is.na(SFG$demheg)]), length(SFG$demcar[!is.na(SFG$demcar)]))) RenOdemaut <- t.test(RenO$RenO.X2015~RenO$demaut) RenOdemroy <- t.test(RenO$RenO.X2015~RenO$demroy) RenOdemmil <- t.test(RenO$RenO.X2015~RenO$demmil) RenOdemheg <- t.test(RenO$RenO.X2015~RenO$demheg) RenOdemcar <- t.test(RenO$RenO.X2015~RenO$demcar) RenOcarhar <- t.test(RenO$RenO.X2015~RenO$carhar) RenO.t <- rbind(c(RenOdemaut$statistic, RenOdemroy$statistic, RenOdemmil$statistic, RenOdemheg$statistic, RenOdemcar$statistic), c(RenOdemaut$p.value, RenOdemroy$p.value, RenOdemmil$p.value, RenOdemheg$p.value, RenOdemcar$p.value), c(length(RenO$demaut[!is.na(RenO$demaut)]), length(RenO$demroy[!is.na(RenO$demroy)]), length(RenO$demmil[!is.na(RenO$demmil)]), length(RenO$demheg[!is.na(RenO$demheg)]), length(RenO$demcar[!is.na(RenO$demcar)]))) RenCdemaut <- t.test(RenC$RenC.X2015~RenC$demaut) RenCdemroy <- t.test(RenC$RenC.X2015~RenC$demroy) RenCdemmil <- t.test(RenC$RenC.X2015~RenC$demmil) RenCdemheg <- t.test(RenC$RenC.X2015~RenC$demheg) RenCdemcar <- t.test(RenC$RenC.X2015~RenC$demcar) RenCcarhar <- t.test(RenC$RenC.X2015~RenC$carhar) RenC.t <- rbind(c(RenCdemaut$statistic, RenCdemroy$statistic, RenCdemmil$statistic, RenCdemheg$statistic, RenCdemcar$statistic), c(RenCdemaut$p.value, RenCdemroy$p.value, RenCdemmil$p.value, RenCdemheg$p.value, RenCdemcar$p.value), c(length(RenC$demaut[!is.na(RenC$demaut)]), length(RenC$demroy[!is.na(RenC$demroy)]), length(RenC$demmil[!is.na(RenC$demmil)]), length(RenC$demheg[!is.na(RenC$demheg)]), length(RenC$demcar[!is.na(RenC$demcar)]))) WWTdemaut <- t.test(WWT$WRS.current~WWT$demaut) WWTdemroy <- t.test(WWT$WRS.current~WWT$demroy) WWTdemmil <- t.test(WWT$WRS.current~WWT$demmil) WWTdemheg <- t.test(WWT$WRS.current~WWT$demheg) WWTdemcar <- t.test(WWT$WRS.current~WWT$demcar) WRScarhar <- t.test(WWT$WRS.current~WWT$carhar) WWT.t <- rbind(c(WWTdemaut$statistic, WWTdemroy$statistic, WWTdemmil$statistic, WWTdemheg$statistic, WWTdemcar$statistic), c(WWTdemaut$p.value, WWTdemroy$p.value, WWTdemmil$p.value, WWTdemheg$p.value, WWTdemcar$p.value), c(length(WWT$demaut[!is.na(WWT$demaut)]), length(WWT$demroy[!is.na(WWT$demroy)]), length(WWT$demmil[!is.na(WWT$demmil)]), length(WWT$demheg[!is.na(WWT$demheg)]), length(WWT$demcar[!is.na(WWT$demcar)]))) PBDdemaut <- t.test(PBD$HMT.current~PBD$demaut) PBDdemroy <- t.test(PBD$HMT.current~PBD$demroy) PBDdemmil <- t.test(PBD$HMT.current~PBD$demmil) PBDdemheg <- t.test(PBD$HMT.current~PBD$demheg) PBDdemcar <- t.test(PBD$HMT.current~PBD$demcar) HMTcarhar <- t.test(PBD$HMT.current~PBD$carhar) PBD.t <- rbind(c(PBDdemaut$statistic, PBDdemroy$statistic, PBDdemmil$statistic, PBDdemheg$statistic, PBDdemcar$statistic), c(PBDdemaut$p.value, PBDdemroy$p.value, PBDdemmil$p.value, PBDdemheg$p.value, PBDdemcar$p.value), c(length(PBD$demaut[!is.na(PBD$demaut)]), length(PBD$demroy[!is.na(PBD$demroy)]), length(PBD$demmil[!is.na(PBD$demmil)]), length(PBD$demheg[!is.na(PBD$demheg)]), length(PBD$demcar[!is.na(PBD$demcar)]))) Protecteddemaut <- t.test(Protected$Protected.X2017~Protected$demaut) Protecteddemroy <- t.test(Protected$Protected.X2017~Protected$demroy) Protecteddemmil <- t.test(Protected$Protected.X2017~Protected$demmil) Protecteddemheg <- t.test(Protected$Protected.X2017~Protected$demheg) Protecteddemcar <- t.test(Protected$Protected.X2017~Protected$demcar) Protectedcarhar <- t.test(Protected$Protected.X2017~Protected$carhar) Protected.t <- rbind(c(Protecteddemaut$statistic, Protecteddemroy$statistic, Protecteddemmil$statistic, Protecteddemheg$statistic, Protecteddemcar$statistic), c(Protecteddemaut$p.value, Protecteddemroy$p.value, Protecteddemmil$p.value, Protecteddemheg$p.value, Protecteddemcar$p.value), c(length(Protected$demaut[!is.na(Protected$demaut)]), length(Protected$demroy[!is.na(Protected$demroy)]), length(Protected$demmil[!is.na(Protected$demmil)]), length(Protected$demheg[!is.na(Protected$demheg)]), length(Protected$demcar[!is.na(Protected$demcar)]))) PARdemaut <- t.test(PAR$PAR.current~PAR$demaut) PARdemroy <- t.test(PAR$PAR.current~PAR$demroy) PARdemmil <- t.test(PAR$PAR.current~PAR$demmil) PARdemheg <- t.test(PAR$PAR.current~PAR$demheg) PARdemcar <- t.test(PAR$PAR.current~PAR$demcar) PARcarhar <- t.test(PAR$PAR.current~PAR$carhar) PAR.t <- rbind(c(PARdemaut$statistic, PARdemroy$statistic, PARdemmil$statistic, PARdemheg$statistic, PARdemcar$statistic), c(PARdemaut$p.value, PARdemroy$p.value, PARdemmil$p.value, PARdemheg$p.value, PARdemcar$p.value), c(length(PAR$demaut[!is.na(PAR$demaut)]), length(PAR$demroy[!is.na(PAR$demroy)]), length(PAR$demmil[!is.na(PAR$demmil)]), length(PAR$demheg[!is.na(PAR$demheg)]), length(PAR$demcar[!is.na(PAR$demcar)]))) SPIdemaut <- t.test(SPI$SPI.current~SPI$demaut) SPIdemroy <- t.test(SPI$SPI.current~SPI$demroy) SPIdemmil <- t.test(SPI$SPI.current~SPI$demmil) SPIdemheg <- t.test(SPI$SPI.current~SPI$demheg) SPIdemcar <- t.test(SPI$SPI.current~SPI$demcar) SPIcarhar <- t.test(SPI$SPI.current~SPI$carhar) SPI.t <- rbind(c(SPIdemaut$statistic, SPIdemroy$statistic, SPIdemmil$statistic, SPIdemheg$statistic, SPIdemcar$statistic), c(SPIdemaut$p.value, SPIdemroy$p.value, SPIdemmil$p.value, SPIdemheg$p.value, SPIdemcar$p.value), c(length(SPI$demaut[!is.na(SPI$demaut)]), length(SPI$demroy[!is.na(SPI$demroy)]), length(SPI$demmil[!is.na(SPI$demmil)]), length(SPI$demheg[!is.na(SPI$demheg)]), length(SPI$demcar[!is.na(SPI$demcar)]))) Forestdemaut <- t.test(Forest$Forest.diff1yr~Forest$demaut) Forestdemroy <- t.test(Forest$Forest.diff1yr~Forest$demroy) Forestdemmil <- t.test(Forest$Forest.diff1yr~Forest$demmil) Forestdemheg <- t.test(Forest$Forest.diff1yr~Forest$demheg) Forestdemcar <- t.test(Forest$Forest.diff1yr~Forest$demcar) Forestcarhar <- t.test(Forest$Forest.diff1yr~Forest$carhar) Forest.t <- rbind(c(Forestdemaut$statistic, Forestdemroy$statistic, Forestdemmil$statistic, Forestdemheg$statistic, Forestdemcar$statistic), c(Forestdemaut$p.value, Forestdemroy$p.value, Forestdemmil$p.value, Forestdemheg$p.value, Forestdemcar$p.value), c(length(Forest$demaut[!is.na(Forest$demaut)]), length(Forest$demroy[!is.na(Forest$demroy)]), length(Forest$demmil[!is.na(Forest$demmil)]), length(Forest$demheg[!is.na(Forest$demheg)]), length(Forest$demcar[!is.na(Forest$demcar)]))) #bind all t-tests in dataset for illustration t.test.stat <- as.data.frame(rbind(CCCoutcome.t, CCCoutput.t, EPI.t, Footprint.t, CO2.t, Nitrous.t, Methane.t, SFG.t, RenO.t, RenC.t, WWT.t, PBD.t, Protected.t, PAR.t, SPI.t, Forest.t)) t.test.stat <- round(t.test.stat, 4) library(sjPlot) tab_df(t.test.stat, digits = 2) ############################ #Table 3: Regression # ############################ #Appendix Table A1-5 and A1-6 #Regressions Democracy vs. Autocracy reg1 <- lm(outcome~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=CCC_outcome) reg2 <- lm(output~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci, data=CCC_output) reg3 <- lm(EPI.current~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=EPI) reg4 <- lm(total~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Footprint) reg5 <- lm(log(CO2.X2014)*-1~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=CO2) reg6 <- lm(log(Nitrous.X2012+1)*-1~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Nitrous) reg7 <- lm(log(Methane.X2012+1)*-1~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Methane) reg8 <- lm(log(SFG.X2010+1)*-1~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=SFG) reg9 <- lm(RenO.X2015~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=RenO) reg10 <- lm(RenC.X2015~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=RenC) reg11 <- lm(HMT.current~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci,data=PBD) reg12 <- lm(WRS.current~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=WWT) reg13 <- lm(Protected.X2017~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci, data=Protected) reg14 <- lm(PAR.current~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=PAR) reg15 <- lm(SPI.current~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=SPI) reg16 <- lm(Forest.diff1yr~as.factor(autocracy)+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Forest) tab_model(reg1, reg2,reg3,reg4,reg5, reg6,reg7,reg8,reg9,reg10,reg11,reg12,reg13,reg14,reg15,reg16,show.ci = F, p.style = "stars", show.std = T , show.est = F, emph.p=T, collapse.se = T, p.threshold = c(0.1, 0.05, 0.01)) #Regression with autocratic subtypes CCC_outcome$regime <- factor(CCC_outcome$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg1 <- lm(outcome~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=CCC_outcome) CCC_output$regime <- factor(CCC_output$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg2 <- lm(output~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci, data=CCC_output) EPI$regime <- factor(EPI$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg3 <- lm(EPI.current~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=EPI) Footprint$regime <- factor(Footprint$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg4 <- lm(total~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Footprint) CO2$regime <- factor(CO2$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg5 <- lm(log(CO2.X2014+1)*-1~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=CO2) Nitrous$regime <- factor(Nitrous$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg6 <- lm(log(Nitrous.X2012+1)*-1~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Nitrous) Methane$regime <- factor(Methane$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg7 <- lm(log(Methane.X2012+1)*-1~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Methane) SFG$regime <- factor(SFG$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg8 <- lm(log(SFG.X2010+1)*-1~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=SFG) RenO$regime <- factor(RenO$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg9 <- lm(RenO.X2015~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=RenO) RenC$regime <- factor(RenC$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg10 <- lm(RenC.X2015~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=RenC) PBD$regime <- factor(PBD$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg11 <- lm(HMT.current~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=PBD) WWT$regime <- factor(WWT$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg12 <- lm(WRS.current~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=WWT) Protected$regime <- factor(Protected$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg13 <- lm(Protected.X2017~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci, data=Protected) PAR$regime <- factor(PAR$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg14 <- lm(PAR.current~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=PAR) SPI$regime <- factor(SPI$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg15 <- lm(SPI.current~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=SPI) Forest$regime <- factor(Forest$regime, levels = c("Democracy", "Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian")) reg16 <- lm(Forest.diff1yr~regime+durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Forest) tab_model(reg1, reg2,reg3,reg4,reg5, reg6,reg7,reg8,reg9,reg10,reg11,reg12,reg13,reg14,reg15,reg16,show.ci = F, p.style = "stars", show.std = T , show.est = F, emph.p=T, collapse.se = T, p.threshold = c(0.1, 0.05, 0.01)) ############################ #Fig. 2: Fitted Values # ############################ reg1d <- as.data.frame(cbind(reg1$fitted.values, reg1$model$regime)) table(reg1d$V2) reg1d$V3 <- NA reg1d$V3[reg1d$V2==1] <- "N=81" reg1d$V3[reg1d$V2==2] <- "N=11" reg1d$V3[reg1d$V2==3] <- "N=19" reg1d$V3[reg1d$V2==4] <- "N=15" reg1d$V3[reg1d$V2==5] <- "N=18" reg1d$V2[reg1d$V2==1] <- "Democracy" reg1d$V2[reg1d$V2==2] <- "Royal Dictatorship" reg1d$V2[reg1d$V2==3] <- "Military Dictatorship" reg1d$V2[reg1d$V2==4] <- "Hegemonic Authoritarian" reg1d$V2[reg1d$V2==5] <- "Competitive Authoritarian" reg1d$V2 <- factor(reg1d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg1d$V3 <- factor(reg1d$V3, levels=c("N=11","N=19","N=15", "N=18","N=81")) reg1p <- ggboxplot(reg1d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "CI [Outcome]"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg1p reg2d <- as.data.frame(cbind(reg2$fitted.values, reg2$model$regime)) table(reg2d$V2) reg2d$V3 <- NA reg2d$V3[reg2d$V2==1] <- "N=83" reg2d$V3[reg2d$V2==2] <- "N=11" reg2d$V3[reg2d$V2==3] <- "N=18" reg2d$V3[reg2d$V2==4] <- "N=17" reg2d$V3[reg2d$V2==5] <- "N=18 " reg2d$V2[reg2d$V2==1] <- "Democracy" reg2d$V2[reg2d$V2==2] <- "Royal Dictatorship" reg2d$V2[reg2d$V2==3] <- "Military Dictatorship" reg2d$V2[reg2d$V2==4] <- "Hegemonic Authoritarian" reg2d$V2[reg2d$V2==5] <- "Competitive Authoritarian" reg2d$V2 <- factor(reg2d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg2d$V3 <- factor(reg2d$V3, levels=c("N=11","N=18","N=17", "N=18 ","N=83")) reg2p <- ggboxplot(reg2d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[p] ", italic( "CI [Output]"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg2p reg3d <- as.data.frame(cbind(reg3$fitted.values, reg3$model$regime)) table(reg3d$V2) reg3d$V3 <- NA reg3d$V3[reg3d$V2==1] <- "N=90" reg3d$V3[reg3d$V2==2] <- "N=8" reg3d$V3[reg3d$V2==3] <- "N=12" reg3d$V3[reg3d$V2==4] <- "N=13" reg3d$V3[reg3d$V2==5] <- "N=20" reg3d$V2[reg3d$V2==1] <- "Democracy" reg3d$V2[reg3d$V2==2] <- "Royal Dictatorship" reg3d$V2[reg3d$V2==3] <- "Military Dictatorship" reg3d$V2[reg3d$V2==4] <- "Hegemonic Authoritarian" reg3d$V2[reg3d$V2==5] <- "Competitive Authoritarian" reg3d$V2 <- factor(reg3d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg3d$V3 <- factor(reg3d$V3, levels=c("N=8","N=12","N=13", "N=20","N=90")) reg3p <- ggboxplot(reg3d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "EPI"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg3p reg4d <- as.data.frame(cbind(reg4$fitted.values, reg4$model$regime)) table(reg4d$V2) reg4d$V3 <- NA reg4d$V3[reg4d$V2==1] <- "N=91" reg4d$V3[reg4d$V2==2] <- "N=8" reg4d$V3[reg4d$V2==3] <- "N=17" reg4d$V3[reg4d$V2==4] <- "N=15" reg4d$V3[reg4d$V2==5] <- "N=14" reg4d$V2[reg4d$V2==1] <- "Democracy" reg4d$V2[reg4d$V2==2] <- "Royal Dictatorship" reg4d$V2[reg4d$V2==3] <- "Military Dictatorship" reg4d$V2[reg4d$V2==4] <- "Hegemonic Authoritarian" reg4d$V2[reg4d$V2==5] <- "Competitive Authoritarian" reg4d$V2 <- factor(reg4d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg4d$V3 <- factor(reg4d$V3, levels=c("N=8","N=17","N=15", "N=14","N=91")) reg4p <- ggboxplot(reg4d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "Footprint, reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg4p reg5d <- as.data.frame(cbind(reg5$fitted.values, reg5$model$regime)) table(reg5d$V2) reg5d$V3 <- NA reg5d$V3[reg5d$V2==1] <- "N=92" reg5d$V3[reg5d$V2==2] <- "N=9" reg5d$V3[reg5d$V2==3] <- "N=16" reg5d$V3[reg5d$V2==4] <- "N=16 " reg5d$V3[reg5d$V2==5] <- "N=14" reg5d$V2[reg5d$V2==1] <- "Democracy" reg5d$V2[reg5d$V2==2] <- "Royal Dictatorship" reg5d$V2[reg5d$V2==3] <- "Military Dictatorship" reg5d$V2[reg5d$V2==4] <- "Hegemonic Authoritarian" reg5d$V2[reg5d$V2==5] <- "Competitive Authoritarian" reg5d$V2 <- factor(reg5d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg5d$V3 <- factor(reg5d$V3, levels=c("N=9","N=16","N=16 ", "N=14","N=92")) reg5p <- ggboxplot(reg5d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "CO"[2]*", reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg5p reg6d <- as.data.frame(cbind(reg6$fitted.values, reg6$model$regime)) table(reg6d$V2) reg6d$V3 <- NA reg6d$V3[reg6d$V2==1] <- "N=89" reg6d$V3[reg6d$V2==2] <- "N=9" reg6d$V3[reg6d$V2==3] <- "N=17" reg6d$V3[reg6d$V2==4] <- "N=16" reg6d$V3[reg6d$V2==5] <- "N=18" reg6d$V2[reg6d$V2==1] <- "Democracy" reg6d$V2[reg6d$V2==2] <- "Royal Dictatorship" reg6d$V2[reg6d$V2==3] <- "Military Dictatorship" reg6d$V2[reg6d$V2==4] <- "Hegemonic Authoritarian" reg6d$V2[reg6d$V2==5] <- "Competitive Authoritarian" reg6d$V2 <- factor(reg6d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg6d$V3 <- factor(reg6d$V3, levels=c("N=9","N=17","N=16", "N=18","N=89")) reg6p <- ggboxplot(reg6d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic("N"[2]*"O, reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg6p reg7d <- as.data.frame(cbind(reg7$fitted.values, reg7$model$regime)) table(reg7d$V2) reg7d$V3 <- NA reg7d$V3[reg7d$V2==1] <- "N=89" reg7d$V3[reg7d$V2==2] <- "N=9" reg7d$V3[reg7d$V2==3] <- "N=17" reg7d$V3[reg7d$V2==4] <- "N=16" reg7d$V3[reg7d$V2==5] <- "N=18" reg7d$V2[reg7d$V2==1] <- "Democracy" reg7d$V2[reg7d$V2==2] <- "Royal Dictatorship" reg7d$V2[reg7d$V2==3] <- "Military Dictatorship" reg7d$V2[reg7d$V2==4] <- "Hegemonic Authoritarian" reg7d$V2[reg7d$V2==5] <- "Competitive Authoritarian" reg7d$V2 <- factor(reg7d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg7d$V3 <- factor(reg7d$V3, levels=c("N=9","N=17","N=16", "N=18","N=89")) reg7p <- ggboxplot(reg7d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "CH"[4]*", reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg7p reg8d <- as.data.frame(cbind(reg8$fitted.values, reg8$model$regime)) table(reg8d$V2) reg8d$V3 <- NA reg8d$V3[reg8d$V2==1] <- "N=76" reg8d$V3[reg8d$V2==2] <- "N=8" reg8d$V3[reg8d$V2==3] <- "N=10" reg8d$V3[reg8d$V2==4] <- "N=11" reg8d$V3[reg8d$V2==5] <- "N=15" reg8d$V2[reg8d$V2==1] <- "Democracy" reg8d$V2[reg8d$V2==2] <- "Royal Dictatorship" reg8d$V2[reg8d$V2==3] <- "Military Dictatorship" reg8d$V2[reg8d$V2==4] <- "Hegemonic Authoritarian" reg8d$V2[reg8d$V2==5] <- "Competitive Authoritarian" reg8d$V2 <- factor(reg8d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg8d$V3 <- factor(reg8d$V3, levels=c("N=8","N=10","N=11", "N=15","N=76")) reg8p <- ggboxplot(reg8d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "SF"[6]*", reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg8p reg9d <- as.data.frame(cbind(reg9$fitted.values, reg9$model$regime)) table(reg9d$V2) reg9d$V3 <- NA reg9d$V3[reg9d$V2==1] <- "N=93" reg9d$V3[reg9d$V2==2] <- "N=9" reg9d$V3[reg9d$V2==3] <- "N=16" reg9d$V3[reg9d$V2==4] <- "N=13" reg9d$V3[reg9d$V2==5] <- "N=16 " reg9d$V2[reg9d$V2==1] <- "Democracy" reg9d$V2[reg9d$V2==2] <- "Royal Dictatorship" reg9d$V2[reg9d$V2==3] <- "Military Dictatorship" reg9d$V2[reg9d$V2==4] <- "Hegemonic Authoritarian" reg9d$V2[reg9d$V2==5] <- "Competitive Authoritarian" reg9d$V2 <- factor(reg9d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg9d$V3 <- factor(reg9d$V3, levels=c("N=9","N=16","N=13", "N=16 ","N=93")) reg9p <- ggboxplot(reg9d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "Renew. [Production]")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg9p reg10d <- as.data.frame(cbind(reg10$fitted.values, reg10$model$regime)) table(reg10d$V2) reg10d$V3 <- NA reg10d$V3[reg10d$V2==1] <- "N=93" reg10d$V3[reg10d$V2==2] <- "N=9" reg10d$V3[reg10d$V2==3] <- "N=16" reg10d$V3[reg10d$V2==4] <- "N=13" reg10d$V3[reg10d$V2==5] <- "N=16 " reg10d$V2[reg10d$V2==1] <- "Democracy" reg10d$V2[reg10d$V2==2] <- "Royal Dictatorship" reg10d$V2[reg10d$V2==3] <- "Military Dictatorship" reg10d$V2[reg10d$V2==4] <- "Hegemonic Authoritarian" reg10d$V2[reg10d$V2==5] <- "Competitive Authoritarian" reg10d$V2 <- factor(reg10d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg10d$V3 <- factor(reg10d$V3, levels=c("N=9","N=16","N=13", "N=16 ","N=93")) reg10p <- ggboxplot(reg10d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "Renew. [Consumption]")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg10p reg11d <- as.data.frame(cbind(reg11$fitted.values, reg11$model$regime)) table(reg11d$V2) reg11d$V3 <- NA reg11d$V3[reg11d$V2==1] <- "N=91" reg11d$V3[reg11d$V2==2] <- "N=9" reg11d$V3[reg11d$V2==3] <- "N=15" reg11d$V3[reg11d$V2==4] <- "N=12" reg11d$V3[reg11d$V2==5] <- "N=18" reg11d$V2[reg11d$V2==1] <- "Democracy" reg11d$V2[reg11d$V2==2] <- "Royal Dictatorship" reg11d$V2[reg11d$V2==3] <- "Military Dictatorship" reg11d$V2[reg11d$V2==4] <- "Hegemonic Authoritarian" reg11d$V2[reg11d$V2==5] <- "Competitive Authoritarian" reg11d$V2 <- factor(reg11d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg11d$V3 <- factor(reg11d$V3, levels=c("N=9","N=15","N=12", "N=18","N=91")) reg11p <- ggboxplot(reg11d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "PBD")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg11p reg12d <- as.data.frame(cbind(reg12$fitted.values, reg12$model$regime)) table(reg12d$V2) reg12d$V3 <- NA reg12d$V3[reg12d$V2==1] <- "N=91" reg12d$V3[reg12d$V2==2] <- "N=9" reg12d$V3[reg12d$V2==3] <- "N=15" reg12d$V3[reg12d$V2==4] <- "N=12" reg12d$V3[reg12d$V2==5] <- "N=18" reg12d$V2[reg12d$V2==1] <- "Democracy" reg12d$V2[reg12d$V2==2] <- "Royal Dictatorship" reg12d$V2[reg12d$V2==3] <- "Military Dictatorship" reg12d$V2[reg12d$V2==4] <- "Hegemonic Authoritarian" reg12d$V2[reg12d$V2==5] <- "Competitive Authoritarian" reg12d$V2 <- factor(reg12d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg12d$V3 <- factor(reg12d$V3, levels=c("N=9","N=15","N=12", "N=18","N=91")) reg12p <- ggboxplot(reg12d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "WWT")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg12p reg13d <- as.data.frame(cbind(reg13$fitted.values, reg13$model$regime)) table(reg13d$V2) reg13d$V3 <- NA reg13d$V3[reg13d$V2==1] <- "N=90" reg13d$V3[reg13d$V2==2] <- "N=9" reg13d$V3[reg13d$V2==3] <- "N=15" reg13d$V3[reg13d$V2==4] <- "N=12" reg13d$V3[reg13d$V2==5] <- "N=18" reg13d$V2[reg13d$V2==1] <- "Democracy" reg13d$V2[reg13d$V2==2] <- "Royal Dictatorship" reg13d$V2[reg13d$V2==3] <- "Military Dictatorship" reg13d$V2[reg13d$V2==4] <- "Hegemonic Authoritarian" reg13d$V2[reg13d$V2==5] <- "Competitive Authoritarian" reg13d$V2 <- factor(reg13d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg13d$V3 <- factor(reg13d$V3, levels=c("N=9","N=15","N=12", "N=18","N=90")) reg13p <- ggboxplot(reg13d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[p] ", italic( "PA")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg13p reg14d <- as.data.frame(cbind(reg14$fitted.values, reg14$model$regime)) table(reg14d$V2) reg14d$V3 <- NA reg14d$V3[reg14d$V2==1] <- "N=91" reg14d$V3[reg14d$V2==2] <- "N=9" reg14d$V3[reg14d$V2==3] <- "N=15" reg14d$V3[reg14d$V2==4] <- "N=12" reg14d$V3[reg14d$V2==5] <- "N=18" reg14d$V2[reg14d$V2==1] <- "Democracy" reg14d$V2[reg14d$V2==2] <- "Royal Dictatorship" reg14d$V2[reg14d$V2==3] <- "Military Dictatorship" reg14d$V2[reg14d$V2==4] <- "Hegemonic Authoritarian" reg14d$V2[reg14d$V2==5] <- "Competitive Authoritarian" reg14d$V2 <- factor(reg14d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg14d$V3 <- factor(reg14d$V3, levels=c("N=9","N=15","N=12", "N=18","N=91")) reg14p <- ggboxplot(reg14d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[p] ", italic( "PAR")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg14p reg15d <- as.data.frame(cbind(reg15$fitted.values, reg15$model$regime)) table(reg15d$V2) reg15d$V3 <- NA reg15d$V3[reg15d$V2==1] <- "N=92" reg15d$V3[reg15d$V2==2] <- "N=8" reg15d$V3[reg15d$V2==3] <- "N=15" reg15d$V3[reg15d$V2==4] <- "N=15 " reg15d$V3[reg15d$V2==5] <- "N=14" reg15d$V2[reg15d$V2==1] <- "Democracy" reg15d$V2[reg15d$V2==2] <- "Royal Dictatorship" reg15d$V2[reg15d$V2==3] <- "Military Dictatorship" reg15d$V2[reg15d$V2==4] <- "Hegemonic Authoritarian" reg15d$V2[reg15d$V2==5] <- "Competitive Authoritarian" reg15d$V2 <- factor(reg15d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg15d$V3 <- factor(reg15d$V3, levels=c("N=8","N=15","N=15 ", "N=14","N=92")) reg15p <- ggboxplot(reg15d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[p] ", italic( "SPI")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg15p reg16d <- as.data.frame(cbind(reg16$fitted.values, reg16$model$regime)) table(reg16d$V2) reg16d$V3 <- NA reg16d$V3[reg16d$V2==1] <- "N=91" reg16d$V3[reg16d$V2==2] <- "N=9" reg16d$V3[reg16d$V2==3] <- "N=14" reg16d$V3[reg16d$V2==4] <- "N=13" reg16d$V3[reg16d$V2==5] <- "N=18" reg16d$V2[reg16d$V2==1] <- "Democracy" reg16d$V2[reg16d$V2==2] <- "Royal Dictatorship" reg16d$V2[reg16d$V2==3] <- "Military Dictatorship" reg16d$V2[reg16d$V2==4] <- "Hegemonic Authoritarian" reg16d$V2[reg16d$V2==5] <- "Competitive Authoritarian" reg16d$V2 <- factor(reg16d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) reg16d$V3 <- factor(reg16d$V3, levels=c("N=9","N=14","N=13", "N=18","N=91")) reg16p <- ggboxplot(reg16d, x="V3", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "Deforestation, reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+labs(fill="Regime",color="Regime") reg16p Fig2 <- ggarrange(reg1p, reg2p, reg3p, reg4p, reg5p, reg6p, reg7p, reg8p, reg9p,reg10p,reg11p,reg12p,reg13p,reg14p,reg15p,reg16p,nrow = 4, ncol = 4, common.legend=T, legend = "bottom") annotate_figure(Fig2, bottom = text_grob(expression(paste( italic( "Note: "), "[p] policy outputs, [c] policy outcomes, " ^"w", " weak sustainability."), color = "black", hjust=1, x=1, size = 10))) ############################ #Figure A2-1 # ############################ residreg1 <- as.data.frame(cbind(rstandard(reg1), reg1$model$regime, cooks.distance(reg1))) residreg1$V2[residreg1$V2==1] <- "Democracy" residreg1$V2[residreg1$V2==2] <- "Royal Dictatorship" residreg1$V2[residreg1$V2==3] <- "Military Dictatorship" residreg1$V2[residreg1$V2==4] <- "Hegemonic Authoritarian" residreg1$V2[residreg1$V2==5] <- "Competitive Authoritarian" residreg1$V2 <- factor(residreg1$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg1p <- ggboxplot(residreg1, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "CI [Outcome]"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg2 <- as.data.frame(cbind(rstandard(reg2), reg2$model$regime, cooks.distance(reg2))) residreg2$V2[residreg2$V2==1] <- "Democracy" residreg2$V2[residreg2$V2==2] <- "Royal Dictatorship" residreg2$V2[residreg2$V2==3] <- "Military Dictatorship" residreg2$V2[residreg2$V2==4] <- "Hegemonic Authoritarian" residreg2$V2[residreg2$V2==5] <- "Competitive Authoritarian" residreg2$V2 <- factor(residreg2$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg2p <- ggboxplot(residreg2, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[p] ", italic( "CI [Output]"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg3 <- as.data.frame(cbind(rstandard(reg3), reg3$model$regime, cooks.distance(reg3))) residreg3$V2[residreg3$V2==1] <- "Democracy" residreg3$V2[residreg3$V2==2] <- "Royal Dictatorship" residreg3$V2[residreg3$V2==3] <- "Military Dictatorship" residreg3$V2[residreg3$V2==4] <- "Hegemonic Authoritarian" residreg3$V2[residreg3$V2==5] <- "Competitive Authoritarian" residreg3$V2 <- factor(residreg3$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg3p <- ggboxplot(residreg3, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "EPI"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg4 <- as.data.frame(cbind(rstandard(reg4), reg4$model$regime, cooks.distance(reg4))) residreg4$V2[residreg4$V2==1] <- "Democracy" residreg4$V2[residreg4$V2==2] <- "Royal Dictatorship" residreg4$V2[residreg4$V2==3] <- "Military Dictatorship" residreg4$V2[residreg4$V2==4] <- "Hegemonic Authoritarian" residreg4$V2[residreg4$V2==5] <- "Competitive Authoritarian" residreg4$V2 <- factor(residreg4$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg4p <- ggboxplot(residreg4, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "Footprint, reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg5 <- as.data.frame(cbind(rstandard(reg5), reg5$model$regime, cooks.distance(reg5))) residreg5$V2[residreg5$V2==1] <- "Democracy" residreg5$V2[residreg5$V2==2] <- "Royal Dictatorship" residreg5$V2[residreg5$V2==3] <- "Military Dictatorship" residreg5$V2[residreg5$V2==4] <- "Hegemonic Authoritarian" residreg5$V2[residreg5$V2==5] <- "Competitive Authoritarian" residreg5$V2 <- factor(residreg5$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg5p <- ggboxplot(residreg5, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "CO"[2]*", reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg6 <- as.data.frame(cbind(rstandard(reg6), reg6$model$regime, cooks.distance(reg6))) residreg6$V2[residreg6$V2==1] <- "Democracy" residreg6$V2[residreg6$V2==2] <- "Royal Dictatorship" residreg6$V2[residreg6$V2==3] <- "Military Dictatorship" residreg6$V2[residreg6$V2==4] <- "Hegemonic Authoritarian" residreg6$V2[residreg6$V2==5] <- "Competitive Authoritarian" residreg6$V2 <- factor(residreg6$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg6p <- ggboxplot(residreg6, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "N"[2]*"O, reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg7 <- as.data.frame(cbind(rstandard(reg7), reg7$model$regime, cooks.distance(reg7))) residreg7$V2[residreg7$V2==1] <- "Democracy" residreg7$V2[residreg7$V2==2] <- "Royal Dictatorship" residreg7$V2[residreg7$V2==3] <- "Military Dictatorship" residreg7$V2[residreg7$V2==4] <- "Hegemonic Authoritarian" residreg7$V2[residreg7$V2==5] <- "Competitive Authoritarian" residreg7$V2 <- factor(residreg7$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg7p <- ggboxplot(residreg7, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "CH"[4]*", reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg8 <- as.data.frame(cbind(rstandard(reg8), reg8$model$regime, cooks.distance(reg8))) residreg8$V2[residreg8$V2==1] <- "Democracy" residreg8$V2[residreg8$V2==2] <- "Royal Dictatorship" residreg8$V2[residreg8$V2==3] <- "Military Dictatorship" residreg8$V2[residreg8$V2==4] <- "Hegemonic Authoritarian" residreg8$V2[residreg8$V2==5] <- "Competitive Authoritarian" residreg8$V2 <- factor(residreg8$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg8p <- ggboxplot(residreg8, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "SF"[6]*", reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg9 <- as.data.frame(cbind(rstandard(reg9), reg9$model$regime, cooks.distance(reg9))) residreg9$V2[residreg9$V2==1] <- "Democracy" residreg9$V2[residreg9$V2==2] <- "Royal Dictatorship" residreg9$V2[residreg9$V2==3] <- "Military Dictatorship" residreg9$V2[residreg9$V2==4] <- "Hegemonic Authoritarian" residreg9$V2[residreg9$V2==5] <- "Competitive Authoritarian" residreg9$V2 <- factor(residreg9$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg9p <- ggboxplot(residreg9, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "Renew. [Production]")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg10 <- as.data.frame(cbind(rstandard(reg10), reg10$model$regime, cooks.distance(reg10))) residreg10$V2[residreg10$V2==1] <- "Democracy" residreg10$V2[residreg10$V2==2] <- "Royal Dictatorship" residreg10$V2[residreg10$V2==3] <- "Military Dictatorship" residreg10$V2[residreg10$V2==4] <- "Hegemonic Authoritarian" residreg10$V2[residreg10$V2==5] <- "Competitive Authoritarian" residreg10$V2 <- factor(residreg10$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg10p <- ggboxplot(residreg10, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "Renew. [Consumption]")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg11 <- as.data.frame(cbind(rstandard(reg11), reg11$model$regime, cooks.distance(reg11))) residreg11$V2[residreg11$V2==1] <- "Democracy" residreg11$V2[residreg11$V2==2] <- "Royal Dictatorship" residreg11$V2[residreg11$V2==3] <- "Military Dictatorship" residreg11$V2[residreg11$V2==4] <- "Hegemonic Authoritarian" residreg11$V2[residreg11$V2==5] <- "Competitive Authoritarian" residreg11$V2 <- factor(residreg11$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg11p <- ggboxplot(residreg11, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "PBD")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg12 <- as.data.frame(cbind(rstandard(reg12), reg12$model$regime, cooks.distance(reg12))) residreg12$V2[residreg12$V2==1] <- "Democracy" residreg12$V2[residreg12$V2==2] <- "Royal Dictatorship" residreg12$V2[residreg12$V2==3] <- "Military Dictatorship" residreg12$V2[residreg12$V2==4] <- "Hegemonic Authoritarian" residreg12$V2[residreg12$V2==5] <- "Competitive Authoritarian" residreg12$V2 <- factor(residreg12$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg12p <- ggboxplot(residreg12, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "WWT")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg13 <- as.data.frame(cbind(rstandard(reg13), reg13$model$regime, cooks.distance(reg13))) residreg13$V2[residreg13$V2==1] <- "Democracy" residreg13$V2[residreg13$V2==2] <- "Royal Dictatorship" residreg13$V2[residreg13$V2==3] <- "Military Dictatorship" residreg13$V2[residreg13$V2==4] <- "Hegemonic Authoritarian" residreg13$V2[residreg13$V2==5] <- "Competitive Authoritarian" residreg13$V2 <- factor(residreg13$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg13p <- ggboxplot(residreg13, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[p] ", italic( "PA")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg14 <- as.data.frame(cbind(rstandard(reg14), reg14$model$regime, cooks.distance(reg14))) residreg14$V2[residreg14$V2==1] <- "Democracy" residreg14$V2[residreg14$V2==2] <- "Royal Dictatorship" residreg14$V2[residreg14$V2==3] <- "Military Dictatorship" residreg14$V2[residreg14$V2==4] <- "Hegemonic Authoritarian" residreg14$V2[residreg14$V2==5] <- "Competitive Authoritarian" residreg14$V2 <- factor(residreg14$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg14p <- ggboxplot(residreg14, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[p] ", italic( "PAR")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg15 <- as.data.frame(cbind(rstandard(reg15), reg15$model$regime, cooks.distance(reg15))) residreg15$V2[residreg15$V2==1] <- "Democracy" residreg15$V2[residreg15$V2==2] <- "Royal Dictatorship" residreg15$V2[residreg15$V2==3] <- "Military Dictatorship" residreg15$V2[residreg15$V2==4] <- "Hegemonic Authoritarian" residreg15$V2[residreg15$V2==5] <- "Competitive Authoritarian" residreg15$V2 <- factor(residreg15$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg15p <- ggboxplot(residreg15, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[p] ", italic( "SPI")^"w")),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") residreg16 <- as.data.frame(cbind(rstandard(reg16), reg16$model$regime, cooks.distance(reg16))) residreg16$V2[residreg16$V2==1] <- "Democracy" residreg16$V2[residreg16$V2==2] <- "Royal Dictatorship" residreg16$V2[residreg16$V2==3] <- "Military Dictatorship" residreg16$V2[residreg16$V2==4] <- "Hegemonic Authoritarian" residreg16$V2[residreg16$V2==5] <- "Competitive Authoritarian" residreg16$V2 <- factor(residreg16$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) residreg16p <- ggboxplot(residreg16, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), title = expression(paste( "[c] ", italic( "Deforestation, reversed"))),xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime")+labs(fill="Regime",color="Regime") ggarrange(residreg1p, residreg2p, residreg3p, residreg4p, residreg5p, residreg6p, residreg7p, residreg8p, residreg9p,residreg10p,residreg11p,residreg12p,residreg13p,residreg14p,residreg15p,residreg16p,nrow = 4, ncol = 4, common.legend=T, legend = "bottom") ############################ #Figure A2-2 # ############################ par(mfrow=c(4,4)) length(residreg1$V3[residreg1$V3>4/144]) plot(reg1, which=5, labels.id = CCC_outcome$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/144,3), 1), id.n = 13, main = expression(paste( "[c] ", italic( "CI [Outcome]")))) length(residreg2$V3[residreg2$V3>4/147]) plot(reg2, which=5, labels.id = CCC_output$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/147,3), 1), id.n =10, main = expression(paste( "[p] ", italic( "CI [Output]")))) length(residreg3$V3[residreg3$V3>4/143]) plot(reg3, which=5, labels.id = EPI$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/143,3), 1), id.n =14, main = expression(paste( "[c] ", italic( "EPI")))) length(residreg4$V3[residreg4$V3>4/145]) plot(reg4, which=5, labels.id = Footprint$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/145,3), 1), id.n =14, main = expression(paste( "[c] ", italic( "Footprint, rev.")))) length(residreg5$V3[residreg5$V3>4/147]) plot(reg5, which=5, labels.id = CO2$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/147,3), 1), id.n =16, main = expression(paste( "[c] ", italic( "CO"[2]*", rev.")))) length(residreg6$V3[residreg6$V3>4/149]) plot(reg6, which=5, labels.id = Nitrous$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/149,3), 1), id.n =12, main = expression(paste( "[c] ", italic( "N"[2]*"O, rev.")))) length(residreg7$V3[residreg7$V3>4/149]) plot(reg7, which=5, labels.id = Methane$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/149,3), 1), id.n =15, main = expression(paste( "[c] ", italic( "CH"[4]*", rev.")))) length(residreg8$V3[residreg8$V3>4/120]) plot(reg8, which=5, labels.id =SFG$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/120,3), 1), id.n =12, main = expression(paste( "[c] ", italic( "SF"[6]*", rev.")))) length(residreg9$V3[residreg9$V3>4/147]) plot(reg9, which=5, labels.id =RenO$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/147,3), 1), id.n =10, main = expression(paste( "[c] ", italic( "Renew. [Production]")))) length(residreg10$V3[residreg10$V3>4/147]) plot(reg10, which=5, labels.id =RenC$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/147,3), 1), id.n =9, main = expression(paste( "[c] ", italic( "Renew. [Consumption]")))) length(residreg11$V3[residreg11$V3>4/145]) plot(reg11, which=5, labels.id =EPI$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/145,3), 1), id.n =12, main = expression(paste( "[c] ", italic( "PBD")))) length(residreg12$V3[residreg12$V3>4/145]) plot(reg12, which=5, labels.id =EPI$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/145,3), 1), id.n =8, main = expression(paste( "[c] ", italic( "WWT")))) length(residreg13$V3[residreg13$V3>4/144]) plot(reg13, which=5, labels.id =Protected$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/144,3), 1), id.n =9, main = expression(paste( "[c] ", italic( "PA")))) length(residreg14$V3[residreg14$V3>4/144]) plot(reg14, which=5, labels.id =EPI$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/144,3), 1), id.n =7, main = expression(paste( "[c] ", italic( "PAR")))) length(residreg15$V3[residreg15$V3>4/144]) plot(reg15, which=5, labels.id =EPI$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/144,3), 1), id.n =13, main = expression(paste( "[c] ", italic( "SPI")))) length(residreg16$V3[residreg16$V3>4/145]) plot(reg16, which=5, labels.id =Forest$iso3c, sub.caption = "", caption = "", cook.levels = c(round(4/145,3), 1), id.n =15, main = expression(paste( "[c] ", italic( "Deforestation, rev.")))) ############################ #Figure A2-3 # ############################ library(Rcpp) library(tmap) library(sf) data("World") freq <-c(CCC_outcome$iso3c[cooks.distance(reg1)>4/144], CCC_output$iso3c[cooks.distance(reg2)>4/147], EPI$iso3c[cooks.distance(reg3)>4/143],Footprint$iso3c[cooks.distance(reg4)>4/145],CO2$iso3c[cooks.distance(reg5)>4/147],Nitrous$iso3c[cooks.distance(reg6)>4/149],Methane$iso3c[cooks.distance(reg7)>4/149],SFG$iso3c[cooks.distance(reg8)>4/120],RenO$iso3c[cooks.distance(reg9)>4/147],RenC$iso3c[cooks.distance(reg10)>4/147],PBD$iso3c[cooks.distance(reg11)>4/147],WWT$iso3c[cooks.distance(reg12)>4/147],Protected$iso3c[cooks.distance(reg13)>4/144],PAR$iso3c[cooks.distance(reg14)>4/145],SPI$iso3c[cooks.distance(reg15)>4/144],Forest$iso3c[cooks.distance(reg16)>4/145]) freq <- table(freq) freq <- as.data.frame(freq) freq$iso_a3 <- freq$freq freq$freq <- NA data <- merge(World, freq, by="iso_a3", all.x=T) tm_shape(data)+tm_polygons("Freq", legend.title="Frequency", showNA=F) table(data$continent[data$Frequency!=0]) ?tmap ############################ #Figure A2-4 # ############################ #regression without influential cases CCC_outcome$iso3c[cooks.distance(reg1)>4/144] CCC_outcome_r <- CCC_outcome[!(CCC_outcome$iso3c %in% c("ALB", "AZE", "CHL", "CPV", "JPN", "LBR", "LTU", "MMR", "OMN", "PER", "POL", "RWA", "TJK", "TUN")),] regr1 <- lm(outcome~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=CCC_outcome_r) CCC_output$iso3c[cooks.distance(reg2)>4/147] CCC_output_r <- CCC_output[!(CCC_output$iso3c %in% c("AFG", "BDI", "BIH", "DZA", "HTI", "KGZ", "PAK", "SLV", "TCD", "TGO", "TUR", "VNM")),] regr2 <- lm(output~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=CCC_output_r) EPI$iso3c[cooks.distance(reg3)>4/143] EPI_r <- EPI[!(EPI$iso3c %in% c("AGO", "BDI", "BGD", "BIH", "ECU", "EST", "GTM", "HRV", "IND", "KAZ", "LTU", "MWI", "PHL", "TCD", "TUN", "VEN", "ZWE")),] regr3 <- lm(EPI.current~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=EPI_r) Footprint$iso3c[cooks.distance(reg4)>4/145] Footprintr<- Footprint[!(Footprint$iso3c %in% c("AGO", "BTN", "CHE", "GEO", "IRQ", "LAO", "LVA", "MAR", "MWI", "OMN", "POL", "SLE", "SLV", "SYR", "TUR")),] regr4 <- lm(total~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Footprintr) CO2$iso3c[cooks.distance(reg5)>4/147] CO2r <- CO2[!(CO2$iso3c %in% c("AGO", "BDI", "BHR", "CHE", "ETH", "IRQ", "KAZ", "KEN", "LBR", "MAR", "OMN", "POL", "SDN", "SLE", "SLV", "SYR", "TUR", "VNM")),] regr5 <- lm(log(CO2.X2014)*-1~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=CO2r) Nitrous$iso3c[cooks.distance(reg6)>4/149] Nitrousr <- Nitrous[!(Nitrous$iso3c %in% c("BDI", "GEO", "GIN", "HTI", "KEN", "KGZ", "NAM", "PER", "PHL", "POL", "PRY", "QAT", "VNM")),] regr6 <- lm(log(Nitrous.X2012+1)*-1~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Nitrousr) Methane$iso3c[cooks.distance(reg7)>4/149] Methaner <- Methane[!(Methane$iso3c %in% c("AGO", "BDI", "HTI", "IRL", "KAZ", "KEN", "KGZ", "LBY", "MAR", "NAM", "PAK", "PER", "PRY", "SLV", "SWZ", "TUR", "VNM")),] regr7 <- lm(log(Methane.X2012+1)*-1~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Methaner) SFG$iso3c[cooks.distance(reg8)>4/120] SFGr <- SFG[!(SFG$iso3c %in% c("ALB", "BFA", "BOL", "GHA", "HND", "IRN", "LBY", "MDG", "MEX", "MKD", "MNG", "OMN", "QAT", "SLE", "SWE")),] regr8 <- lm(log(SFG.X2010+1)*-1~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=SFGr) RenO$iso3c[cooks.distance(reg9)>4/147] RenOr <- RenO[!(RenO$iso3c %in% c("AFG", "BGD", "GAB", "GBR", "GEO", "JPN", "MNG", "MWI", "POL", "SYR", "TUN", "ZWE")),] regr9 <- lm(RenO.X2015~regime*durable+GDP+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=RenOr) RenC$iso3c[cooks.distance(reg10)>4/147] RenCr <- RenC[!(RenC$iso3c %in% c("AFG", "BDI", "BTN", "ETH", "KEN", "POL", "SDN", "SDN", "TJK", "TUN", "VNM")),] regr10 <- lm(RenC.X2015~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=RenCr) PBD$iso3c[cooks.distance(reg11)>4/147] PBDr <- PBD[!(PBD$iso %in% c("AFG", "ARE", "BGD", "DNK", "GNQ", "HRV", "KAZ", "LVA", "POL", "PRY", "SDN", "SWZ", "TUN", "UGA")),] regr11 <- lm(HMT.current~regime*durable+GDP+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=PBDr) WWT$iso3c[cooks.distance(reg12)>4/147] WWTr <- WWT[!(WWT$iso %in% c("AGO", "BDI", "BIH", "ETH", "POL", "PRY", "RUS", "TTO", "TUR", "VNM")),] regr12 <- lm(WRS.current~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=WWTr) Protected$iso3c[cooks.distance(reg13)>4/144] Protectedr <- Protected[!(Protected$iso3c %in% c("BTN", "HRV", "KWT", "MUS", "PHL", "RUS", "SDN", "SUR", "SWZ")),] regr13 <- lm(Protected.X2017~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci, data=Protectedr) PAR$iso3c[cooks.distance(reg14)>4/145] PARr <- PAR[!(PAR$iso %in% c("LBR", "MMR", "POL", "PRY", "SVN", "TGO", "TTO")),] regr14 <- lm(PAR.current~regime*durable+GDP+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=PARr) SPI$iso3c[cooks.distance(reg15)>4/144] SPIr <- SPI[!(SPI$iso %in% c("AFG", "BGD", "BHR", "CHL", "EST", "HRV", "IND", "JAM", "LBN", "MDA", "SLV", "SWZ", "TKM", "TTO", "ZWE")),] regr15 <- lm(SPI.current~regime*durable+GDP+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=SPIr) Forest$iso3c[cooks.distance(reg16)>4/145] Forestr <- Forest[!(Forest$iso3c %in% c("BDI", "CRI", "ETH", "GEO", "GMB", "JAM", "JPN", "KEN", "LVA", "NLD", "PHL", "PRT", "SVK", "TCD", "TJK", "UZB")),] regr16 <- lm(Forest.diff1yr*-1~regime*durable+GDP+GDPsq+GDPgrow+NatResRent+PopGrow+PopDens+CV+bci_bci , data=Forestr) #fitted values regr1d <- as.data.frame(cbind(regr1$fitted.values, regr1$model$regime)) regr1d$V2[regr1d$V2==1] <- "Democracy" regr1d$V2[regr1d$V2==2] <- "Royal Dictatorship" regr1d$V2[regr1d$V2==3] <- "Military Dictatorship" regr1d$V2[regr1d$V2==4] <- "Hegemonic Authoritarian" regr1d$V2[regr1d$V2==5] <- "Competitive Authoritarian" regr1d$V2 <- factor(regr1d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr1p <- ggboxplot(regr1d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg1p <- ggboxplot(reg1d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr2d <- as.data.frame(cbind(regr2$fitted.values, regr2$model$regime)) regr2d$V2[regr2d$V2==1] <- "Democracy" regr2d$V2[regr2d$V2==2] <- "Royal Dictatorship" regr2d$V2[regr2d$V2==3] <- "Military Dictatorship" regr2d$V2[regr2d$V2==4] <- "Hegemonic Authoritarian" regr2d$V2[regr2d$V2==5] <- "Competitive Authoritarian" regr2d$V2 <- factor(regr2d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr2p <- ggboxplot(regr2d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg2p <- ggboxplot(reg2d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr3d <- as.data.frame(cbind(regr3$fitted.values, regr3$model$regime)) regr3d$V2[regr3d$V2==1] <- "Democracy" regr3d$V2[regr3d$V2==2] <- "Royal Dictatorship" regr3d$V2[regr3d$V2==3] <- "Military Dictatorship" regr3d$V2[regr3d$V2==4] <- "Hegemonic Authoritarian" regr3d$V2[regr3d$V2==5] <- "Competitive Authoritarian" regr3d$V2 <- factor(regr3d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr3p <- ggboxplot(regr3d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg3p <- ggboxplot(reg3d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr4d <- as.data.frame(cbind(regr4$fitted.values, regr4$model$regime)) regr4d$V2[regr4d$V2==1] <- "Democracy" regr4d$V2[regr4d$V2==2] <- "Royal Dictatorship" regr4d$V2[regr4d$V2==3] <- "Military Dictatorship" regr4d$V2[regr4d$V2==4] <- "Hegemonic Authoritarian" regr4d$V2[regr4d$V2==5] <- "Competitive Authoritarian" regr4d$V2 <- factor(regr4d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr4p <- ggboxplot(regr4d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg4p <- ggboxplot(reg4d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr5d <- as.data.frame(cbind(exp(regr5$fitted.values*-1)*-1, regr5$model$regime)) regr5d$V2[regr5d$V2==1] <- "Democracy" regr5d$V2[regr5d$V2==2] <- "Royal Dictatorship" regr5d$V2[regr5d$V2==3] <- "Military Dictatorship" regr5d$V2[regr5d$V2==4] <- "Hegemonic Authoritarian" regr5d$V2[regr5d$V2==5] <- "Competitive Authoritarian" regr5d$V2 <- factor(regr5d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr5p <- ggboxplot(regr5d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg5p <- ggboxplot(reg5d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr6d <- as.data.frame(cbind(exp(regr6$fitted.values)-1, regr6$model$regime)) regr6d$V2[regr6d$V2==1] <- "Democracy" regr6d$V2[regr6d$V2==2] <- "Royal Dictatorship" regr6d$V2[regr6d$V2==3] <- "Military Dictatorship" regr6d$V2[regr6d$V2==4] <- "Hegemonic Authoritarian" regr6d$V2[regr6d$V2==5] <- "Competitive Authoritarian" regr6d$V2 <- factor(regr6d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr6p <- ggboxplot(regr6d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg6p <- ggboxplot(reg6d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr7d <- as.data.frame(cbind(exp(regr7$fitted.values)-1, regr7$model$regime)) regr7d$V2[regr7d$V2==1] <- "Democracy" regr7d$V2[regr7d$V2==2] <- "Royal Dictatorship" regr7d$V2[regr7d$V2==3] <- "Military Dictatorship" regr7d$V2[regr7d$V2==4] <- "Hegemonic Authoritarian" regr7d$V2[regr7d$V2==5] <- "Competitive Authoritarian" regr1d$V2 <- factor(regr1d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr7p <- ggboxplot(regr7d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg7p <- ggboxplot(reg7d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr8d <- as.data.frame(cbind(exp(regr8$fitted.values)-1, regr8$model$regime)) regr8d$V2[regr8d$V2==1] <- "Democracy" regr8d$V2[regr8d$V2==2] <- "Royal Dictatorship" regr8d$V2[regr8d$V2==3] <- "Military Dictatorship" regr8d$V2[regr8d$V2==4] <- "Hegemonic Authoritarian" regr8d$V2[regr8d$V2==5] <- "Competitive Authoritarian" regr8d$V2 <- factor(regr8d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr8p <- ggboxplot(regr8d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg8p <- ggboxplot(reg8d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr9d <- as.data.frame(cbind(regr9$fitted.values, regr9$model$regime)) regr9d$V2[regr9d$V2==1] <- "Democracy" regr9d$V2[regr9d$V2==2] <- "Royal Dictatorship" regr9d$V2[regr9d$V2==3] <- "Military Dictatorship" regr9d$V2[regr9d$V2==4] <- "Hegemonic Authoritarian" regr9d$V2[regr9d$V2==5] <- "Competitive Authoritarian" regr9d$V2 <- factor(regr9d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr9p <- ggboxplot(regr9d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg9p <- ggboxplot(reg9d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr10d <- as.data.frame(cbind(regr10$fitted.values, regr10$model$regime)) regr10d$V2[regr10d$V2==1] <- "Democracy" regr10d$V2[regr10d$V2==2] <- "Royal Dictatorship" regr10d$V2[regr10d$V2==3] <- "Military Dictatorship" regr10d$V2[regr10d$V2==4] <- "Hegemonic Authoritarian" regr10d$V2[regr10d$V2==5] <- "Competitive Authoritarian" regr10d$V2 <- factor(regr10d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr10p <- ggboxplot(regr10d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg10p <- ggboxplot(reg10d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr11d <- as.data.frame(cbind(regr11$fitted.values, regr11$model$regime)) regr11d$V2[regr11d$V2==1] <- "Democracy" regr11d$V2[regr11d$V2==2] <- "Royal Dictatorship" regr11d$V2[regr11d$V2==3] <- "Military Dictatorship" regr11d$V2[regr11d$V2==4] <- "Hegemonic Authoritarian" regr11d$V2[regr11d$V2==5] <- "Competitive Authoritarian" regr11d$V2 <- factor(regr11d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr11p <- ggboxplot(regr11d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg11p <- ggboxplot(reg11d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr12d <- as.data.frame(cbind(regr12$fitted.values, regr12$model$regime)) regr12d$V2[regr12d$V2==1] <- "Democracy" regr12d$V2[regr12d$V2==2] <- "Royal Dictatorship" regr12d$V2[regr12d$V2==3] <- "Military Dictatorship" regr12d$V2[regr12d$V2==4] <- "Hegemonic Authoritarian" regr12d$V2[regr12d$V2==5] <- "Competitive Authoritarian" regr12d$V2 <- factor(regr12d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr12p <- ggboxplot(regr12d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg12p <- ggboxplot(reg12d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr13d <- as.data.frame(cbind(regr13$fitted.values, regr13$model$regime)) regr13d$V2[regr13d$V2==1] <- "Democracy" regr13d$V2[regr13d$V2==2] <- "Royal Dictatorship" regr13d$V2[regr13d$V2==3] <- "Military Dictatorship" regr13d$V2[regr13d$V2==4] <- "Hegemonic Authoritarian" regr13d$V2[regr13d$V2==5] <- "Competitive Authoritarian" regr13d$V2 <- factor(regr13d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr13p <- ggboxplot(regr13d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg13p <- ggboxplot(reg13d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr14d <- as.data.frame(cbind(regr14$fitted.values, regr14$model$regime)) regr14d$V2[regr14d$V2==1] <- "Democracy" regr14d$V2[regr14d$V2==2] <- "Royal Dictatorship" regr14d$V2[regr14d$V2==3] <- "Military Dictatorship" regr14d$V2[regr14d$V2==4] <- "Hegemonic Authoritarian" regr14d$V2[regr14d$V2==5] <- "Competitive Authoritarian" regr14d$V2 <- factor(regr14d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr14p <- ggboxplot(regr14d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg14p <- ggboxplot(reg14d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr15d <- as.data.frame(cbind(regr15$fitted.values, regr15$model$regime)) regr15d$V2[regr15d$V2==1] <- "Democracy" regr15d$V2[regr15d$V2==2] <- "Royal Dictatorship" regr15d$V2[regr15d$V2==3] <- "Military Dictatorship" regr15d$V2[regr15d$V2==4] <- "Hegemonic Authoritarian" regr15d$V2[regr15d$V2==5] <- "Competitive Authoritarian" regr15d$V2 <- factor(regr15d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr15p <- ggboxplot(regr15d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg15p <- ggboxplot(reg15d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") regr16d <- as.data.frame(cbind(regr16$fitted.values, regr16$model$regime)) regr16d$V2[regr16d$V2==1] <- "Democracy" regr16d$V2[regr16d$V2==2] <- "Royal Dictatorship" regr16d$V2[regr16d$V2==3] <- "Military Dictatorship" regr16d$V2[regr16d$V2==4] <- "Hegemonic Authoritarian" regr16d$V2[regr16d$V2==5] <- "Competitive Authoritarian" regr16d$V2 <- factor(regr16d$V2, levels=c("Royal Dictatorship", "Military Dictatorship", "Hegemonic Authoritarian", "Competitive Authoritarian", "Democracy")) regr16p <- ggboxplot(regr16d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="regime",color="regime") reg16p <- ggboxplot(reg16d, x="V2", y="V1", fill="V2",color="V2",palette = c("black","black","black","black", "grey"), xlab="", ylab = "", ggtheme=theme_grey())+scale_fill_grey(start = 0.45, end = 0.95)+geom_vline(xintercept=4.5, linetype="dashed", size=0.5)+rremove("x.text")+labs(fill="Regime",color="Regime") ggarrange(ggpar(reg1p, ylim=c(0,1))+rremove("x.text"), ggpar(regr1p, ylim=c(0,1))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg2p, ylim=c(0.25,0.9))+rremove("x.text"), ggpar(regr2p, ylim=c(0.25,0.9))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg3p, ylim=c(25,80))+rremove("x.text"), ggpar(regr3p, ylim=c(25,80))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg4p, ylim=c(-9,0))+rremove("x.text"), ggpar(regr4p, ylim=c(-9,0))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg5p, ylim=c(-30,0))+rremove("x.text"), ggpar(regr5p, ylim=c(-30,0))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg6p, ylim=c(-0.5,0))+rremove("x.text"), ggpar(regr6p, ylim=c(-0.5,0))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg7p, ylim=c(-2,0))+rremove("x.text"), ggpar(regr7p, ylim=c(-2,0))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg8p, ylim=c(-0.075,0.015))+rremove("x.text"), ggpar(regr8p, ylim=c(-0.075,0.015))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg9p, ylim=c(-30,90))+rremove("x.text"), ggpar(regr9p, ylim=c(-30,90))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg10p, ylim=c(-30,90))+rremove("x.text"), ggpar(regr10p, ylim=c(-30,90))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg11p, ylim=c(20,90))+rremove("x.text"), ggpar(regr11p, ylim=c(20,90))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg12p, ylim=c(0,110))+rremove("x.text"), ggpar(regr12p, ylim=c(0,110))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg13p, ylim=c(-5,22))+rremove("x.text"), ggpar(regr13p, ylim=c(-5,22))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg14p, ylim=c(-5,80))+rremove("x.text"), ggpar(regr14p, ylim=c(-5,80))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg15p, ylim=c(40,102))+rremove("x.text"), ggpar(regr15p, ylim=c(40,102))+rremove("x.text"), common.legend = T, legend = "none") ggarrange(ggpar(reg16p, ylim=c(-0.25,0.45))+rremove("x.text"), ggpar(regr16p, ylim=c(-0.25,0.45))+rremove("x.text"), common.legend = T, legend = "none")