Lembaga : Universitas Islam Negeri Maulana Malik Ibrahim Malang
Jurusan : Teknik Informatika
Inflow, disebut investasi sebagai langsung dalam ekonomi pelaporan, termasuk semua kewajiban dan aset yang ditransfer antara perusahaan investasi langsung penduduk dan investor langsung mereka. Ini juga mencakup transfer aset dan kewajiban antara perusahaan yang bertempat tinggal dan yang tidak residen, jika orang tua pengendali utama adalah bukan penduduk.
Outflow, disebut sebagai investasi langsung di luar negeri, termasuk aset dan kewajiban yang ditransfer antara investor langsung penduduk dan perusahaan investasi langsung mereka.
Ini adalah contoh penerapan visualisasi prediksi data Inflow-Outflow Uang Kartal di Kep. Riau menggunakan bahasa pemrograman R
library(readxl)
datainflow <- read_excel(path = "inflow tahunan.xlsx")
library (readxl)
dataoutflow <- read_excel(path = "outflow tahunan.xlsx")
dataoutflow
plot(datainflow$Tahun,datainflow$`Kep. Riau`,type = "l", col= "cyan")
plot(dataoutflow$Tahun,dataoutflow$`Kep. Riau`,type = "l", col= "blue")
plot(datainflow$Tahun,datainflow$`Kep. Riau`,type = "l", col= "cyan")
lines(dataoutflow$Tahun,dataoutflow$`Kep. Riau`,col="blue")
legend("top",c("Inflow","Outflow"),fill=c("cyan","blue"))
library(readxl)
datainflowperbulan <- read_excel(path = "inflow perbulan.xlsx")
dataoutflowperbulan <- read_excel(path = "outflow perbulan.xlsx")
datainflowperbulan
dataoutflowperbulan
plot(datainflowperbulan$`Kep. Riau`, type = "l", col = "green")
lines(dataoutflowperbulan$`Kep. Riau`,col="yellow")
legend("top",c("Inflow","Outflow"),fill=c("green","yellow"))
Kep.Riautimeseries <- datainflowperbulan$`Kep. Riau`
plot.ts(Kep.Riautimeseries , type = "l", col = "green")
logKep.Riau <- log(datainflowperbulan$`Kep. Riau`)
plot.ts(logKep.Riau)
Kep.Riauinflowtimeseries <- ts(datainflowperbulan$`Kep. Riau`, frequency=12, start=c(2011,1))
Kep.Riauinflowtimeseries
Kep.Riauoutflowtimeseries <- ts(dataoutflowperbulan$`Kep. Riau`, frequency=12, start=c(2011,1))
Kep.Riauoutflowtimeseries
plot.ts(Kep.Riauinflowtimeseries)
plot.ts(Kep.Riauoutflowtimeseries)
Kep.Riauintimeseriescomponents <- decompose(Kep.Riauinflowtimeseries)
Kep.Riauintimeseriescomponents$seasonal
Kep.Riauouttimeseriescomponents <- decompose(Kep.Riauoutflowtimeseries)
Kep.Riauouttimeseriescomponents$seasonal
plot(Kep.Riauintimeseriescomponents$seasonal,type = "l", col = "orange")
lines(Kep.Riauouttimeseriescomponents$seasonal,col="grey")
legend("top",c("Inflow","Outflow"),fill=c("orange","grey"))
plot(Kep.Riauintimeseriescomponents$trend,type = "l", col = "orange")
lines(Kep.Riauouttimeseriescomponents$trend,col="grey")
legend("top",c("Inflow","Outflow"),fill=c("orange","grey"))
plot(Kep.Riauintimeseriescomponents$random ,type = "l", col = "orange")
lines(Kep.Riauouttimeseriescomponents$random,col="grey")
legend("top",c("Inflow","Outflow"),fill=c("orange","grey"))
plot(Kep.Riauintimeseriescomponents$figure ,type = "l", col = "orange")
lines(Kep.Riauouttimeseriescomponents$figure,col="grey")
legend("top",c("Inflow","Outflow"),fill=c("orange","grey"))
https://ejurnal.its.ac.id/index.php/sains_seni/article/download/12401/2433#:~:text=Inflow%20merupakan%20uang%20yang%20masuk,melalui%20kegiatan%20penarikan%20%5B2%5D.
https://www.bi.go.id/id/statistik/ekonomi-keuangan/ssp/indikator-pengedaran-uang.aspx
https://www.bi.go.id/id/fungsi-utama/sistem-pembayaran/pengelolaan-rupiah/default.aspx