インターネットを活用した経済分析 - フリーソフト Rを使おう

Size: px
Start display at page:

Download "インターネットを活用した経済分析 - フリーソフト Rを使おう"

Transcription

1 R /64

2 2 R 3 R R RESAS /64

3 2 R 3 R R RESAS /64

4 2-4 ( ) ( (80%) (20%) /64

5 PC LAN R /64

6 R R /64

7 3-4 R /64

8 R STATA Eviews MATLAB STATA R /64

9 R /64

10 R R Windows Mac Linux R Comprehensive R Archive Network (CRAN: ) /64

11 /64

12 /64

13 R R A B Word /64

14 R > ( ) + esc /64

15 (1): > x < # x > x [1] 4 > 2.5* x [1] /64

16 (2): > y <- c(1,2,3) # y y = [ ] > y * y [1] /64

17 (2): y y = [ ] 1 2 = = 14 3 > y %*% y # % [1] 14 > z <- c(1,2,3,4,5,6) > z.mat <- matrix(z,nrow=2,ncol=3) > z.mat [,1] [,2] [,3] [1,] [2,] /64

18 > z.mat[1,] [1] > z.mat[,2] [1] /64

19 (3): > f <- expression(x^2) > D(f,"x") 2*x > h <- expression(x^2+3*x*y) > D(h,"x") 2*x+3*y /64

20 > testfunction<- function(x^2) > x<-seq(-5,10,0.1) > plot(x, testfunction(x),type="l") ggplot2 1 : y = x /64

21 R R CRAN 8, /64

22 2 : /64

23 Nippon ( ( ) /64

24 Nippon (2013) > setwd("/users/xxxx/r/gis/nipponpackage") # > library(nippon) > library(rcolorbrewer) > library(maptools) > library(classint) # > data<-read.table("nipponpackagetest.csv",sep=",",header=true) > op <- par(bg = "skyblue") # # : > p <- JapanPrefecturesMap(col = "ivory") > colleges <- data$colleges # # ( ) > cols <- rev(brewer.pal(5, "RdYlBu")) # n > c1 <- classintervals(colleges, n = 5, style = "fisher") > colcode1 <- findcolours(c1, cols, cutlabels = FALSE) # # 1 ( > legtext1 <- paste0(names(attr(colcode1,"table")), " (", attr(colcode1, "table"),")") > p <- JapanPrefecturesMap(col = colcode1) # ( # ( > legend("bottomright", legend = legtext1,fill = cols, title = "Colleges",bg = "white") /64

25 /64

26 (1) Nippon /64

27 2 R 2 R 3 R R RESAS /64

28 2 R (π) (P Y ) (C(Y )) max Y π = P Y C(Y ) (1) Y /64

29 2 R Hoover(2012, P331) Y = 9.63L 0.67 K 0.33 (2) Y L K Y = AL a K 1 a (A ) 1 Hoover, KD(2012) Applied intermediate macroeconomics, Cambridge University Press /64

30 2 R > plotfun(a*(l^0.7)*(k^0.3)~l&k, A=5,xlim=range(0,21), ylim=range(0,100), filled=false, surface=true ) mosaic A * (L^0.7) * (K^0.3) K L /64

31 2 R > library(mosaic) > plotfun(a*(l^0.7)*(k^0.3)~l,k=20,a=5,xlim=range(-1,21), ylim=range(-5,105)) 80 A * (L^0.7) * (K^0.3) L /64

32 2 R K Y > plotfun(a*(l^0.7)*(k^0.3)~l,k=20,a=5,xlim=range(-1,21), ylim=range(-5,151)) > plotfun(a*(l^0.7)*(k^0.3)~l, K=40,A=5,xlim=range(-1,21), ylim=range(-5,151), lty=2,add=true ) A * (L^0.7) * (K^0.3) L /64

33 2 R A Y > plotfun(a*(l^0.7)*(k^0.3)~l,k=20,a=5,xlim=range(-1,21), ylim=range(-5,151)) > plotfun(a*(l^0.7)*(k^0.3)~l,k=20, A=10,xlim=range(-1,21), ylim=range(-5,151), lty=2,add=true ) A * (L^0.7) * (K^0.3) L /64

34 ( ) 2 R > plotfun(a*(l^0.7)*(k^0.3)~l&k,a=5,xlim=range(0,21), ylim=range(0,100), filled=false) K L /64

35 3 R 2 R 3 R R RESAS /64

36 3 R (U) U x (x, y) p x = U y(x, y) p y (3) U x (x, y) U(x,y) x, P i i /64

37 3 R : (1) p x = 1, p y = 2 U = x + 2 x y + y (4) U x = 1 + x 1 2 y, U y = 1 + x y 1 2 (5) (3) y 1 2 x 1 2 = 1 2 (6) /64

38 3 R : (2) : p x x + p y y = m ( m ) (3) x = mp y p x (p x + p y ), and y = mp x p y (p x + p y ) (7) m = 6 x = 4 y = /64

39 3 R R max U = x + 2 x y + y (8) s.t. x + 2y = 6 (9) x = 4 y = /64

40 3 R R 1 x< seq(0,5,1) # y< seq(0,5,1) # g< function(x,y) x+2 sqrt(x y)+y # 4 z< outer(x,y,g) # x y g 5 contour(x,y,z) # x-y 6 par(new=t) # 7 8 contour(x,y,z,level=9) # x-y z=9 9 par(new=t) gg< function(x,y) x+2 y # 12 z< outer(x,y,gg) # x y gg 13 contour(x,y,z,level=6, col="red",lwd=3,xlab="x", ylab="y") abline(h=1,lty=2) # x=1 ( ) 16 abline(v=4,lty=2) # y=4 ( ) /64

41 3 R /64

42 R 2 R 3 R R RESAS /64

43 R /64

44 R (2b) /64

45 R (2c) /64

46 R 2 i, j R D GDP R ij = GDP igdp j D ij (10) ln R ij = β 0 + β 1 ln GDP i + β 2 ln GDP j β 3 ln D ij + ϵ (11) /64

47 R UN Comtrade CEPII (BACI) GDP World Development Indicators R WDI CEPII The CEPII Gravity Dataset /64

48 R I Y = α + βx (12) /64

49 R II (X i, Y i ) µ i µ i = Y i α βx i (13) /64

50 R (1) J α β α β J = n ˆµ 2 i = (Y i α βx i ) 2 (14) J α = i=1 n [ 2(Y i α βx i )] = 0 (15) i=1 J β = n [ 2X i (Y i α βx i )] = 0 (16) i= /64

51 R (2) ˆβ = n i=1 (X i X)(Y i Y ) n i=1 (X i X) 2 (17) ˆα = Y ˆβX (18) ˆα ˆβ /64

52 R : GDP WDI GDP 1 library(wdi) # WDI 2 3 WDIsearch(string="GDP") # GDP 4 5 dat < WDI(indicator= NY.GDP.MKTP.CD, country=c( JP, KR, CN ), start=1980, end=2012) 6 # GDP 7 8 library(ggplot2) # 9 10 ggplot(dat, aes(year, NY.GDP.MKTP.CD/ , color= country)) + geom line() + 11 xlab( Year ) + ylab( GDP (current billion US$) ) /64

53 R GDP 7500 GDP (current billion US$) 5000 country China Japan Korea, Rep Year /64

54 R R : (1) 1 trade.lm< lm(log(trade) log(gdp)+log(gdp.china)+log( distance), data=dataset) 2 # OLS 3 4 summary(trade.lm) # /64

55 R R : (2) 1 2 Coefficients: 3 Estimate Std. Er. t value Pr(> t ) 4 (Intercept) log(gdp) e 08 6 log(gdp.china) e 16 7 log(distance) Signif. codes: Residual standard error: on 38 degrees of freedom 12 Multiple R squared: , Adjusted R squared: F statistic: on 3 and 38 DF, p value: < 2.2e /64

56 R (1) (null hypothesis) (H 0 ) (H 1 ) /64

57 R (2) H 0 H 0 H 1 H /64

58 R 3a OLS /64

59 R R : (1) (colgpa) (hsgpa) (ACT) 1 library(foreign) # R 2 3 html< " # 4 5 gpa1< read.dta(html) # 6 7 GPAres< lm(colgpa hsgpa+act, data=gpa1) # 8 9 summary(gpares) # /64

60 R R : (2) 1 Call:lm(formula = colgpa hsgpa + ACT, data = gpa1) 2 3 Residuals: 4 Min 1Q Median 3Q Max Coefficients: 8 Estimate Std. Error t value Pr(> t ) 9 (Intercept) hsgpa e ACT Signif. codes: Residual standard error: on 138 degrees of freedom 16 Multiple R squared: , Adjusted R squared: /64

61 R 3b OLS /64

62 RESAS 2 R 3 R R RESAS /64

63 RESAS RESAS RESAS RESAS RESAS /64

64 RESAS Dayal, Vikram (2015) An Introduction to R for Quantitative Economics: Graphing, Simulating and Computing, Springer. Heisss, Florian (2016) Using R for Introductory Econometrics, ( ) (2008). (2000). (2012) RIETI ( (2016) R - -,. (1995) /64

(lm) lm AIC 2 / 1

(lm) lm AIC 2 / 1 W707 s-taiji@is.titech.ac.jp 1 / 1 (lm) lm AIC 2 / 1 : y = β 1 x 1 + β 2 x 2 + + β d x d + β d+1 + ϵ (ϵ N(0, σ 2 )) y R: x R d : β i (i = 1,..., d):, β d+1 : ( ) (d = 1) y = β 1 x 1 + β 2 + ϵ (d > 1) y

More information

DAA09

DAA09 > summary(dat.lm1) Call: lm(formula = sales ~ price, data = dat) Residuals: Min 1Q Median 3Q Max -55.719-19.270 4.212 16.143 73.454 Coefficients: Estimate Std. Error t value Pr(> t ) (Intercept) 237.1326

More information

R John Fox R R R Console library(rcmdr) Rcmdr R GUI Windows R R SDI *1 R Console R 1 2 Windows XP Windows * 2 R R Console R ˆ R

R John Fox R R R Console library(rcmdr) Rcmdr R GUI Windows R R SDI *1 R Console R 1 2 Windows XP Windows * 2 R R Console R ˆ R R John Fox 2006 8 26 2008 8 28 1 R R R Console library(rcmdr) Rcmdr R GUI Windows R R SDI *1 R Console R 1 2 Windows XP Windows * 2 R R Console R ˆ R GUI R R R Console > ˆ 2 ˆ Fox(2005) jfox@mcmaster.ca

More information

Use R

Use R Use R! 2008/05/23( ) Index Introduction (GLM) ( ) R. Introduction R,, PLS,,, etc. 2. Correlation coefficient (Pearson s product moment correlation) r = Sxy Sxx Syy :, Sxy, Sxx= X, Syy Y 1.96 95% R cor(x,

More information

untitled

untitled 2011/6/22 M2 1*1+2*2 79 2F Y YY 0.0 0.2 0.4 0.6 0.8 0.000 0.002 0.004 0.006 0.008 0.010 0.012 1.0 1.5 2.0 2.5 3.0 3.5 4.0 Y 0 50 100 150 200 250 YY A (Y = X + e A ) B (YY = X + e B ) X 0.00 0.05 0.10

More information

1 15 R Part : website:

1 15 R Part : website: 1 15 R Part 4 2017 7 24 4 : website: email: http://www3.u-toyama.ac.jp/kkarato/ kkarato@eco.u-toyama.ac.jp 1 2 2 3 2.1............................... 3 2.2 2................................. 4 2.3................................

More information

講義のーと : データ解析のための統計モデリング. 第3回

講義のーと :  データ解析のための統計モデリング. 第3回 Title 講義のーと : データ解析のための統計モデリング Author(s) 久保, 拓弥 Issue Date 2008 Doc URL http://hdl.handle.net/2115/49477 Type learningobject Note この講義資料は, 著者のホームページ http://hosho.ees.hokudai.ac.jp/~kub ードできます Note(URL)http://hosho.ees.hokudai.ac.jp/~kubo/ce/EesLecture20

More information

201711grade2.pdf

201711grade2.pdf 2017 11 26 1 2 28 3 90 4 5 A 1 2 3 4 Web Web 6 B 10 3 10 3 7 34 8 23 9 10 1 2 3 1 (A) 3 32.14 0.65 2.82 0.93 7.48 (B) 4 6 61.30 54.68 34.86 5.25 19.07 (C) 7 13 5.89 42.18 56.51 35.80 50.28 (D) 14 20 0.35

More information

R Console >R ˆ 2 ˆ 2 ˆ Graphics Device 1 Rcmdr R Console R R Rcmdr Rcmdr Fox, 2007 Fox and Carvalho, 2012 R R 2

R Console >R ˆ 2 ˆ 2 ˆ Graphics Device 1 Rcmdr R Console R R Rcmdr Rcmdr Fox, 2007 Fox and Carvalho, 2012 R R 2 R John Fox Version 1.9-1 2012 9 4 2012 10 9 1 R R Windows R Rcmdr Mac OS X Linux R OS R R , R R Console library(rcmdr)

More information

> usdata01 と打ち込んでエンター キーを押すと V1 V2 V : : : : のように表示され 読み込まれていることがわかる ここで V1, V2, V3 は R が列のデータに自 動的につけた変数名である ( variable

> usdata01 と打ち込んでエンター キーを押すと V1 V2 V : : : : のように表示され 読み込まれていることがわかる ここで V1, V2, V3 は R が列のデータに自 動的につけた変数名である ( variable R による回帰分析 ( 最小二乗法 ) この資料では 1. データを読み込む 2. 最小二乗法によってパラメーターを推定する 3. データをプロットし 回帰直線を書き込む 4. いろいろなデータの読み込み方について簡単に説明する 1. データを読み込む 以下では read.table( ) 関数を使ってテキストファイル ( 拡張子が.txt のファイル ) のデー タの読み込み方を説明する 1.1

More information

BMIdata.txt DT DT <- read.table("bmidata.txt") DT head(dt) names(dt) str(dt)

BMIdata.txt DT DT <- read.table(bmidata.txt) DT head(dt) names(dt) str(dt) ?read.table read.table(file, header = FALSE, sep = "", quote = "\" ", dec = ".", numerals = c("allow.loss", "warn.loss", "no.loss"), row.names, col.names, as.is =!stringsasfactors, na.strings = "NA", colclasses

More information

k2 ( :35 ) ( k2) (GLM) web web 1 :

k2 ( :35 ) ( k2) (GLM) web   web   1 : 2012 11 01 k2 (2012-10-26 16:35 ) 1 6 2 (2012 11 01 k2) (GLM) kubo@ees.hokudai.ac.jp web http://goo.gl/wijx2 web http://goo.gl/ufq2 1 : 2 2 4 3 7 4 9 5 : 11 5.1................... 13 6 14 6.1......................

More information

J1順位と得点者数の関係分析

J1順位と得点者数の関係分析 2015 年度 S-PLUS & Visual R Platform 学生研究奨励賞応募 J1 順位と得点者数の関係分析 -J リーグの得点数の現状 - 目次 1. はじめに 2. 研究目的 データについて 3.J1 リーグの得点数の現状 4. 分析 5. まとめ 6. 今後の課題 - 参考文献 - 東海大学情報通信学部 経営システム工学科 山田貴久 1. はじめに 1993 年 5 月 15 日に

More information

最小2乗法

最小2乗法 2 2012 4 ( ) 2 2012 4 1 / 42 X Y Y = f (X ; Z) linear regression model X Y slope X 1 Y (X, Y ) 1 (X, Y ) ( ) 2 2012 4 2 / 42 1 β = β = β (4.2) = β 0 + β (4.3) ( ) 2 2012 4 3 / 42 = β 0 + β + (4.4) ( )

More information

第11回:線形回帰モデルのOLS推定

第11回:線形回帰モデルのOLS推定 11 OLS 2018 7 13 1 / 45 1. 2. 3. 2 / 45 n 2 ((y 1, x 1 ), (y 2, x 2 ),, (y n, x n )) linear regression model y i = β 0 + β 1 x i + u i, E(u i x i ) = 0, E(u i u j x i ) = 0 (i j), V(u i x i ) = σ 2, i

More information

28

28 y i = Z i δ i +ε i ε i δ X y i = X Z i δ i + X ε i [ ] 1 δ ˆ i = Z i X( X X) 1 X Z i [ ] 1 σ ˆ 2 Z i X( X X) 1 X Z i Z i X( X X) 1 X y i σ ˆ 2 ˆ σ 2 = [ ] y i Z ˆ [ i δ i ] 1 y N p i Z i δ ˆ i i RSTAT

More information

1 2 Windows 7 *3 Windows * 4 R R Console R R Console ˆ R GUI R R R *5 R 2 R R R 6.1 ˆ 2 ˆ 2 ˆ Graphics Device 1 Rcmdr R Console R Rconsole R --sdi R M

1 2 Windows 7 *3 Windows * 4 R R Console R R Console ˆ R GUI R R R *5 R 2 R R R 6.1 ˆ 2 ˆ 2 ˆ Graphics Device 1 Rcmdr R Console R Rconsole R --sdi R M R John Fox and Milan Bouchet-Valat Version 2.0-1 2013 11 8 2013 11 11 1 R Fox 2005 R R Core Team, 2013 GUI R R R R R R R R R the Comprehensive R Archive Network (CRAN) R CRAN 6.4 R Windows R Rcmdr Mac

More information

k3 ( :07 ) 2 (A) k = 1 (B) k = 7 y x x 1 (k2)?? x y (A) GLM (k

k3 ( :07 ) 2 (A) k = 1 (B) k = 7 y x x 1 (k2)?? x y (A) GLM (k 2012 11 01 k3 (2012-10-24 14:07 ) 1 6 3 (2012 11 01 k3) kubo@ees.hokudai.ac.jp web http://goo.gl/wijx2 web http://goo.gl/ufq2 1 3 2 : 4 3 AIC 6 4 7 5 8 6 : 9 7 11 8 12 8.1 (1)........ 13 8.2 (2) χ 2....................

More information

Rによる計量分析:データ解析と可視化 - 第2回 セットアップ

Rによる計量分析:データ解析と可視化 - 第2回 セットアップ R 2 2017 Email: gito@eco.u-toyama.ac.jp October 16, 2017 Outline 1 ( ) 2 R RStudio 3 4 R (Toyama/NIHU) R October 16, 2017 1 / 34 R RStudio, R PC ( ) ( ) (Toyama/NIHU) R October 16, 2017 2 / 34 R ( ) R

More information

一般化線形 (混合) モデル (2) - ロジスティック回帰と GLMM

一般化線形 (混合) モデル (2) - ロジスティック回帰と GLMM .. ( ) (2) GLMM kubo@ees.hokudai.ac.jp I http://goo.gl/rrhzey 2013 08 27 : 2013 08 27 08:29 kubostat2013ou2 (http://goo.gl/rrhzey) ( ) (2) 2013 08 27 1 / 74 I.1 N k.2 binomial distribution logit link function.3.4!

More information

研修コーナー

研修コーナー l l l l l l l l l l l α α β l µ l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l l

More information

untitled

untitled IT (1, horiike@ml.me.titech.ac.jp) (1, jun-jun@ms.kagu.tus.ac.jp) 1. 1-1 19802000 2000ITIT IT IT TOPIX (%) 1TOPIX 2 1-2. 80 80 ( ) 2004/11/26 S-PLUS 2 1-3. IT IT IT IT 2. 2-1. a. b. (Size) c. B/M(Book

More information

²¾ÁÛ¾õ¶·É¾²ÁË¡¤Î¤¿¤á¤Î¥Ñ¥Ã¥±¡¼¥¸DCchoice ¡Ê»ÃÄêÈÇ¡Ë

²¾ÁÛ¾õ¶·É¾²ÁË¡¤Î¤¿¤á¤Î¥Ñ¥Ã¥±¡¼¥¸DCchoice ¡Ê»ÃÄêÈÇ¡Ë DCchoice ( ) R 2013 2013 11 30 DCchoice package R 2013/11/30 1 / 19 1 (CV) CV 2 DCchoice WTP 3 DCchoice package R 2013/11/30 2 / 19 (Contingent Valuation; CV) WTP CV WTP WTP 1 1989 2 DCchoice package R

More information

<4D F736F F F696E74202D BD95CF97CA89F090CD F6489F18B4195AA90CD816A>

<4D F736F F F696E74202D BD95CF97CA89F090CD F6489F18B4195AA90CD816A> 主な多変量解析 9. 多変量解析 1 ( 重回帰分析 ) 目的変数 量的 説明変数 質的 あり量的 重回帰分析 数量化 Ⅰ 類 質的 判別分析 数量化 Ⅱ 類 なし 主成分分析因子分析多次元尺度構成法 数量化 Ⅲ 類数量化 Ⅳ 類 その他 クラスタ分析共分散構造分析 説明変数 : 独立変数 予測変数 目的変数 : 従属変数 基準変数 3 1. 単回帰分析各データの構造 y b ax a α: 1,,,

More information

waseda2010a-jukaiki1-main.dvi

waseda2010a-jukaiki1-main.dvi November, 2 Contents 6 2 8 3 3 3 32 32 33 5 34 34 6 35 35 7 4 R 2 7 4 4 9 42 42 2 43 44 2 5 : 2 5 5 23 52 52 23 53 53 23 54 24 6 24 6 6 26 62 62 26 63 t 27 7 27 7 7 28 72 72 28 73 36) 29 8 29 8 29 82 3

More information

回帰分析 単回帰

回帰分析 単回帰 回帰分析 単回帰 麻生良文 単回帰モデル simple regression model = α + β + u 従属変数 (dependent variable) 被説明変数 (eplained variable) 独立変数 (independent variable) 説明変数 (eplanator variable) u 誤差項 (error term) 撹乱項 (disturbance term)

More information

1 R Windows R 1.1 R The R project web R web Download [CRAN] CRAN Mirrors Japan Download and Install R [Windows 9

1 R Windows R 1.1 R The R project web   R web Download [CRAN] CRAN Mirrors Japan Download and Install R [Windows 9 1 R 2007 8 19 1 Windows R 1.1 R The R project web http://www.r-project.org/ R web Download [CRAN] CRAN Mirrors Japan Download and Install R [Windows 95 and later ] [base] 2.5.1 R - 2.5.1 for Windows R

More information

2 / 39

2 / 39 W707 s-taiji@is.titech.ac.jp 1 / 39 2 / 39 1 2 3 3 / 39 q f (x; α) = α j B j (x). j=1 min α R n+2 n ( d (Y i f (X i ; α)) 2 2 ) 2 f (x; α) + λ dx 2 dx. i=1 f B j 4 / 39 : q f (x) = α j B j (x). j=1 : x

More information

1 kawaguchi p.1/81

1 kawaguchi p.1/81 1 kawaguchi atsushi@kurume-u.ac.jp 2005 7 2 p.1/81 2.1 2.2 2.2.3 2.3 AUC 4.4 p.2/81 X Z X = α + βz + e α : Z = 0 X ( ) β : Z X ( ) e : 0 σ 2 p.3/81 2.1 Z X 1 0.045 2 0.114 4 0.215 6 0.346 7 0.41 8 0.52

More information

こんにちは由美子です

こんにちは由美子です Analysis of Variance 2 two sample t test analysis of variance (ANOVA) CO 3 3 1 EFV1 µ 1 µ 2 µ 3 H 0 H 0 : µ 1 = µ 2 = µ 3 H A : Group 1 Group 2.. Group k population mean µ 1 µ µ κ SD σ 1 σ σ κ sample mean

More information

と入力する すると最初の 25 行が表示される 1 行目は変数の名前であり 2 列目は企業番号 (1,,10),3 列目は西暦 (1935,,1954) を表している ( 他のパネルデータを分析する際もデ ータをこのように並べておかなくてはならない つまりまず i=1 を固定し i=1 の t に関

と入力する すると最初の 25 行が表示される 1 行目は変数の名前であり 2 列目は企業番号 (1,,10),3 列目は西暦 (1935,,1954) を表している ( 他のパネルデータを分析する際もデ ータをこのように並べておかなくてはならない つまりまず i=1 を固定し i=1 の t に関 R によるパネルデータモデルの推定 R を用いて 静学的パネルデータモデルに対して Pooled OLS, LSDV (Least Squares Dummy Variable) 推定 F 検定 ( 個別効果なしの F 検定 ) GLS(Generalized Least Square : 一般化最小二乗 ) 法による推定 およびハウスマン検定を行うやり方を 動学的パネルデータモデルに対して 1 階階差

More information

q( ) 2: R 2 R R R R C:nProgram FilesnRnrw1030) [File] [Change Dir] c:ndatadir OK 2

q( ) 2: R 2 R R R R C:nProgram FilesnRnrw1030) [File] [Change Dir] c:ndatadir OK 2 R 2001 9 R R S Splus R S 1 R 1: R 2 [File] [Exit] 1 q( ) 2: R 2 R R R R C:nProgram FilesnRnrw1030) [File] [Change Dir] c:ndatadir OK 2 2.1 7+3 1 10 7-3 7*3 7/3 7^3 2 > 7+3 [1] 10 > 7-3 [1] 4 > 7*3 [1]

More information

kubostat2017c p (c) Poisson regression, a generalized linear model (GLM) : :

kubostat2017c p (c) Poisson regression, a generalized linear model (GLM) : : kubostat2017c p.1 2017 (c), a generalized linear model (GLM) : kubo@ees.hokudai.ac.jp http://goo.gl/76c4i 2017 11 14 : 2017 11 07 15:43 kubostat2017c (http://goo.gl/76c4i) 2017 (c) 2017 11 14 1 / 47 agenda

More information

R Commanderを用いたデータ解析

R Commanderを用いたデータ解析 1 / 82 R Commander Kengo NAGASHIMA Laboratory of Biostatistics, Department of Parmaceutical Technochemistry, Josai University 2010 1 5 R R Commander 2 / 82 R, "The Comprehensive R Archive Network (CRAN)",

More information

lec03

lec03 # Previous inappropriate version tol = 1e-7; grad = 1e10; lambda = 0.2; gamma = 0.9 x = 10; x.hist = x; v = 0 while (abs(grad)>tol){ grad = 2*x+2 v = gamma*v-lambda*grad x = x + v x.hist=c(x.hist,x) print(c(x,grad))

More information

R による共和分分析 1. 共和分分析を行う 1.1 パッケージ urca インスツールする 共和分分析をするために R のパッケージ urca をインスツールする パッケージとは通常の R には含まれていない 追加的な R のコマンドの集まりのようなものである R には追加的に 600 以上のパッ

R による共和分分析 1. 共和分分析を行う 1.1 パッケージ urca インスツールする 共和分分析をするために R のパッケージ urca をインスツールする パッケージとは通常の R には含まれていない 追加的な R のコマンドの集まりのようなものである R には追加的に 600 以上のパッ R による共和分分析 1. 共和分分析を行う 1.1 パッケージ urca インスツールする 共和分分析をするために R のパッケージ urca をインスツールする パッケージとは通常の R には含まれていない 追加的な R のコマンドの集まりのようなものである R には追加的に 600 以上のパッケージが用意されており それぞれ分析の目的に応じて標準の R にパッケージを追加していくことになる インターネットに接続してあるパソコンで

More information

卒業論文

卒業論文 Y = ax 1 b1 X 2 b2...x k bk e u InY = Ina + b 1 InX 1 + b 2 InX 2 +...+ b k InX k + u X 1 Y b = ab 1 X 1 1 b 1 X 2 2...X bk k e u = b 1 (ax b1 1 X b2 2...X bk k e u ) / X 1 = b 1 Y / X 1 X 1 X 1 q YX1

More information

1 911 9001030 9:00 A B C D E F G H I J K L M 1A0900 1B0900 1C0900 1D0900 1E0900 1F0900 1G0900 1H0900 1I0900 1J0900 1K0900 1L0900 1M0900 9:15 1A0915 1B0915 1C0915 1D0915 1E0915 1F0915 1G0915 1H0915 1I0915

More information

講義のーと : データ解析のための統計モデリング. 第5回

講義のーと :  データ解析のための統計モデリング. 第5回 Title 講義のーと : データ解析のための統計モデリング Author(s) 久保, 拓弥 Issue Date 2008 Doc URL http://hdl.handle.net/2115/49477 Type learningobject Note この講義資料は, 著者のホームページ http://hosho.ees.hokudai.ac.jp/~kub ードできます Note(URL)http://hosho.ees.hokudai.ac.jp/~kubo/ce/EesLecture20

More information

高齢化とマクロ投資比率―国際パネルデータを用いた分析―

高齢化とマクロ投資比率―国際パネルデータを用いた分析― 196 2017 * ** ** ** ** 160 2 2 JEL Classification Codes E21, E22, J11 Keywords * ESRI 28 ESRI 29 3 17 ESRI ** 115 196 Population Aging and Domestic Investment An Analysis Using International Panel Data

More information

3/4/8:9 { } { } β β β α β α β β

3/4/8:9 { } { } β β β α β α β β α β : α β β α β α, [ ] [ ] V, [ ] α α β [ ] β 3/4/8:9 3/4/8:9 { } { } β β β α β α β β [] β [] β β β β α ( ( ( ( ( ( [ ] [ ] [ β ] [ α β β ] [ α ( β β ] [ α] [ ( β β ] [] α [ β β ] ( / α α [ β β ] [ ] 3

More information

カテゴリ変数と独立性の検定

カテゴリ変数と独立性の検定 II L04(2015-05-01 Fri) : Time-stamp: 2015-05-01 Fri 22:28 JST hig 2, Excel 2, χ 2,. http://hig3.net () L04 II(2015) 1 / 20 : L03-S1 Quiz : 1 2 7 3 12 (x = 2) 12 (y = 3) P (X = x) = 5 12 (x = 3), P (Y =

More information

151021slide.dvi

151021slide.dvi : Mac I 1 ( 5 Windows (Mac Excel : Excel 2007 9 10 1 4 http://asakura.co.jp/ books/isbn/978-4-254-12172-8/ (1 1 9 1/29 (,,... (,,,... (,,, (3 3/29 (, (F7, Ctrl + i, (Shift +, Shift + Ctrl (, a i (, Enter,

More information

Rプログラミング

Rプログラミング 5 29 10 10 1 1 2 1 3 Excel 2 3.1 GDP................................... 2 3.2 Excel.................. 3 3.3 Excel............................... 3 3.3.1................................ 4 3.3.2.........................

More information

y i OLS [0, 1] OLS x i = (1, x 1,i,, x k,i ) β = (β 0, β 1,, β k ) G ( x i β) 1 G i 1 π i π i P {y i = 1 x i } = G (

y i OLS [0, 1] OLS x i = (1, x 1,i,, x k,i ) β = (β 0, β 1,, β k ) G ( x i β) 1 G i 1 π i π i P {y i = 1 x i } = G ( 7 2 2008 7 10 1 2 2 1.1 2............................................. 2 1.2 2.......................................... 2 1.3 2........................................ 3 1.4................................................

More information

オーストラリア研究紀要 36号(P)☆/3.橋本

オーストラリア研究紀要 36号(P)☆/3.橋本 36 p.9 202010 Tourism Demand and the per capita GDP : Evidence from Australia Keiji Hashimoto Otemon Gakuin University Abstract Using Australian quarterly data1981: 2 2009: 4some time-series econometrics

More information

第13回:交差項を含む回帰・弾力性の推定

第13回:交差項を含む回帰・弾力性の推定 13 2018 7 27 1 / 31 1. 2. 2 / 31 y i = β 0 + β X x i + β Z z i + β XZ x i z i + u i, E(u i x i, z i ) = 0, E(u i u j x i, z i ) = 0 (i j), V(u i x i, z i ) = σ 2, i = 1, 2,, n x i z i 1 3 / 31 y i = β

More information

The Value Of Interships - Adecco Asia White Paper 2015_no1

The Value Of Interships - Adecco Asia White Paper 2015_no1 Creating Value From Internship Programmes An Adecco Asia White Paper April/May 2015 Introduction 3 4 5 6 The Adecco Asia Network: China Hong Kong Japan Malaysia Singapore South Korea Taiwan Thailand Vietnam

More information

R R-console R R Rscript R-console GUI 1

R R-console R R Rscript R-console GUI 1 November 2015 R R-console R R Rscript R-console GUI 1 2 X Y 1 11.04 21.03 2 15.76 24.75 3 17.72 31.28 4 9.15 11.16 5 10.10 18.89 6 12.33 24.25 7 4.20 10.57 8 17.04 33.99 9 10.50 21.01 10 8.36 9.68 x =

More information

( 30 ) 30 4 5 1 4 1.1............................................... 4 1.............................................. 4 1..1.................................. 4 1.......................................

More information

( 28 ) ( ) ( ) 0 This note is c 2016, 2017 by Setsuo Taniguchi. It may be used for personal or classroom purposes, but not for commercial purp

( 28 ) ( ) ( ) 0 This note is c 2016, 2017 by Setsuo Taniguchi. It may be used for personal or classroom purposes, but not for commercial purp ( 28) ( ) ( 28 9 22 ) 0 This ote is c 2016, 2017 by Setsuo Taiguchi. It may be used for persoal or classroom purposes, but ot for commercial purposes. i (http://www.stat.go.jp/teacher/c2epi1.htm ) = statistics

More information

σ t σ t σt nikkei HP nikkei4csv H R nikkei4<-readcsv("h:=y=ynikkei4csv",header=t) (1) nikkei header=t nikkei4csv 4 4 nikkei nikkei4<-dataframe(n

σ t σ t σt nikkei HP nikkei4csv H R nikkei4<-readcsv(h:=y=ynikkei4csv,header=t) (1) nikkei header=t nikkei4csv 4 4 nikkei nikkei4<-dataframe(n R 1 R R R tseries fseries 1 tseries fseries R Japan(Tokyo) R library(tseries) library(fseries) 2 t r t t 1 Ω t 1 E[r t Ω t 1 ] ɛ t r t = E[r t Ω t 1 ] + ɛ t ɛ t 2 iid (independently, identically distributed)

More information

1.2 R R Windows, Macintosh, Linux(Unix) Windows Mac R Linux redhat, debian, vinelinux ( ) RjpWiki ( RjpWiki Wiki

1.2 R R Windows, Macintosh, Linux(Unix) Windows Mac R Linux redhat, debian, vinelinux ( ) RjpWiki (  RjpWiki Wiki R 2005 9 12 ( ) 1 R 1.1 R R R S-PLUS( ) S version 4( ) S (AT&T Richard A. Becker, John M. Chambers, and Allan R. Wilks ) S S R R S ( ) S GUI( ) ( ) R R R R http://stat.sm.u-tokai.ac.jp/ yama/r/ R yamamoto@sm.u-tokai.ac.jp

More information

% 10%, 35%( 1029 ) p (a) 1 p 95% (b) 1 Std. Err. (c) p 40% 5% (d) p 1: STATA (1). prtesti One-sample test of pr

% 10%, 35%( 1029 ) p (a) 1 p 95% (b) 1 Std. Err. (c) p 40% 5% (d) p 1: STATA (1). prtesti One-sample test of pr 1 1. 2014 6 2014 6 10 10% 10%, 35%( 1029 ) p (a) 1 p 95% (b) 1 Std. Err. (c) p 40% 5% (d) p 1: STATA (1). prtesti 1029 0.35 0.40 One-sample test of proportion x: Number of obs = 1029 Variable Mean Std.

More information

GDP

GDP 1 2 2 2 2.1 GDP............................................. 2 2.2............................................... 2 3 3 3.1.......................................... 3 3.2 1990................................

More information

4 OLS 4 OLS 4.1 nurseries dual c dual i = c + βnurseries i + ε i (1) 1. OLS Workfile Quick - Estimate Equation OK Equation specification dual c nurser

4 OLS 4 OLS 4.1 nurseries dual c dual i = c + βnurseries i + ε i (1) 1. OLS Workfile Quick - Estimate Equation OK Equation specification dual c nurser 1 EViews 2 2007/5/17 2007/5/21 4 OLS 2 4.1.............................................. 2 4.2................................................ 9 4.3.............................................. 11 4.4

More information

‚åŁÎ“·„´Šš‡ðŠp‡¢‡½‹âfi`fiI…A…‰…S…−…Y…•‡ÌMarkovŸA“½fiI›ð’Í

‚åŁÎ“·„´Šš‡ðŠp‡¢‡½‹âfi`fiI…A…‰…S…−…Y…•‡ÌMarkovŸA“½fiI›ð’Í Markov 2009 10 2 Markov 2009 10 2 1 / 25 1 (GA) 2 GA 3 4 Markov 2009 10 2 2 / 25 (GA) (GA) L ( 1) I := {0, 1} L f : I (0, ) M( 2) S := I M GA (GA) f (i) i I Markov 2009 10 2 3 / 25 (GA) ρ(i, j), i, j I

More information

plot type type= n text plot type= n text(x,y) iris 5 iris iris.label >iris.label<-rep(c(,, ),rep(50,3)) 2 13 >plot(iris[,1],iris

plot type type= n text plot type= n text(x,y) iris 5 iris iris.label >iris.label<-rep(c(,, ),rep(50,3)) 2 13 >plot(iris[,1],iris 23 2 2 R iris 1 3 plot >plot(iris[,1],iris[,3]) 11 iris[, 3] 1 2 3 4 5 6 7 iris[, 3] 1 2 3 4 5 6 7 119 106 118 123 108 132 101 110 103 104 105 126 131 136 144 109 125 145121 130 135137 129 133 141 138

More information

情報管理学科で学ぶ

情報管理学科で学ぶ 1/17 ` http://www.biwako.shiga-u.ac.jp/sensei/kumazawa/ 6............................................ 5 1............................... 1 1.1 I II III 1 1.2 2 1.3 2 2......................................

More information

スライド 1

スライド 1 2030 (2004) 1 2 3 1 212004 5.5203031 (1) 2004GDP () 2030GDP )1 2122005 21 2 ASEAN+5 3 207.3EU8.03.3 (2004) 4 10 22.8 16.11 121,006 100 593,369 100 19,715 16 247,813 42 34,217 28 88,772 15 6,832 6 43,746

More information

2 94.3 91.3 5.1 7.5 0.0 0.0 0.1 0.5 0.6 0.1 0.1 0.4 21.4% 15.8% 14.8% 15.0% 16.0% 16.5% 0.5% 16.1% 15.2% 16.9% 15.7% 17.1% 18.6% 0.4% 21.4% 15.8% 14.8

2 94.3 91.3 5.1 7.5 0.0 0.0 0.1 0.5 0.6 0.1 0.1 0.4 21.4% 15.8% 14.8% 15.0% 16.0% 16.5% 0.5% 16.1% 15.2% 16.9% 15.7% 17.1% 18.6% 0.4% 21.4% 15.8% 14.8 15 7 8,000 15 4 1 0 5 15 4 2 15 10 1 15 4 1 6 11 4,500 3,500 16 26 35 27 34 16 2 19 16 2 24 16 3 15 1 2 94.3 91.3 5.1 7.5 0.0 0.0 0.1 0.5 0.6 0.1 0.1 0.4 21.4% 15.8% 14.8% 15.0% 16.0% 16.5% 0.5% 16.1%

More information

統計研修R分散分析(追加).indd

統計研修R分散分析(追加).indd http://cse.niaes.affrc.go.jp/minaka/r/r-top.html > mm mm TRT DATA 1 DM1 2537 2 DM1 2069 3 DM1 2104 4 DM1 1797 5 DM2 3366 6 DM2 2591 7 DM2 2211 8

More information

(2004 ) 2 (A) (B) (C) 3 (1987) (1988) Shimono and Tachibanaki(1985) (2008) , % 2 (1999) (2005) 3 (2005) (2006) (2008)

(2004 ) 2 (A) (B) (C) 3 (1987) (1988) Shimono and Tachibanaki(1985) (2008) , % 2 (1999) (2005) 3 (2005) (2006) (2008) ,, 23 4 30 (i) (ii) (i) (ii) Negishi (1960) 2010 (2010) ( ) ( ) (2010) E-mail:fujii@econ.kobe-u.ac.jp E-mail:082e527e@stu.kobe-u.ac.jp E-mail:iritani@econ.kobe-u.ac.jp 1 1 16 (2004 ) 2 (A) (B) (C) 3 (1987)

More information

Stata11 whitepapers mwp-037 regress - regress regress. regress mpg weight foreign Source SS df MS Number of obs = 74 F(

Stata11 whitepapers mwp-037 regress - regress regress. regress mpg weight foreign Source SS df MS Number of obs = 74 F( mwp-037 regress - regress 1. 1.1 1.2 1.3 2. 3. 4. 5. 1. regress. regress mpg weight foreign Source SS df MS Number of obs = 74 F( 2, 71) = 69.75 Model 1619.2877 2 809.643849 Prob > F = 0.0000 Residual

More information

Rによる計量分析:データ解析と可視化 - 第3回 Rの基礎とデータ操作・管理

Rによる計量分析:データ解析と可視化 - 第3回  Rの基礎とデータ操作・管理 R 3 R 2017 Email: gito@eco.u-toyama.ac.jp October 23, 2017 (Toyama/NIHU) R ( 3 ) October 23, 2017 1 / 34 Agenda 1 2 3 4 R 5 RStudio (Toyama/NIHU) R ( 3 ) October 23, 2017 2 / 34 10/30 (Mon.) 12/11 (Mon.)

More information

LA-VAR Toda- Yamamoto(1995) VAR (Lag Augmented vector autoregressive model LA-VAR ) 2 2 Nordhaus(1975) 3 1 (D2)

LA-VAR Toda- Yamamoto(1995) VAR (Lag Augmented vector autoregressive model LA-VAR ) 2 2 Nordhaus(1975) 3 1 (D2) LA-VAR 1 1 1973 4 2000 4 Toda- Yamamoto(1995) VAR (Lag Augmented vector autoregressive model LA-VAR ) 2 2 Nordhaus(1975) 3 1 (D2) E-mail b1215@yamaguchi-u.ac.jp 2 Toda, Hiro Y. and Yamamoto,T.(1995) 3

More information

講義のーと : データ解析のための統計モデリング. 第2回

講義のーと :  データ解析のための統計モデリング. 第2回 Title 講義のーと : データ解析のための統計モデリング Author(s) 久保, 拓弥 Issue Date 2008 Doc URL http://hdl.handle.net/2115/49477 Type learningobject Note この講義資料は, 著者のホームページ http://hosho.ees.hokudai.ac.jp/~kub ードできます Note(URL)http://hosho.ees.hokudai.ac.jp/~kubo/ce/EesLecture20

More information

1 Stata SEM LightStone 4 SEM 4.. Alan C. Acock, Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press 3.

1 Stata SEM LightStone 4 SEM 4.. Alan C. Acock, Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press 3. 1 Stata SEM LightStone 4 SEM 4.. Alan C. Acock, 2013. Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press 3. 2 4, 2. 1 2 2 Depress Conservative. 3., 3,. SES66 Alien67 Alien71,

More information

kubostat2017e p.1 I 2017 (e) GLM logistic regression : : :02 1 N y count data or

kubostat2017e p.1 I 2017 (e) GLM logistic regression : : :02 1 N y count data or kubostat207e p. I 207 (e) GLM kubo@ees.hokudai.ac.jp https://goo.gl/z9ycjy 207 4 207 6:02 N y 2 binomial distribution logit link function 3 4! offset kubostat207e (https://goo.gl/z9ycjy) 207 (e) 207 4

More information

kubostat2015e p.2 how to specify Poisson regression model, a GLM GLM how to specify model, a GLM GLM logistic probability distribution Poisson distrib

kubostat2015e p.2 how to specify Poisson regression model, a GLM GLM how to specify model, a GLM GLM logistic probability distribution Poisson distrib kubostat2015e p.1 I 2015 (e) GLM kubo@ees.hokudai.ac.jp http://goo.gl/76c4i 2015 07 22 2015 07 21 16:26 kubostat2015e (http://goo.gl/76c4i) 2015 (e) 2015 07 22 1 / 42 1 N k 2 binomial distribution logit

More information

1. A0 A B A0 A : A1,...,A5 B : B1,...,B

1. A0 A B A0 A : A1,...,A5 B : B1,...,B 1. A0 A B A0 A : A1,...,A5 B : B1,...,B12 2. 3. 4. 5. A0 A B f : A B 4 (i) f (ii) f (iii) C 2 g, h: C A f g = f h g = h (iv) C 2 g, h: B C g f = h f g = h 4 (1) (i) (iii) (2) (iii) (i) (3) (ii) (iv) (4)

More information

物価変動の決定要因について ― 需給ギャップと物価変動の関係の国際比較を中心に―

物価変動の決定要因について ― 需給ギャップと物価変動の関係の国際比較を中心に― NAIRU NAIRU NAIRU GDPGDP NAIRUNon- Accelerating Inflation Rate of Unemployment GDP GDP NAIRU Lown and RichFisher, Mahadeva and Whitley raw materials G NAIRUTurnerFai WatanabeNAIRU Watanabe nested NAIRU

More information

Excess Capacity and Effectiveness of Policy Interventions: Evidence from the Cement Industry SMU

Excess Capacity and Effectiveness of Policy Interventions: Evidence from the Cement Industry SMU Excess Capacity and Effectiveness of Policy Interventions: Evidence from the Cement Industry SMU 2017 12 22 (1/2): - 1970-2010 HDD - 2010 (Misallocation) Ghemawat and Nalebuff (1990) / War of Attrition

More information

<4D F736F F F696E74202D2088E D8C768A7789C482CC8A778D5A F939D8C76835C FC96E52E >

<4D F736F F F696E74202D2088E D8C768A7789C482CC8A778D5A F939D8C76835C FC96E52E > 2018 年 8 月 25-27 日遺伝統計学 夏の学校 @ 大阪大学講義実習資料 統計解析ソフトウェア R 入門 大阪大学大学院医学系研究科遺伝統計学 http://www.sg.med.osaka-u.ac.jp/index.html 1 講義の概要 統計解析ソフトウェア R 入門 1 統計解析ソフトウェアRについて 2Rのインストール方法 3 数値計算 変数 ( ベクトル テーブル ) の扱い

More information

「スウェーデン企業におけるワーク・ライフ・バランス調査 」報告書

「スウェーデン企業におけるワーク・ライフ・バランス調査 」報告書 1 2004 12 2005 4 5 100 25 3 1 76 2 Demoskop 2 2004 11 24 30 7 2 10 1 2005 1 31 2 4 5 2 3-1-1 3-1-1 Micromediabanken 2005 1 507 1000 55.0 2 77 50 50 /CEO 36.3 37.4 18.1 3-2-1 43.0 34.4 / 17.6 3-2-2 78 79.4

More information

1. 2 Blank and Winnick (1953) 1 Smith (1974) Shilling et al. (1987) Shilling et al. (1987) Frew and Jud (1988) James Shilling Voith (1992) (Shilling e

1. 2 Blank and Winnick (1953) 1 Smith (1974) Shilling et al. (1987) Shilling et al. (1987) Frew and Jud (1988) James Shilling Voith (1992) (Shilling e Estimation of the Natural Vacancy Rate and it s Instability: Evidence from the Tokyo Office Market * ** *** Sho Kuroda*, Morito Tsutsumi**, Toyokazu Imazeki*** * ** *** rent adjustment mechanismnatural

More information

.1 z = e x +xy y z y 1 1 x 0 1 z x y α β γ z = αx + βy + γ (.1) ax + by + cz = d (.1') a, b, c, d x-y-z (a, b, c). x-y-z 3 (0,

.1 z = e x +xy y z y 1 1 x 0 1 z x y α β γ z = αx + βy + γ (.1) ax + by + cz = d (.1') a, b, c, d x-y-z (a, b, c). x-y-z 3 (0, .1.1 Y K L Y = K 1 3 L 3 L K K (K + ) 1 1 3 L 3 K 3 L 3 K 0 (K + K) 1 3 L 3 K 1 3 L 3 lim K 0 K = L (K + K) 1 3 K 1 3 3 lim K 0 K = 1 3 K 3 L 3 z = f(x, y) x y z x-y-z.1 z = e x +xy y 3 x-y ( ) z 0 f(x,

More information

1 Stata SEM LightStone 3 2 SEM. 2., 2,. Alan C. Acock, Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press.

1 Stata SEM LightStone 3 2 SEM. 2., 2,. Alan C. Acock, Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press. 1 Stata SEM LightStone 3 2 SEM. 2., 2,. Alan C. Acock, 2013. Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press. 2 3 2 Conservative Depress. 3.1 2. SEM. 1. x SEM. Depress.

More information

Kobe University Repository : Kernel タイトル Title 著者 Author(s) 掲載誌 巻号 ページ Citation 刊行日 Issue date 資源タイプ Resource Type 版区分 Resource Version 権利 Rights DOI 日本 メキシコ経済連帯協定の両国間貿易への影響 (< 特集 >FTA/EPA の経済分析 )(Impacts

More information

Microsoft PowerPoint - Econometrics

Microsoft PowerPoint - Econometrics 計量経済学講義 第 25 回 R による計量経済分析 Part-1 2018 年 1 月 5 日 ( 金 )1 限 担当教員 : 唐渡 広志 研究室 : 経済学研究棟 4 階 432 号室 email: kkarato@eco.u-toyama.ac.jp website: http://www3.u-toyama.ac.jp/kkarato/ 1 講義の目的 より高度な計量経済分析を行うために総合

More information

R R 16 ( 3 )

R R 16   ( 3 ) (017 ) 9 4 7 ( ) ( 3 ) ( 010 ) 1 (P3) 1 11 (P4) 1 1 (P4) 1 (P15) 1 (P16) (P0) 3 (P18) 3 4 (P3) 4 3 4 31 1 5 3 5 4 6 5 9 51 9 5 9 6 9 61 9 6 α β 9 63 û 11 64 R 1 65 13 66 14 7 14 71 15 7 R R 16 http://wwwecoosaka-uacjp/~tazak/class/017

More information

遺産相続、学歴及び退職金の決定要因に関する実証分析 『家族関係、就労、退職金及び教育・資産の世代間移転に関する世帯アンケート調査』

遺産相続、学歴及び退職金の決定要因に関する実証分析 『家族関係、就労、退職金及び教育・資産の世代間移転に関する世帯アンケート調査』 2-1. (2-1 ) (2-2 ) (2-3 ) (Hayashi [1986]Dekle [1989]Barthold and Ito [1992] [1996]Campbell [1997] [1998]Shimono and Ishikawa [2002]Shimono and Otsuki [2006] [2008]Horioka [2009]) 1 2-1-1 2-1-1-1 8 (1.

More information

こんにちは由美子です

こんにちは由美子です 1 2 . sum Variable Obs Mean Std. Dev. Min Max ---------+----------------------------------------------------- var1 13.4923077.3545926.05 1.1 3 3 3 0.71 3 x 3 C 3 = 0.3579 2 1 0.71 2 x 0.29 x 3 C 2 = 0.4386

More information

A

A A 2563 15 4 21 1 3 1.1................................................ 3 1.2............................................. 3 2 3 2.1......................................... 3 2.2............................................

More information

計量経済分析 2011 年度夏学期期末試験 担当 : 別所俊一郎 以下のすべてに答えなさい. 回答は日本語か英語でおこなうこと. 1. 次のそれぞれの記述が正しいかどうか判定し, 誤りである場合には理由, あるいはより適切な 記述はどのようなものかを述べなさい. (1) You have to wo

計量経済分析 2011 年度夏学期期末試験 担当 : 別所俊一郎 以下のすべてに答えなさい. 回答は日本語か英語でおこなうこと. 1. 次のそれぞれの記述が正しいかどうか判定し, 誤りである場合には理由, あるいはより適切な 記述はどのようなものかを述べなさい. (1) You have to wo 計量経済分析 2011 年度夏学期期末試験 担当 : 別所俊一郎 以下のすべてに答えなさい. 回答は日本語か英語でおこなうこと. 1. 次のそれぞれの記述が正しいかどうか判定し, 誤りである場合には理由, あるいはより適切な 記述はどのようなものかを述べなさい. (1) You have to worry about perfect multicollinearity in the multiple

More information

.. est table TwoSLS1 TwoSLS2 GMM het,b(%9.5f) se Variable TwoSLS1 TwoSLS2 GMM_het hi_empunion totchr

.. est table TwoSLS1 TwoSLS2 GMM het,b(%9.5f) se Variable TwoSLS1 TwoSLS2 GMM_het hi_empunion totchr 3,. Cameron and Trivedi (2010) Microeconometrics Using Stata, Revised Edition, Stata Press 6 Linear instrumentalvariables regression 9 Linear panel-data models: Extensions.. GMM xtabond., GMM(Generalized

More information

untitled

untitled 18 1 2,000,000 2,000,000 2007 2 2 2008 3 31 (1) 6 JCOSSAR 2007pp.57-642007.6. LCC (1) (2) 2 10mm 1020 14 12 10 8 6 4 40,50,60 2 0 1998 27.5 1995 1960 40 1) 2) 3) LCC LCC LCC 1 1) Vol.42No.5pp.29-322004.5.

More information