Faiz Oranı ve Fiyatlar Genel Seviyesi Arasındaki İlişki: Gibson Paradoksunun Türkiye İçin Geçerliliği Üzerine Bir Analiz
Faiz oranı ve fiyatlar genel seviyesi arasındaki ilişkiyi analiz etmek için 2 değişken kullanılmıştır. Bu değişkenler nominal faiz oranı ve enflasyon (fiyatlar genel seviyesi)’dur.
Türkiye’ye ilişkin veri seti yıllık olarak World Bank’tan alınmıştır.
İlk olarak excel’de oluşturulan veriler aktarılmıştır.
library(readxl)
Gibson <- read_excel("C:/Users/User1/Desktop/Gibson.xlsx")
View(Gibson)
library(vars)
## Zorunlu paket yükleniyor: MASS
## Zorunlu paket yükleniyor: strucchange
## Zorunlu paket yükleniyor: zoo
##
## Attaching package: 'zoo'
## The following objects are masked from 'package:base':
##
## as.Date, as.Date.numeric
## Zorunlu paket yükleniyor: sandwich
## Zorunlu paket yükleniyor: urca
## Zorunlu paket yükleniyor: lmtest
library(tseries)
## Registered S3 method overwritten by 'quantmod':
## method from
## as.zoo.data.frame zoo
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr 1.1.1 ✔ readr 2.1.4
## ✔ forcats 1.0.0 ✔ stringr 1.5.0
## ✔ ggplot2 3.4.2 ✔ tibble 3.2.1
## ✔ lubridate 1.9.2 ✔ tidyr 1.3.0
## ✔ purrr 1.0.1
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ stringr::boundary() masks strucchange::boundary()
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag() masks stats::lag()
## ✖ dplyr::select() masks MASS::select()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(stargazer)
##
## Please cite as:
## Hlavac, Marek (2022). stargazer: Well-Formatted Regression and Summary Statistics Tables.
## R package version 5.2.3. https://CRAN.R-project.org/package=stargazer
library(urca)
Daha sonra veri setine ait ilk gözlemleri görmek için head() fonksiyonu kullanılmıştır. Yani head fonksiyonu, önceden tanımlı olan veri setinin ilk 6 satrını getirir.
head(Gibson)
## # A tibble: 6 × 2
## `İnterest Rate` İnflation
## <dbl> <dbl>
## 1 6 61.9
## 2 7.33 63.5
## 3 8 94.3
## 4 26.5 37.6
## 5 45 29.1
## 6 45.3 31.4
Veri setine ait son gözlemleri görmek adına tail fonksiyonu kullanabiliriz. Tail fonksiyonu veri setininin son 6 satrını getirir.
tail(Gibson)
## # A tibble: 6 × 2
## `İnterest Rate` İnflation
## <dbl> <dbl>
## 1 14.6 7.78
## 2 15.3 11.1
## 3 23.3 16.3
## 4 25.4 15.2
## 5 13.4 12.3
## 6 20.7 19.6
Veri setine ait değişkenleri zaman serisine dönüştürmek için aşağıdaki işlem uygulanmıştır.
InterestRate1<- ts(Gibson$`İnterest Rate`, start = c(1978,1), frequency =1)
İnflation1<- ts(Gibson$İnflation, start = c(1978,1), frequency =1)
Daha sonra veri setine ilişkin değişkenlere ait grafikler gösterilmiştir.
plot(InterestRate1)
plot(İnflation1)
Ardından veri setine ilişkin ADF birim kök testini yapmak için aşağıdaki işlem yapılmıştır.
df1 = Gibson[,2]
df1 <- as.numeric(unlist(df1))
summary(ur.df(df1))
##
## ###############################################
## # Augmented Dickey-Fuller Test Unit Root Test #
## ###############################################
##
## Test regression none
##
##
## Call:
## lm(formula = z.diff ~ z.lag.1 - 1 + z.diff.lag)
##
## Residuals:
## Min 1Q Median 3Q Max
## -47.345 -3.074 1.001 4.398 42.446
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## z.lag.1 -0.05786 0.04537 -1.275 0.210
## z.diff.lag -0.12525 0.15444 -0.811 0.422
##
## Residual standard error: 14.55 on 40 degrees of freedom
## Multiple R-squared: 0.0584, Adjusted R-squared: 0.01132
## F-statistic: 1.241 on 2 and 40 DF, p-value: 0.3001
##
##
## Value of test-statistic is: -1.2752
##
## Critical values for test statistics:
## 1pct 5pct 10pct
## tau1 -2.62 -1.95 -1.61
Sonuç olarak her değişkenlere ait birim kök testine göre seriler durağan değildir Ho= Faiz oranı,Enflasyon durağandır. Hipotez reddedilir. Test istatistik değerine bakıldığı zaman ve (tau2 değerlerinin sağında yer aldığı için) ve aynı zamanda olasılık değerlerine bakıldığı zaman da 0,05 değerinden büyük olduğu için serilerin durağan olmadığını görebiliriz.
Var modelini test etmek için aşağıdaki işlemleri uygulayabiliriz. İlk olarak veri setine ilişkin en uygun gecikme uzunluğunu görmemiz adına aşağıdaki işlemi uygulayacağız.
lag<- VARselect(Gibson, lag.max = 4)
estim<- VAR(Gibson, p=1, type = "none")
summary(estim)
##
## VAR Estimation Results:
## =========================
## Endogenous variables: İnterest.Rate, İnflation
## Deterministic variables: none
## Sample size: 43
## Log Likelihood: -330.622
## Roots of the characteristic polynomial:
## 0.969 0.6287
## Call:
## VAR(y = Gibson, p = 1, type = "none")
##
##
## Estimation results for equation İnterest.Rate:
## ==============================================
## İnterest.Rate = İnterest.Rate.l1 + İnflation.l1
##
## Estimate Std. Error t value Pr(>|t|)
## İnterest.Rate.l1 0.77114 0.08299 9.292 1.21e-11 ***
## İnflation.l1 0.20355 0.07598 2.679 0.0106 *
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
##
## Residual standard error: 10.22 on 41 degrees of freedom
## Multiple R-Squared: 0.9526, Adjusted R-squared: 0.9503
## F-statistic: 412.3 on 2 and 41 DF, p-value: < 2.2e-16
##
##
## Estimation results for equation İnflation:
## ==========================================
## İnflation = İnterest.Rate.l1 + İnflation.l1
##
## Estimate Std. Error t value Pr(>|t|)
## İnterest.Rate.l1 0.1384 0.1158 1.195 0.239
## İnflation.l1 0.8266 0.1060 7.794 1.28e-09 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
##
## Residual standard error: 14.26 on 41 degrees of freedom
## Multiple R-Squared: 0.9198, Adjusted R-squared: 0.9158
## F-statistic: 235 on 2 and 41 DF, p-value: < 2.2e-16
##
##
##
## Covariance matrix of residuals:
## İnterest.Rate İnflation
## İnterest.Rate 103.31 56.52
## İnflation 56.52 203.09
##
## Correlation matrix of residuals:
## İnterest.Rate İnflation
## İnterest.Rate 1.0000 0.3902
## İnflation 0.3902 1.0000
varmodeli<-var(2:length(Gibson),)
VARselect() sadece bilgi kriterlerine (IC) dayalı olarak en iyi modeli seçer, seri ilişkili problemle ilgisi yoktur.
VARselect(Gibson, type = "none", lag.max = 4)
## $selection
## AIC(n) HQ(n) SC(n) FPE(n)
## 1 1 1 1
##
## $criteria
## 1 2 3 4
## AIC(n) 8.975049 8.977652 9.096065 9.101210
## HQ(n) 9.036114 9.099781 9.279259 9.345469
## SC(n) 9.143937 9.315428 9.602729 9.776762
## FPE(n) 7904.728391 7934.638521 8960.910713 9064.678072
var.a <- VAR(Gibson,
lag.max = 1,
ic = "AIC",
type = "none")
Elde edilen VAR modeline ilişkin sonuçları özet olarak görmek için summary() fonksiyonu kullanılmıştır.
summary(var.a)
##
## VAR Estimation Results:
## =========================
## Endogenous variables: İnterest.Rate, İnflation
## Deterministic variables: none
## Sample size: 43
## Log Likelihood: -330.622
## Roots of the characteristic polynomial:
## 0.969 0.6287
## Call:
## VAR(y = Gibson, type = "none", lag.max = 1, ic = "AIC")
##
##
## Estimation results for equation İnterest.Rate:
## ==============================================
## İnterest.Rate = İnterest.Rate.l1 + İnflation.l1
##
## Estimate Std. Error t value Pr(>|t|)
## İnterest.Rate.l1 0.77114 0.08299 9.292 1.21e-11 ***
## İnflation.l1 0.20355 0.07598 2.679 0.0106 *
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
##
## Residual standard error: 10.22 on 41 degrees of freedom
## Multiple R-Squared: 0.9526, Adjusted R-squared: 0.9503
## F-statistic: 412.3 on 2 and 41 DF, p-value: < 2.2e-16
##
##
## Estimation results for equation İnflation:
## ==========================================
## İnflation = İnterest.Rate.l1 + İnflation.l1
##
## Estimate Std. Error t value Pr(>|t|)
## İnterest.Rate.l1 0.1384 0.1158 1.195 0.239
## İnflation.l1 0.8266 0.1060 7.794 1.28e-09 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
##
## Residual standard error: 14.26 on 41 degrees of freedom
## Multiple R-Squared: 0.9198, Adjusted R-squared: 0.9158
## F-statistic: 235 on 2 and 41 DF, p-value: < 2.2e-16
##
##
##
## Covariance matrix of residuals:
## İnterest.Rate İnflation
## İnterest.Rate 103.31 56.52
## İnflation 56.52 203.09
##
## Correlation matrix of residuals:
## İnterest.Rate İnflation
## İnterest.Rate 1.0000 0.3902
## İnflation 0.3902 1.0000
serial.test fonksiyonu VAR modelini giriş olarak alır
serial.test(var.a)
##
## Portmanteau Test (asymptotic)
##
## data: Residuals of VAR object var.a
## Chi-squared = 41.14, df = 60, p-value = 0.9701