版權(quán)說(shuō)明:本文檔由用戶(hù)提供并上傳,收益歸屬內(nèi)容提供方,若內(nèi)容存在侵權(quán),請(qǐng)進(jìn)行舉報(bào)或認(rèn)領(lǐng)
文檔簡(jiǎn)介
第七章copula函數(shù)及其應(yīng)用
學(xué)習(xí)目標(biāo)
掌握Copula函數(shù)的定義、基本性質(zhì)和相關(guān)性測(cè)度;熟悉常用的Copula函數(shù)的性質(zhì)以及相關(guān)性分析的特點(diǎn);了解如何對(duì)相依數(shù)據(jù)分析并進(jìn)行相依風(fēng)險(xiǎn)度量。
本章導(dǎo)讀
相依性建模是現(xiàn)代金融研究的重要領(lǐng)域之一,無(wú)論是相關(guān)性分析、風(fēng)險(xiǎn)關(guān)聯(lián)分析、資產(chǎn)定價(jià)分析及信用風(fēng)險(xiǎn)分析,相依性都是一個(gè)非常重要的工具。Copula函數(shù)能夠很好好地刻畫(huà)金融序列變量間的非線性和非對(duì)稱(chēng)相依結(jié)構(gòu),并且能獨(dú)立于邊際分布而對(duì)變量間的相依結(jié)構(gòu)進(jìn)行建模。本章將詳細(xì)介紹Copula函數(shù)的定義和基本性質(zhì),并介紹基于Copula函數(shù)的相依性測(cè)度,重點(diǎn)研究幾類(lèi)常用Copula函數(shù)的相依性特征,最后介紹Copula函數(shù)的估計(jì)方法及其在金融風(fēng)險(xiǎn)計(jì)量中的應(yīng)用。通過(guò)本章內(nèi)容學(xué)習(xí),學(xué)生應(yīng)具備整體思維,樹(shù)立全局意識(shí),強(qiáng)化基礎(chǔ)理論以及科研素養(yǎng)的培養(yǎng)。根據(jù)給出的實(shí)際案例,計(jì)量模型的重現(xiàn),提高建模能力,并樹(shù)立正確的風(fēng)險(xiǎn)投資意識(shí)。7.1Copula函數(shù)的定義及性質(zhì)7.2Copula函數(shù)與相關(guān)性7.3常用的Copula函數(shù)7.4Copula函數(shù)的估計(jì)方法7.5Copula函數(shù)與金融風(fēng)險(xiǎn)計(jì)量7.6專(zhuān)題7基于GARCH-Copula模型的綠色債券投資組合風(fēng)險(xiǎn)測(cè)度目錄CONTENTSCopula函數(shù)的定義及性質(zhì)7.17.1.1Copula函數(shù)的定義7.1.2Copula函數(shù)的性質(zhì)7.1.2Copula函數(shù)的性質(zhì)7.1.3Sklar定理7.1.3Sklar定理Copula函數(shù)與相關(guān)性7.27.2Copula函數(shù)與相關(guān)性7.2Copula函數(shù)與相關(guān)性
7.2Copula函數(shù)與相關(guān)性
7.2Copula函數(shù)與相關(guān)性常用的Copula函數(shù)7.3
7.3.1橢圓類(lèi)Copula函數(shù)圖6.1二元正態(tài)Copula函數(shù)的分布密度圖(左)及對(duì)應(yīng)的等高線圖(右)
R代碼>library(copula)>nc=normalCopula(0.5,dim=2)>set.seed(300)>U=rCopula(1000,copula=nc)>wireframe2(nc,FUN=dCopula,col.4=adjustcolor("black",alpha.f=0.25),col="black",shade=T,delta=0.025)>contourplot2(nc,FUN=dCopula,n.grid=42,cuts=33,lwd=1/2)
7.3.1橢圓類(lèi)Copula函數(shù)圖6.2二元t-Copula函數(shù)的分布密度圖(左)及對(duì)應(yīng)的等高線圖(右)
R代碼>library(copula)>tc=tCopula(0.5,dim=2)>set.seed(300)>U=rCopula(1000,copula=tc)>wireframe2(tc,FUN=dCopula,col.4=adjustcolor("black",alpha.f=0.25),col="black",shade=T,delta=0.025)>contourplot2(tc,FUN=dCopula,n.grid=42,cuts=33,lwd=1/2)
7.3.2Archimedean類(lèi)Copula函數(shù)
7.3.2Archimedean類(lèi)Copula函數(shù)
7.3.2Archimedean類(lèi)Copula函數(shù)圖6.3二元GumbelCopula函數(shù)的分布密度圖(左)及對(duì)應(yīng)的等高線圖(右)
R代碼>library(copula)>gc=gumbelCopula(5,dim=2)>set.seed(300)>U=rCopula(1000,copula=gc)>wireframe2(gc,FUN=dCopula,col.4=adjustcolor("black",alpha.f=0.25),col="black",shade=T,delta=0.025)>contourplot2(gc,FUN=dCopula,n.grid=42,cuts=33,lwd=1/2)
7.3.2Archimedean類(lèi)Copula函數(shù)圖6.4二元ClaytonCopula函數(shù)的分布密度圖(左)及對(duì)應(yīng)的等高線圖(右)
R代碼>library(copula)>clayc=claytonCopula(0.5,dim=2)>set.seed(300)>U=rCopula(1000,copula=clayc)>wireframe2(clayc,FUN=dCopula,col.4=adjustcolor("black",alpha.f=0.25),col="black",shade=T,delta=0.025)>contourplot2(clayc,FUN=dCopula,n.grid=42,cuts=33,lwd=1/2)
7.3.2Archimedean類(lèi)Copula函數(shù)圖6.5二元FrankCopula函數(shù)的分布密度圖(左)及對(duì)應(yīng)的等高線圖(右)
R代碼>library(copula)>fc=frankCopula(0.5,dim=2)>set.seed(300)>U=rCopula(1000,copula=fc)>wireframe2(fc,FUN=dCopula,col.4=adjustcolor("black",alpha.f=0.25),col="black",shade=T,delta=0.025)>contourplot2(fc,FUN=dCopula,n.grid=42,cuts=33,lwd=1/2)7.3.2衍生類(lèi)Copula函數(shù)圖6.6混合Copula函數(shù)的分布密度圖(左)及對(duì)應(yīng)的等高線圖(右)
R代碼>library(copula)>nc=normalCopula(0.5,dim=2))>tc=tCopula(0.5,dim=2))>clayc=claytonCopula(0.5,dim=2))>gc=gumbelCopula(5,dim=2))>fc=frankCopula(0.5,dim=2))>weights=c(0.2,0.2,0.2,0.2,0.2)>mcp=mixCopula(list(nc,tc,clayc,gc,fc),w=weights)>wireframe2(mcp,FUN=dCopula,col.4=adjustcolor("black",alpha.f=0.25),col="black",shade=T,delta=0.025)>contourplot2(mcp,FUN=dCopula,n.grid=42,cuts=33,lwd=1/2)7.3.2衍生類(lèi)Copula函數(shù)7.3.2衍生類(lèi)Copula函數(shù)7.3.2衍生類(lèi)Copula函數(shù)7.3.2衍生類(lèi)Copula函數(shù)7.3.2衍生類(lèi)Copula函數(shù)圖6.9五維R藤的樹(shù)結(jié)構(gòu)7.3.2衍生類(lèi)Copula函數(shù)【例7.1】為刻畫(huà)銀行間的高維相依關(guān)系,我們選取了平安銀行、寧波銀行、浦發(fā)銀行、華夏銀行和民生銀行(分別對(duì)應(yīng)數(shù)字1,2,3,4,5)進(jìn)行分析,數(shù)據(jù)區(qū)間為2011年1月4日至2021年12月31日,共計(jì)2675個(gè)樣本。對(duì)五家銀行的收益率采用GARCH(1,1)模型進(jìn)行擬合,得到殘差序列后通過(guò)ecdf函數(shù)進(jìn)行概率積分變換,獲得擬合Copula函數(shù)的分布數(shù)據(jù)coupladata。接下來(lái),由VineCopula包中的RVineStructrueSelect函數(shù)尋找最優(yōu)藤結(jié)構(gòu)。通過(guò)Summary函數(shù)可直接輸出R藤的全部結(jié)果,由AIC準(zhǔn)則選取為R藤Copula,表6.2列示了估計(jì)結(jié)果。7.3.2衍生類(lèi)Copula函數(shù)6.3.2衍生類(lèi)Copula函數(shù)由表7.2可看出R藤Copula函數(shù)中每個(gè)節(jié)點(diǎn)間的Copula函數(shù),以及對(duì)應(yīng)的估計(jì)參數(shù)、Kendall秩相關(guān)系數(shù)和上下尾相關(guān)系數(shù);其次,考慮條件藤Copula結(jié)構(gòu),分析其條件相關(guān)系數(shù),也就是考慮兩家銀行的間接相依性;最后,我們可看出由第三層至第四層的高維Copula結(jié)構(gòu)的Kendall秩相關(guān)系數(shù)呈下降趨勢(shì)。
R代碼#載入R包>library(xts)>library(rugarch)>library(VineCopula)>library(copula)#載入數(shù)據(jù)>data=read.csv("E://jrjl/Chapter5/vinecopula.csv")>DATE=data[,1]>date=as.Date(DATE)>data=xts(data[,-1],as.Date(date,format="yyyy%mm%dd"))>PA=data$平安銀行_ret>NB=data$寧波銀行_ret>PF=data$浦發(fā)銀行_ret>HX=data$華夏銀行_ret>MS=data$民生銀行_ret#邊際分布擬合>spec_PA=ugarchspec(mean.model=list(armaOrder=c(1,0)),variance.model=list(model="sGARCH",garchOrder=c(1,1)),distribution.model="sstd")>garch_PA=ugarchfit(spec=spec_PA,data=PA)>spec_NB=ugarchspec(mean.model=list(armaOrder=c(1,0)),variance.model=list(model="sGARCH",garchOrder=c(1,1)),distribution.model="sstd")>garch_NB=ugarchfit(spec=spec_NB,data=NB)>spec_PF=ugarchspec(mean.model=list(armaOrder=c(1,0)),variance.model=list(model="sGARCH",garchOrder=c(1,1)),distribution.model="sstd")>garch_PF=ugarchfit(spec=spec_PF,data=PF)>spec_HX=ugarchspec(mean.model=list(armaOrder=c(1,0)),variance.model=list(model="sGARCH",garchOrder=c(1,1)),distribution.model="sstd")
R代碼>garch_PF=ugarchfit(spec=spec_PF,data=PF)>spec_HX=ugarchspec(mean.model=list(armaOrder=c(1,0)),variance.model=list(model="sGARCH",garchOrder=c(1,1)),distribution.model="sstd")>garch_HX=ugarchfit(spec=spec_HX,data=HX)>spec_MS=ugarchspec(mean.model=list(armaOrder=c(1,0)),variance.model=list(model="sGARCH",garchOrder=c(1,1)),distribution.model="sstd")>garch_MS=ugarchfit(spec=spec_MS,data=MS)#數(shù)據(jù)轉(zhuǎn)換>sigma_matrix=matrix(data=c(garch_PA@fit$sigma,garch_NB@fit$sigma,garch_PF@fit$sigma,garch_HX@fit$sigma,garch_MS@fit$sigma),nrow=length(garch_PA@fit$sigma),ncol=5,byrow=FALSE)>residual_matrix=matrix(data=c(garch_PA@fit$residuals,garch_NB@fit$residuals,garch_PF@fit$residuals,garch_HX@fit$residuals,garch_MS@fit$residuals),nrow=length(garch_PA@fit$residuals),ncol=5,byrow=FALSE)>std_sigma_matrix=matrix(nrow=2675,ncol=5)>copuladata=matrix(nrow=2675,ncol=5)>for(iinc(1:5)){std_sigma_matrix[,i]=residual_matrix[,i]/sigma_matrix[,i]f=ecdf(as.numeric(std_sigma_matrix[,i]))copuladata[,i]=f(std_sigma_matrix[,i])}#尋找最優(yōu)的藤結(jié)構(gòu)>Rst=RVineStructureSelect(copuladata,family=c(1:6),progress=TRUE,se=TRUE,method='itau',rotations=TRUE)>summary(Rst)Copula函數(shù)的估計(jì)方法7.47.4.1經(jīng)驗(yàn)Copula7.4.1經(jīng)驗(yàn)Copula7.4.1經(jīng)驗(yàn)Copula【例7.2】運(yùn)用經(jīng)驗(yàn)Copula進(jìn)行非參數(shù)估計(jì)。我們?nèi)砸訡laytonCopula函數(shù)為例,設(shè)定一個(gè)樣本容量為n的2維樣本數(shù)據(jù),并設(shè)定ClaytonCopula函數(shù)的參數(shù)。我們運(yùn)用R語(yǔ)言copula包中的claytonCopula函數(shù)生成所需數(shù)據(jù),并采用copula包中的C.n()函數(shù)對(duì)樣本數(shù)據(jù)進(jìn)行經(jīng)驗(yàn)估計(jì)。
R代碼>library(copula)>d=2>cc=claytonCopula(3,dim=d)>n=10000>set.seed(123)>U=rCopula(n,copula=cc)>v=matrix(runif(n*d),nrow=n,ncol=d)>ec=C.n(v,X=U)>True=pCopula(v,copula=cc)>error=round(mean(abs(True-ec)/True)*100,2)>error[1]0.26
7.4.2參數(shù)估計(jì)法
7.4.2參數(shù)估計(jì)法
7.4.2參數(shù)估計(jì)法
7.4.2參數(shù)估計(jì)法
7.4.2參數(shù)估計(jì)法
R代碼>cc=claytonCopula(3,dim=2)>mcc=mvdc(cc,margins=c("norm","norm"),paramMargins=list(list(mean=0,sd=1),ist(mean=0,sd=2)))>set.seed(123)>n=1000>X=rMvdc(n,mvdc=mcc)>mle=fitMvdc(X,mvdc=mcc,start=c(0,1,0,2,2))>summary(mle)
7.4.2參數(shù)估計(jì)法
7.4.2參數(shù)估計(jì)法
【例6.4】運(yùn)用兩階段極大似然估計(jì)擬合Copula函數(shù)。在這里我們?nèi)匀皇褂美?.3中的數(shù)據(jù),首先估計(jì)兩個(gè)序列的邊際分布,得到相應(yīng)的參數(shù)值,再通過(guò)fitCopula()函數(shù)選ClaytonCopula,其中method=“ml”,進(jìn)而得到Copula函數(shù)的參數(shù)估計(jì)值。Copula函數(shù)與金融風(fēng)險(xiǎn)計(jì)量7.57.5Copula函數(shù)與金融風(fēng)險(xiǎn)計(jì)量7.5Copula函數(shù)與金融風(fēng)險(xiǎn)計(jì)量7.5Copula函數(shù)與金融風(fēng)險(xiǎn)計(jì)量
7.5Copula函數(shù)與金融風(fēng)險(xiǎn)計(jì)量R代碼##R包加載##>library(rugarch);library(mistr);library(VineCopula);library(copula)##數(shù)據(jù)導(dǎo)入##>data=read.csv("E://jrjl/Chapter5/shuju.csv")>DATE=data[,1]>date=as.Date(DATE)>data=xts(data[,-1],as.Date(date,format="yyyy%mm%dd"))>PA=data$PA_ret>ZS=data$ZS_ret##邊際分布擬合##>garchspec_PA=ugarchspec(mean.model=list(armaOrder=c(0,0)),variance.model=list(model="sGARCH",garchOrder=c(1,1)),distribution.model="sstd")>garchfit_PA=ugarchfit(data=PA,spec=garchspec_PA)>garchspec_ZS=ugarchspec(mean.model=list(armaOrder=c(0,0)),variance.model=list(model="sGARCH",garchOrder=c(1,1)),distribution.model="sstd")>garchfit_ZS=ugarchfit(data=ZS,spec=garchspec_ZS)#提取標(biāo)準(zhǔn)化殘差>standardize_residual_PA=residuals(garchfit_PA)/sigma(garchfit_PA)>standardize_residual_ZS=residuals(garchfit_ZS)/sigma(garchfit_ZS)#數(shù)據(jù)轉(zhuǎn)換>PIT_PA=pdist("sstd",standardize_residual_PA,mu=0,sigma=1,skew=+coef(garchfit_PA)["skew"],shape=coef(garchfit_PA)["shape"])>PIT_ZS=pdist("sstd",standardize_residual_ZS,mu=0,sigma=1,skew=+coef(garchfit_ZS)["skew"],shape=coef(garchfit_ZS)["shape"])##選擇最優(yōu)Copula函數(shù)##>cop_select=BiCopSelect(PIT_PA,PIT_ZS,familyset=0:10)>summary(cop_select)7.5Copula函數(shù)與金融風(fēng)險(xiǎn)計(jì)量
R代碼#抽取樣本>T_model=tCopula(coef(fit_tStudent_PA_ZS)[1],dim=2,df=coef(fit_tStudent_PA_ZS)[2])>set.seed(123)>PA_ZS_tCopula_est=rCopula(2675,copula=T_model)#模擬平安銀行的收益率>inverse_PA=qdist("sstd",PA_ZS_tCopula_est[,1],mu=0,sigma=1,skew=coef(garchfit_PA)["skew"],shape=coef(garchfit_PA)["shape"])>SR_PA_T=xts(x=inverse_PA,order.by=index(standardize_residual_PA))>simulate_PA=inverse_PA*coredata(sigma(garchfit_PA))>simulate_log_return_PA=simulate_PA+fitted(garchfit_PA)>plot(simulate_log_return_PA)#模擬招商銀行的收益率>inverse_ZS=qdist("sstd",PA_ZS_tCopula_est[,2],mu=0,sigma=1,skew=coef(garchfit_ZS)["skew"],shape=coef(garchfit_ZS)["shape"])>SR_ZS_T=xts(x=inverse_ZS,order.by=index(standardize_residual_ZS))>simulate_ZS=inverse_ZS*coredata(sigma(garchfit_ZS))
R代碼>simulate_log_return_ZS=simulate_ZS+fitted(garchfit_ZS)#構(gòu)建投資組合計(jì)算VaR和ES>PA_ZS_tCopula_est=cbind(simulate_log_return_PA,simulate_log_return_ZS)>Rpa=PA_ZS_tCopula_est[,1]>Rzs=PA_ZS_tCopula_est[,2]>weight=c(0.7,0.3)>port_return_tCopula=weight[1]*Rpa+weight[2]*Rzs>VaR.95.est=quantile(port_return_tCopula,0.95)>VaR.99.est=quantile(port_return_tCopula,0.99)>ES.95.est=mean(port_return_tCopula[port_return_tCopula>VaR.95.est])>ES.99.est=mean(port_return_tCopula[port_return_tCopula>VaR.99.est])>ES.95.est[1]4.682247>ES.99.est[1]8.4976227.5Copula函數(shù)與金融風(fēng)險(xiǎn)計(jì)量表6.6投資組合的VaR值和ES值95%VaR95%ES99%VaR99%ES風(fēng)險(xiǎn)值2.78074.68225.68758.4976
從tCopula中進(jìn)行2675次抽樣,并考慮一個(gè)權(quán)重為0.7和0.3的投資組合,分別投資于平安銀行和招商銀行,模擬得到投資組合收益率,并通過(guò)式(6.25)和(6.26)計(jì)算VaR和ES。表6.6給出了該投資組合的不同置信水平的VaR值和ES值。專(zhuān)題7基于GARCH-Copula模型的綠色債券投資組合風(fēng)險(xiǎn)測(cè)度
7.6基于GARCH-Copula模型的綠色債券投資組合風(fēng)險(xiǎn)測(cè)度黨的二十大報(bào)告對(duì)“推動(dòng)綠色發(fā)展,促進(jìn)人與自然和諧共生”作出戰(zhàn)略部署,提出“必須牢固樹(shù)立和踐行綠水青山就是金山銀山的理念,站在人與自然和諧共生的高度謀劃發(fā)展”。習(xí)近平總書(shū)記指出:“推動(dòng)經(jīng)濟(jì)社會(huì)發(fā)展綠色化、低碳化,推動(dòng)經(jīng)濟(jì)實(shí)現(xiàn)質(zhì)的有效提升和量的合理增長(zhǎng)”。2023年10月召開(kāi)的中央金融工作會(huì)議,也明確提出做好綠色金融這篇文章。發(fā)展綠色金融是推動(dòng)實(shí)現(xiàn)
溫馨提示
- 1. 本站所有資源如無(wú)特殊說(shuō)明,都需要本地電腦安裝OFFICE2007和PDF閱讀器。圖紙軟件為CAD,CAXA,PROE,UG,SolidWorks等.壓縮文件請(qǐng)下載最新的WinRAR軟件解壓。
- 2. 本站的文檔不包含任何第三方提供的附件圖紙等,如果需要附件,請(qǐng)聯(lián)系上傳者。文件的所有權(quán)益歸上傳用戶(hù)所有。
- 3. 本站RAR壓縮包中若帶圖紙,網(wǎng)頁(yè)內(nèi)容里面會(huì)有圖紙預(yù)覽,若沒(méi)有圖紙預(yù)覽就沒(méi)有圖紙。
- 4. 未經(jīng)權(quán)益所有人同意不得將文件中的內(nèi)容挪作商業(yè)或盈利用途。
- 5. 人人文庫(kù)網(wǎng)僅提供信息存儲(chǔ)空間,僅對(duì)用戶(hù)上傳內(nèi)容的表現(xiàn)方式做保護(hù)處理,對(duì)用戶(hù)上傳分享的文檔內(nèi)容本身不做任何修改或編輯,并不能對(duì)任何下載內(nèi)容負(fù)責(zé)。
- 6. 下載文件中如有侵權(quán)或不適當(dāng)內(nèi)容,請(qǐng)與我們聯(lián)系,我們立即糾正。
- 7. 本站不保證下載資源的準(zhǔn)確性、安全性和完整性, 同時(shí)也不承擔(dān)用戶(hù)因使用這些下載資源對(duì)自己和他人造成任何形式的傷害或損失。
最新文檔
- 單位管理制度分享匯編【職工管理篇】十篇
- 高中語(yǔ)文常見(jiàn)的修辭方法及其辨析
- 單位管理制度呈現(xiàn)合集【職工管理篇】十篇
- 單位管理制度呈現(xiàn)大合集【人員管理篇】
- 《壽險(xiǎn)經(jīng)營(yíng)的命脈》課件
- 《看見(jiàn)學(xué)生的需要》課件
- 《班孫楠消防日》課件
- 物流行業(yè)人事工作總結(jié)
- 過(guò)年小學(xué)作文15篇
- 寵物行業(yè)寵物護(hù)理培訓(xùn)總結(jié)
- 勞動(dòng)合同范本(2025年)
- 遼寧2025年高中學(xué)業(yè)水平合格性考試物理試卷試題(含答案詳解)
- 工廠食堂安全衛(wèi)生管理方案
- 中藥硬膏熱貼敷治療
- 2024年人教版三年級(jí)上數(shù)學(xué)教學(xué)計(jì)劃和進(jìn)度安排
- 《電能計(jì)量知識(shí)介紹》課件
- 2023-2024學(xué)年山東省濰坊市高新區(qū)六年級(jí)(上)期末數(shù)學(xué)試卷(含答案)
- 彈性模量自動(dòng)生成記錄
- 2024年教師師德師風(fēng)工作計(jì)劃(2篇)
- 物流行業(yè)服務(wù)質(zhì)量保障制度
- 養(yǎng)老院物資采購(gòu)流程及制度
評(píng)論
0/150
提交評(píng)論