Berkas Analisis Grafik Skripsiku
library(readxl)
data.des <- read_excel("F:/Berkas Skripsi/A. SkripsiQ/Dataset/Data_Skripsi.xlsx",
sheet = "New_era")
head(data.des,10)## # A tibble: 10 x 21
## Year G PE AHH INF KURS IR LF M2 UNEM ...11 dlngg
## <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <lgl> <dbl>
## 1 2000 60.4 4.92 65.8 9.35 1.19e-4 14.5 9.93e7 16.6 6.08 NA NA
## 2 2001 58.0 3.64 66.0 12.6 9.75e-5 17.6 1.00e8 11.9 6.08 NA -0.0411
## 3 2002 48.3 4.49 66.3 10.0 1.07e-4 12.9 1.00e8 4.76 6.60 NA -0.184
## 4 2003 42.7 4.78 66.6 5.06 1.17e-4 8.31 1.01e8 7.94 6.66 NA -0.122
## 5 2004 50.7 5.03 67.0 6.4 1.12e-4 7.43 1.03e8 9.14 7.30 NA 0.172
## 6 2005 54.1 5.69 67.3 17.1 1.03e-4 12.8 1.02e8 16.3 7.94 NA 0.0641
## 7 2006 47.1 5.5 67.7 6.6 1.09e-4 9.75 1.04e8 14.9 7.55 NA -0.137
## 8 2007 47.2 6.34 68.1 6.59 1.09e-4 8 1.09e8 19.3 8.06 NA 0.00192
## 9 2008 44.5 6.01 68.5 11.1 1.03e-4 9.25 1.11e8 14.9 7.21 NA -0.0591
## 10 2009 40.5 4.62 68.9 2.78 9.62e-5 6.5 1.12e8 13.0 6.11 NA -0.0945
## # ... with 9 more variables: dpe1 <dbl>, dahh <dbl>, inf <dbl>, dlnkurs <dbl>,
## # ir <dbl>, dlf <dbl>, dm2 <dbl>, dunem <dbl>, lagINF <dbl>
library(dplyr)
library(ggplot2)
library(scales)
library(tidyverse)Klik Kumpulan Background.
plot.g<-ggplot(data = data.des,aes(x=data.des$Year,y=round(data.des$G,2),color="red"))
plot.g+ geom_line(show.legend = FALSE)+geom_text(aes(label=round(data.des$G,2)),size=3,hjust=-0.2,vjust=-0.1,color="purple") +
labs(x = "Tahun", y = "Nilai Indeks") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.pe<-ggplot(data = data.des,aes(x=data.des$Year,y=round(data.des$PE,2),color="red"))
plot.pe+ geom_line(show.legend = FALSE)+geom_text(aes(label=round(data.des$PE,2)),size=3,hjust=-0.2,vjust=-0.1,color="purple") +
labs(x = "Tahun", y = "Pertumbuhan Ekonomi") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.ahh<-ggplot(data = data.des,aes(x=data.des$Year,y=round(data.des$AHH,2),color="red"))
plot.ahh+ geom_line(show.legend = FALSE)+geom_text(aes(label=round(data.des$AHH,2)),size=3,hjust=-0.2,vjust=-0.1,color="purple") +
labs(x = "Tahun", y = "Angka Harapan Hidup") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.inf<-ggplot(data = data.des,aes(x=data.des$Year,y=round(data.des$INF,2),color="red"))
plot.inf+ geom_line(show.legend = FALSE)+
labs(x = "Tahun", y = "Tinkat Inflasi") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.kurs<-ggplot(data = data.des,aes(x=data.des$Year,y=data.des$KURS,color="red"))
plot.kurs+ geom_line(show.legend = FALSE)+
labs(x = "Tahun", y = "Kurs") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.ir<-ggplot(data = data.des,aes(x=data.des$Year,y=data.des$IR,color="red"))
plot.ir+ geom_line(show.legend = FALSE)+
labs(x = "Tahun", y = "BI rate") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.unem<-ggplot(data = data.des,aes(x=data.des$Year,y=data.des$UNEM,color="red"))
plot.unem+ geom_line(show.legend = FALSE)+
labs(x = "Tahun", y = "Tingkat Pengangguran") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.m2<-ggplot(data = data.des,aes(x=data.des$Year,y=data.des$M2,color="red"))
plot.m2+ geom_line(show.legend = FALSE)+geom_text(aes(label=round(data.des$M2,2)),size=3,hjust=-0.2,vjust=-0.1,color="purple")+
labs(x = "Tahun", y = "Pertumbuhan Uang Beredar") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.tpak<-ggplot(data = data.des,aes(x=data.des$Year,y=data.des$LF/10^6,color="red"))
plot.tpak + geom_line(show.legend = FALSE)+
labs(x = "Tahun", y = "Jumlah Tenaga Kerja (Juta Jiwa)") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()library(readxl)
data_new <- read_excel("F:/Berkas Skripsi/A. SkripsiQ/Tambahan Dataset/data_new.xlsx")
head(data_new,10)## # A tibble: 10 x 5
## Tahun NX `Net FDI` m2 pdbadhb
## <dbl> <dbl> <dbl> <dbl> <dbl>
## 1 2000 71.4 4550355286. 7.49e14 165021012078.
## 2 2001 69.8 2977391857. 8.38e14 160446947785.
## 3 2002 59.1 -145085549. 8.78e14 195660611165.
## 4 2003 53.6 596923828. 9.47e14 234772463824.
## 5 2004 59.8 1511917230 1.03e15 256836875295.
## 6 2005 64.0 -5271257208. 1.20e15 285868618224.
## 7 2006 56.7 -2188448467. 1.38e15 364570514305.
## 8 2007 54.8 -2253330000 1.65e15 432216737775.
## 9 2008 58.6 -3418723399. 1.90e15 510228634992.
## 10 2009 45.5 -2628247483. 2.14e15 539580085612.
plot.nx<-ggplot(data = data_new,aes(x=data_new$Tahun,y=data_new$NX,color="blue"))
plot.nx+ geom_line(show.legend = FALSE,color="blue")+
labs(x = "Tahun", y = "Persentase Net Expor terhadap PDB") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()plot.fdi<-ggplot(data = data_new,aes(x=data_new$Tahun,y=data_new$`Net FDI`/10^6,color="blue"))
plot.fdi+ geom_line(show.legend = FALSE,color="blue")+
labs(x = "Tahun", y = "Net FDI") +
scale_x_continuous(breaks = breaks_width(1),position="bottom")+
theme_classic()data_2 <- read_excel("F:/Berkas Skripsi/A. SkripsiQ/Dataset/Pengolahan Data/Vis.xlsx",sheet = 3)
plot.new<-ggplot(data = data_2,aes(x=data_2$Tahun,y=data_2$`Globalisasi Ekonomi`,color=data_2$Wilayah,group=data_2$Wilayah))
plot.new+geom_line() +
labs(x = "Tahun", y = "Indeks Globalisasi Ekonomi",label = "Wilayah") +
scale_x_continuous(breaks = breaks_width(1))+
theme_classic()vis3 <- read_excel("F:/Berkas Skripsi/A. SkripsiQ/Dataset/Pengolahan Data/Vis.xlsx",sheet = "Vis2")
HCI <- ggplot(vis3,
aes(x = reorder(vis3$Negara, vis3$`Skor HCL`),
y = vis3$`Skor HCL`),size=1) +
geom_bar(stat = "identity", color='chartreuse1', fill="Gainsboro") +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) +
geom_text(aes(label = vis3$`Skor HCL`), nudge_y = 0.04) +
labs(y = "Skor HCI", x = "Negara ASEAN") +
coord_flip() + theme_classic()
HCI