Rikon. # x y Rikon Zouka. Ninzu -.3 Kaku. Tomo -1.7 Tandoku.7 X5Sai -1. Kfufu -.5 Ktan.13 Konin.7 # x Zouka Ninzu

Size: px
Start display at page:

Download "Rikon. # x y Rikon Zouka. Ninzu -.3 Kaku. Tomo -1.7 Tandoku.7 X5Sai -1. Kfufu -.5 Ktan.13 Konin.7 # x Zouka Ninzu"

Transcription

1 Copyright (c),5 Hidetoshi Shimodaira -1-13:1: shimo R [ ] x11 x1p y1 = x1,..., xp, y =. xn1 xnp yn i = 1,..., n i (xi1, xi,..., xip, yi) (x1, y1),..., (xn, yn) p 1 (x11, x1,..., x1p, y1),..., (xn1, xn,..., xnp, yn) i = 1,..., n (xi1, xi,..., xip, yi) x11 x1p y1 x1 =,..., xp =, y = xn1 xnp j = 1,..., p i j xij x1j xj = xnj [ ] x11 x1p X = x1,..., xp =. 1 xn1 xnp yn # run5.r # dat <- read.table("dat.txt") # cat("\n# \n"); dim(dat) cat("\n#,,3 \n"); dat[1:3,] cat("\n# j=1,,3 \n"); dat[,1:3] x <- dat[,-1]; # 1,...,9 y <- dat[,1]; # 1 cat("\n# x,,3 \n"); x[1:3,] cat("\n# y,,3 \n"); y[1:3] A <- cbind(x,y) # x y cat("\n# A,,3 ( \n"); A[1:3,] y <- dat[,1,drop=f]; # 1 cat("\n# y,,3 (drop=f )\n"); y[1:3,,drop=f] A <- cbind(x,y) # x y cat("\n# A,,3 ( \n"); A[1:3,] > source("run5.r",print=t) # [1] 7 1 #,,3 Rikon Hokkaido Aomori Iwate # j=1,,3 Zouka Ninzu Kaku Hokkaido...5 Aomori Iwate Miyagi Kumamoto Ooita Miyazaki Kagoshima Okinawa # x,,3 Hokkaido Aomori Iwate # y,,3 [1] # A,,3 ( y Hokkaido Aomori Iwate # y,,3 (drop=f ) Rikon Hokkaido. Aomori 1.9 Iwate 1. # A,,3 ( Rikon Hokkaido Aomori Iwate ( ) : j = 1,..., p xj xj xj = 1 n xij n xj xk () j, k = 1,..., p 1 n Sxjxk = Sjk = n 1 (xij xj)(xik xk) 3 xj xk ) j, k = 1,..., p rxjxk = rjk = Sjk SjjSkk # run57.r # pairs(x) ; dev.copyeps(file="run57-s.eps") pr <- function(a) print(round(a,3)) cat("\n# x \n"); pr(mean(x)) cat("\n# y \n"); pr(mean(y)) cat("\n# x \n"); pr(var(x)) cat("\n# y \n"); pr(var(y)) cat("\n# x y \n"); pr(var(x,y)) cat("\n# x \n"); pr(cor(x)) cat("\n# y?\n"); pr(cor(y)) cat("\n# x y \n"); pr(cor(x,y)) > source("run57.r") # x # y Rikon 1. # x Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # y Rikon

2 Rikon. # x y Rikon Zouka. Ninzu -.3 Kaku. Tomo -1.7 Tandoku.7 X5Sai -1. Kfufu -.5 Ktan.13 Konin.7 # x Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # y? Rikon Rikon 1 # x y Rikon Zouka.31 Ninzu -. Kaku.5 Tomo -.39 Tandoku.57 X5Sai -.71 Kfufu -.53 Ktan.5 Konin Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin run57-s 1.3 xj = 1 1 [ ] n 1 nxj 1n =., 1 n = A A ( x1,..., xp) = 1 n 1 nx S = (Sij) = 1 n 1 Z Z Z = X 1 n 1n1 nx S = 1 n 1 X J nx J n = In 1 n 1n1 n In n n J nj n = (J n) = J n > ## > n <- nrow(x) # > n [1] 7 > rep(1,n) # 1 7 [1] [39] > pr((1/n)*rep(1,n) %*% x) # x Error in rep(1, n) %*% x : requires numeric matrix/vector arguments > x <- as.matrix(x) # > pr(x[1:3,]) # Hokkaido Aomori Iwate > pr((1/n)*rep(1,n) %*% x) # [1,] > pr(mean(x)) # [1] > pr(apply(x,,mean)) # > xm <- (1/n)*rep(1,n) %*% (rep(1,n) %*% x) # > pr(xm[1:3,]) [1,] [,] [3,] > xc <- x - xm # > pr(xc[1:3,]) # Hokkaido Aomori Iwate > pr(rep(1,n) %*% xc) # [1,] > v <- (1/(n-1)) * (t(xc) %*% xc); pr(v) # Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin > pr(var(x)) # Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin > round(v - var(x),1) # Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin > J <- diag(n) - (1/n) * rep(1,n) %o% rep(1,n) # J_n > pr((1/(n-1))* t(x) %*% J %*% x) #

3 Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin > pr(diag(v)) # > pr(sqrt(diag(v) %o% diag(v))) # Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin > pr(v / sqrt(diag(v) %o% diag(v)) ) # Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin > pr(cor(x)) # Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin > round(v / sqrt(diag(v) %o% diag(v)) - cor(x),1) # Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin.1 (x1,..., xp) y y = β + β 1 x β p x p + ɛ x1,..., xp: p y: ɛ: β, β1,..., βp:. ) β, β1,..., βp i = 1,..., n yi = β + β1xi1 + + βpxip + ɛi β, β1,..., βp n ɛ i = (β + β1xi1 + + βpxip yi) 1 β (p + 1) 1 X 1n n (p + 1) β β1 [ ] 1 x11 x1p β =, X = 1n, x1,..., xp =.. 1 xn1 xnp βp y ɛ n 1 y1 ɛ1 y =, ɛ = yn ɛn y = Xβ + ɛ ɛ = Xβ y ˆβ ŷ ŷ = X ˆβ optim # run5.r # ( ) # x y n <- nrow(x); p <- ncol(x) xx <- as.matrix(cbind(1,x)) # 1 rss <- function(be) sum((xx %*% be - y)^) # be <- rep(,p+1) # be1 <- optim(be,rss)$par # names(be1) <- dimnames(xx)[[]] cat("# \n"); print(be1) # cat("# \n"); print(rss(be1)) # pred1 <- xx %*% be1 # \hat y plot(pred1,y,pch=1) # abline(,1,col=) # y 11 dev.copyeps(file="run5-s1.eps") be <- optim(be,rss,method="bfgs")$par # names(be) <- dimnames(xx)[[]] cat("# \n"); print(be) # cat("# \n"); print(rss(be)) # pred <- xx %*% be # \hat y be3 <- optim(be,rss,method="bfgs", control=list(reltol=1e-1))$par # names(be3) <- dimnames(xx)[[]] cat("# \n"); print(be3) # cat("# \n"); print(rss(be3)) # pred3 <- xx %*% be3 # \hat y plot(pred3,y,pch=1) # abline(,1,col=) # y dev.copyeps(file="run5-s3.eps") plot(pred1,pred3,pch=1); abline(,1,col=) dev.copyeps(file="run5-s13.eps") plot(pred,pred3,pch=1); abline(,1,col=) dev.copyeps(file="run5-s3.eps") > dat <- read.table("dat.txt") # (7 x 1 ) > x <- dat[,-1]; y <- dat[,1] > source("run5.r") # 1 Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # [1].913 # 1 Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # [1].73 # 1 Zouka Ninzu Kaku Tomo Tandoku 1

4 y y y X5Sai Kfufu Ktan Konin # [1] ˆβ = (X X) 1 X y A A ɛ = (y Xβ) (y Xβ) = y y β X y + β (X X)β β ɛ β = X y + X Xβ = (normal equation) X Xβ = X y pred1 run5-s pred3 run5-s3 ˆβ = (X X) 1 X y X X pred pred pred1 pred run5-s13 run5-s3 optim ˆβ = X + y A A + X + = (X X) 1 X ) solve() # run59.r # ( ) # x y n <- nrow(x); p <- ncol(x) xx <- as.matrix(cbind(1,x)) # 1 rss <- function(be) sum((xx %*% be - y)^) # A <- t(xx) %*% xx # A = X X be <- solve(a) %*% (t(xx) %*% y) # beta = A^-1 (X y) cat("# \n"); print(be) # cat("# \n"); print(rss(be)) # pred <- xx %*% be # \hat y plot(pred,y,pch=1) # abline(,1,col=) # y dev.copyeps(file="run59-s.eps") 13 1 > source("run59.r") # [,1] Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan.1555 Konin # [1].9979 > be3 - be [,1] e-3 Zouka -5.3e- Ninzu 1.35e-3 Kaku 5.197e-5 Tomo.7e- Tandoku.1577e-5 X5Sai 1.e-5 Kfufu e-5 Ktan -.733e-5 Konin 7.131e-5 > rss(be3) - rss(be) [1].9557e pred run59-s optim optim optim. R lsfit() lm() # run.r # ( ) # x y cat("# lsfit \n") fit1 <- lsfit(x,y) # QR print(fit1$coef) # cat("# lm \n") fit <- lm(y ~., data.frame(x,y)) # print(fit$coef) # cat("# lsfit \n") ls.print(fit1) # cat("# lm \n") print(summary(fit)) # 15 1

5 > source("run.r") # lsfit Intercept Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # lm (Intercept) Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # lsfit Residual Standard Error=.13 R-Square=.15 F-statistic (df=9, 37)=1.539 p-value= Estimate Std.Err t-value Pr(> t ) Intercept Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin Zouka * Ninzu ** Kaku Tomo Tandoku * X5Sai Kfufu ** Ktan Konin Signif. codes: ***.1 **.1 * Residual standard error:.13 on 37 degrees of freedom Multiple R-Squared:.15,Adjusted R-squared:.773 F-statistic: 1.53 on 9 and 37 DF, p-value: 3.51e-11 > names(fit1) # lsfit() [1] "coefficients" "residuals" "intercept" "qr" > names(fit) # lsfit() [1] "coefficients" "residuals" "effects" "rank" [5] "fitted.values" "assign" "qr" "df.residual" [9] "xlevels" "call" "terms" "model" > names(ls.print(fit1,print=f)) # lsfit() [1] "summary" "coef.table" > names(summary(fit)) # lm() [1] "call" "terms" "residuals" "coefficients" [5] "aliased" "sigma" "df" "r.squared" [9] "adj.r.squared" "fstatistic" "cov.unscaled" # lm lm(formula = y ~., data = data.frame(x, y)) (Intercept) * 17.5 (x1,..., xp) ŷ ŷ = ˆβ + ˆβ1x1 + + ˆβpxp i = 1,..., n ŷi ŷi = ˆβ + ˆβ1xi1 + + ˆβpxip ŷ = X ˆβ ˆβ = (X X) 1 X y 1 ŷ = X ˆβ ŷ = X(X X) 1 X y H = X(X X) 1 X ŷ = Hy H n n H = H H y ŷ i = 1,..., n ei ei = yi ŷi e1 e = = y ŷ en e = (In H)y ē = ŷ ȳ ŷ = 1 n ŷi = 1 n (yi ei) = ȳ ē = ȳ n n ē = HX = X(X X) 1 X X = X e = (In H)y X e X e = X (In H)y = (X X H)y = (X HX) y = X H = X H = (HX) X 1n X e = ē = 1 n 1 ne = n ei = 1 ne n = 1 n (ei )(ŷi n 1 ŷ) = 1 n eiŷi = e ŷ n 1 n 1 = X e = ŷ = X ˆβ e ŷ = e X ˆβ = (X e) ˆβ = ˆβ = 19 n e i = e (RSS, residuals sum of squares) ɛ σ Sɛ 1 n = e i n p 1 β, β1,..., βp p+1 n (p+1) # run1.r # ( ) # x y n <- nrow(x); p <- ncol(x) xx <- as.matrix(cbind(1,x)) # 1 rss <- function(be) sum((xx %*% be - y)^) # A <- t(xx) %*% xx # A = X X H <- xx %*% solve(a) %*% t(xx) # pred <- H %*% y # resid <- y - pred # plot(pred,resid,pch=1) # se <- sum(resid^)/(n - p - 1) # se <- sqrt(se) # epsilon abline(h=) # abline(h=c(se,-se),lty=,col=) # +-se abline(h=c(*se,-*se),lty=3,col=3) # +-se title(sub=paste("sd=",signif(se,5)),cex.sub=) dev.copyeps(file="run1-e.eps") source("run.r") # drawhist drawhist(resid,,"resid","run1-") # > source("run1.r") > mean(resid) # [1].1111e-1 > sum(resid) # [1] e-11 > cov(resid,pred) # [,1] [1,].195e-13 > sum(resid*pred) #

6 [1].5155e-1 > resid*pred # [,1] Hokkaido.7575 Aomori Iwate Miyagi Ooita Miyazaki.339 Kagoshima Okinawa.535 > dim(h) # n * n [1] 7 7 > H[1:3,1:3] # 3 * 3 Hokkaido Aomori Iwate Hokkaido Aomori Iwate > diag(h)[1:3] # Hokkaido Aomori Iwate > hat(x) # diag(h) [1] [7] [13] [19] [5] [31] [37] [3] resid pred sd=.135 run1-e. 1 3 y = ŷ + y ŷ resid mean=.11e 1, sd=.1 run1-resid y ŷ ŷ y ŷ ŷ e = y ŷ ŷ e = y = ŷ + e y = ŷ + e = ŷ + ŷ e + e = ŷ + e ȳ ȳ = 1nȳ = 1 n 1n1 ny y ŷ + ŷ ȳ = y ȳ ȳ y ŷ ȳ ŷ y ŷ ŷ e = y ŷ y ȳ = ŷ ȳ + e y ȳ = ŷ ȳ + e = ŷ ȳ + (ŷ ȳ) e + e = ŷ ȳ + e (ŷ ȳ) e = 1 shaei1x13 shaeiy311 e e.997 R R y ŷ n (yi ȳ)(ŷi ȳ) R = ry ŷ = n (yi ȳ) n (ŷi ȳ) 1 R 1 R 1 R x = 1 x = 1n X = [x,..., xp] x, x1,..., xp Span = ) Span(x, x1,..., xp) = { p j= βjxj β,..., βp R } R n y Span(X) = Span(x, x1,..., xp) Proj Span(X) (y) min y p p Span(X) p Projection= ) p Span(X) β p = Xβ y p = y Xβ Proj Span(X) (y) = ŷ H ŷ = Hy Proj Span(X) (y) = Hy H Span(X).7 ŷ = ˆβ + ˆβ1x ŷ ȳ ˆβ1(x x) n = (ŷi n ȳ) ˆβ = 1(xi x) ry ŷ = ry x x y R = (y ȳ) (ŷ ȳ) y ȳ ŷ ȳ = cos φ x x n (xi x) y ȳ ŷ ȳ φ a a/ a u v φ u v = cos φ R (y ȳ) (ŷ ȳ) = (y ȳ) H(y ȳ) = (y ȳ) H (y ȳ) = H(y ȳ) = ŷ ȳ H = H R ŷ ȳ R = y ȳ ŷ ȳ = ŷ ȳ y ȳ R = cos φ (ŷ ȳ) R = (y ȳ) y = Xβ + ɛ 3

7 R ŷ ȳ = y ȳ R = y ȳ e y ȳ = 1 e y ȳ R = cos φ = 1 sin φ R e e y ȳ # run.r # # x y fit <- lm(y ~., data.frame(x,y)) # resid <- fit$resid # pred <- y - resid # bary <- mean(y) # y cat("\n# \n"); print(fit$coef) cat("# R = ",cor(pred,y),"\n") cat("# R^ = ",cor(pred,y)^,"\n") cat("# R^ = ",sum((pred-bary)^)/sum((y-bary)^),"\n") cat("# R^ = ",1-sum(resid^)/sum((y-bary)^),"\n") cat("# R^ = ",summary(fit)$r.squared,"\n") > source("run.r") # (Intercept) Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # R =.97 # R^ =.117 # R^ =.117 # R^ =.117 # R^ =.117. ɛ1,..., ɛn σ ɛ1,..., ɛn N(, σ ) l(β, β1,..., βp, σ) = n n ) (yi β β1xi1 βpxip) log(πσ ) ( σ β,..., βp, σ l β =,..., l =, βp l = β1 ˆβ = (X X) 1 y, ˆσ = e n l( ˆβ, ˆβ1,..., ˆβp, ˆσ) = n { 1 + log(πˆσ ) } 1. β. σ ˆσ = n p 1 S n ɛ ˆβ,..., ˆβp Sɛ R (xi1, xi,..., xip, yi), i = 1..., n (xi1, xi,..., xip, yi) p + 1 (X1,..., Xp, Y ) 5 # run3.r # # x y source("run.r") # drawhist fit <- lsfit(x,y) # QR func3 <- function(f,y) { # fit coef <- f$coef # resid <- f$resid # se <- sum(resid^)/(length(resid) - length(coef)) # se <- sqrt(se) # (Se) rsq <- cor(y-resid,y)^ # ( y!) names(se) <- "sigma"; names(rsq) <- "rsquared" c(coef,se,rsq) } cat("\n# \n"); print(func3(fit,y)) boot1 <- function(i) # i = n func3(lsfit(x[i,],y[i]),y[i]) # n <- length(y) b <- 1 # cat("\n# \n"); print(boot1(1:n)) simi <- matrix(,n,b) # print(date()) for(j in 1:b) simi[,j] <- sample(1:n,replace=t) # print(date()) simt <- apply(simi,,boot1) # print(date()) cat("\n# \n") a <- apply(simt,1,function(x) unlist(list(mean=mean(x),sd=sd(x)))) print(a) for(k in rownames(simt)) drawhist(simt[k,],,k,"run3-") # cat("\n# lm() \n") print(summary(lm(y~.,data.frame(x,y)))$coef) > dat <- read.table("dat.txt") # (7 x 1 ) > x <- dat[,-1]; y <- dat[,1] > source("run3.r") # Intercept Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin sigma rsquared # Intercept Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin sigma rsquared [1] "Fri Oct 1 1:3:1 " [1] "Fri Oct 1 1:3:19 " [1] "Fri Oct 1 1:3: " # Intercept Zouka Ninzu Kaku Tomo Tandoku mean sd X5Sai Kfufu Ktan Konin sigma rsquared mean sd # lm() (Intercept) Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin Intercept mean= 15.13, sd=.33 run3-intercept Zouka mean= 1.57, sd=.75 run3-zouka Ninzu mean=.95, sd= run3-ninzu 1 Kaku mean=.3119, sd=.397 run3-kaku

8 Tandoku X5Sai # あらかじめ x に説明変数の行列 y に目的変数のベクトルを設定しておく Kfufu 5 1 Tomo 3 pred <- y - fit$resid # 予測値 resid <- fit$resid/sqrt(1-hat(x)) # 修正残差 mean=.15991, sd= mean=.179, sd=.519 run3-tomo run3-kfufu sigma Konin.1 mean=.171, sd=.73 run3-x5sai rsquared dev.copyeps(file="run-hat.eps") yi <- pred + resid[i] # ブートストラップ標本 func3(lsfit(x,yi),yi) # 重回帰分析 } # i = サイズ n の添え字ベクトル boot1 <- function(i) { 1 Ktan.1 mean=.93, sd=.11 run3-tandoku plot(pred,1/sqrt(1-hat(x))) 1 cat("\n# 統計量\n"); print(func3(fit,y)) 3 fit <- lsfit(x,y) # 最小二乗法の計算 QR 分解 mean=.1193, sd= mean=.115, sd=.15 mean=.533, sd=.131 run3-ktan mean=.51, sd=.19 run3-sigma run3-konin b <- 1 # シミュレーションの繰り返し回数 n <- length(y) run3-rsquared cat("\n# 統計量をオリジナルデータへ適用\n"); print(boot1(1:n)) simi <- matrix(,n,b) # ブートストラップ標本の添え字アレイを準備 print(date()) ブートストラップの繰り返し回数=1 だが 30秒程度で終了した for(j in 1:b) simi[,j] <- sample(1:n,replace=t) # ブートストラップ法 回帰係数 β,..., β 1 のバラツキ (sd) は lm() の返す Std.Error と大体同じ値 print(date()) ブートストラップ法では 他の統計量 (S² と R ) のバラツキも簡単に計算できる S² =.135 ±.1 R =.1 ±. だった simt <- apply(simi,,boot1) # 統計量を繰り返し適用 print(date()) cat("\n# 統計量の平均 標準偏差\n") a <- apply(simt,1,function(x) unlist(list(mean=mean(x),sd=sd(x)))) print(a) ブートストラップ法 その2 3. for(k in rownames(simt)) drawhist(simt[k,],,k,"run-") # ヒストグラム 推定した回帰係数 β,..., β p および誤差標準偏差 S² のバラツキを調べる 決定係数 R のバラツキも調べる 残差のリサンプリング ハット行列で補正したバージョンを適用 データ (xi1, xi,..., xip, yi ), cat("\n# lm() を利用してチェック\n") print(summary(lm(y~.,data.frame(x,y)))$coef) > source("run.r") i = 1...,n # 統計量 をリサンプリング 各時点の (xi1, xi,..., xip, yi ) のうち 説明変数 (xi1, xi,..., xip ) は定 Intercept Zouka 数と考える yi だけが 確率変数 修正残差 ri = ei / 1 hii, i = 1,..., n をリサンプリングして ブートストラップ標本 r1,..., rn を作成 これから y1,..., yn のブートストラップ標本 y1,..., yn を次式でつくる yi = y i + ri, Ninzu Kaku X5Sai Kfufu Ktan Intercept Konin sigma rsquared Tomo Tandoku Zouka 1.97 Ninzu X5Sai # 重回帰分析 ブートストラップ法 その2 Kaku Kfufu Ktan # run.r Konin sigma rsquared [1] "Fri Oct 1 1:5:5 " [1] "Fri Oct 1 1:5:5 " ::19 " Intercept Ninzu Kaku Zouka Tandoku.9739 Konin sigma mean= 15.9, sd=.3 run-intercept mean= , sd=.5593 mean= 3.71, sd= 1.15 run-zouka run-ninzu Tomo Tandoku mean=.7, sd=.373 run-kaku X5Sai Kfufu 3 # lm() を利用してチェック sd rsquared mean Ktan Kfufu X5Sai sd. mean Tomo. Kaku.3 Ninzu.3 Zouka # 統計量の平均 標準偏差 Intercept Tandoku # 統計量をオリジナルデータへ適用 i = 1,..., n y i = β + β 1 xi1 + + β p xip [1] "Fri Oct Tomo Pr(> t ) mean=.35, sd=.339 run-x5sai Ktan..3 Konin..1. mean=.17, sd=.195 run-kfufu sigma rsquared Tandoku mean=.1579, sd=.59 run-ktan mean=.1375, sd=.1775 mean=.7, sd=.1173 run-sigma run-konin mean=.1, sd=.5 run-rsquared 1.7 ブートストラップの繰り返し回数=1 だが 30秒程度で終了した 1. 回帰係数 β,..., β 1 のバラツキ (sd) は lm() の返す Std.Error とほとんど同じ値 1.5 ブートストラップ法では 他の統計量 (S² と R ) のバラツキも簡単に計算できる S² = ±.1 R =.1 ±.5 だった 正規回帰モデル 回帰係数のバラツキを計算する理論を学ぶ (lm や lsfit の結果からRが出力する 1.1 1/sqrt(1 hat(x)) Konin. Ktan Kfufu X5Sai Tomo. mean=.1195, sd=.539 run-tandoku Kaku run-tomo 1. mean=.151, sd=.97 Ninzu Zouka t value Std. Error 1 Estimate (Intercept) Std.Error のこと) ブートストラップ法を知っていれば 理論は知らなくても結果は出せる でもやはり理論. pred の勉強はしておくべき run-hat まず 説明変数は定数であるとみなす 残差のリサンプリングと同じ仮定 正規回帰モデルでは 誤差 ²1,..., ²n が互いに独立に そして説明変数に依存せずに 平 均0 分散 σ の正規分布に従うと仮定する ²1,..., ²n N (, σ ) 31 3

9 ɛ σ In n y ɛ ɛ Nn(, σ In) E(ɛ) =, V (ɛ) = σ In y = Xβ + ɛ ɛ y E(y) = E(Xβ) + E(ɛ) = Xβ, V (y) = σ In y Nn(Xβ, σ In) ˆβ = (X X) 1 X y y ˆβ E( ˆβ) = (X X) 1 X E(y) = (X X) 1 X Xβ = β V ( ˆβ) = (X X) 1 X V (y)x(x X) 1 = σ (X X) 1 X X(X X) 1 = σ (X X) 1 (p + 1) (p + 1) A ˆβ Np+1(β, σ (X X) 1 ) A = (aij) = (X X) 1, ˆβi N(βi, σ aii) i, j =,..., p i j ˆβi ˆβj cov( ˆβi, ˆβj) = σ aij, ρ( ˆβi, ˆβj) = aij aiiajj 33 V ( ˆβi) = σ aii ˆσ S ɛ ˆV ( ˆβi) = S ɛ aii se( ˆβi) = t-p-value ti = ˆβi, Sɛ aii T n p 1 t- # run5.r # ˆV ( ˆβi) = Sɛ aii pi = Pr{T > ti } # x y n <- nrow(x); p <- ncol(x) X <- as.matrix(cbind(1,x)) # 1 A <- solve(t(x) %*% X) # A = (X X)^-1 coef <- A %*% (t(x) %*% y) # pred <- X %*% coef # resid <- y - pred # se <- sum(resid^)/(n-p-1) # se <- sqrt(se) # coefsd <- se*sqrt(diag(a)) # tval <- coef/coefsd # t- pval <- *pt(abs(tval),df=n-p-1,lower.tail=f) cat("# t-p- \n"); a <- cbind(round(coef,),round(coefsd,),round(tval,3),round(pval,5)) colnames(a) <- c("coef","sd","t-val","p-val"); print(a) coefcor <- A / sqrt(diag(a) %o% diag(a)) # cat("# \n"); print(round(coefcor,)) fit <- lm(y~.,data.frame(x,y)) # cat("# lm() \n") print(summary(fit,cor=t)) > source("run5.r") # t-p- coef sd t-val p-val Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin # lm() lm(formula = y ~., data = data.frame(x, y)) (Intercept) * Zouka * Ninzu ** Kaku Tomo Tandoku * X5Sai Kfufu ** Ktan Konin Signif. codes: ***.1 **.1 * Residual standard error:.13 on 37 degrees of freedom Multiple R-Squared:.15,Adjusted R-squared:.773 F-statistic: 1.53 on 9 and 37 DF, p-value: 3.51e-11 Correlation of (Intercept) Zouka Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Zouka. Ninzu Kaku Tomo Tandoku X5Sai Kfufu Ktan Konin e = y ŷ = (In H)y HX = X e = (In H)(Xβ + ɛ) = (In H)ɛ E(e) = (In H)E(ɛ) = V (e) = (In H)V (ɛ)(in H) = σ (In H) = σ (In H) e Nn(, σ (In H)) ei N(, σ (1 hii)), i = 1..., n H = (hij) i j ei ej ɛi ɛj cov(ei, ej) = σ hij hij ρ(ei, ej) = (1 hii)(1 hjj) 3

10 ei ri =, 1 hii ri N(, σ ) i = 1,..., n ɛi N(, σ ) ei ri Sɛ (standerdized residuals) MASS stdres internally Studentized residuals) si = ri (Studentized residuals) externally Studentized residuals, t-residuals) MASS studres ti Sɛ ei ti = s(i) 1 hii s (i) = (n p 1)S ɛ e i /(1 hii) n p s (i) i Sɛ ti n p t-.1 # run.r # if(!exists("x.data")) { } X.data <- read.table("xdata.txt") # X X.item <- read.table("xitem.txt") # mygetdat <- function(a,namae=null,echo=t) { # a= dat <- X.data[,a,drop=F] # imitan <- X.item[a,c("Imi","Tani"),drop=F] # if(!is.null(namae)) { # names(dat) <- namae # namae code <- rownames(imitan) # imitan <- cbind(code,imitan) 37 rownames(imitan) <- namae # =namae } if(echo) { cat("# =",nrow(dat),"*",ncol(dat),"\n") cat("# \n") print(dat[1:3,]) cat("# \n") print(imitan) } invisible(dat) } # run7.r # source("run.r") dat <- mygetdat(c("e95","a53"),c("gakureki","shushou")) fit <- lm(shushou~gakureki,dat) print(summary(fit)) plot(shushou~gakureki,dat,pch=1) # abline(fit,col=,lty=) # dev.copyeps(file="run7-s1.eps") plot(shushou~predict(fit),dat,pch=1) # = abline(,1,col=,lty=) # y= dev.copyeps(file="run7-s.eps") plot(predict(fit),resid(fit)/sqrt(1-hatvalues(fit))) # se <- sqrt(sum(resid(fit)^)/(nrow(dat)-)) # Se abline(h=,lty=3,col=); abline(h=*c(se,-se),lty=3,col=3) dev.copyeps(file="run7-z1.eps") plot(predict(fit),sqrt(abs(resid(fit)/(se*sqrt(1-hatvalues(fit)))))) abline(h=,lty=3,col=); abline(h=sqrt(),lty=3,col=3) dev.copyeps(file="run7-z.eps") plot(fit,which=1) # dev.copyeps(file="run7-z3.eps") plot(fit,which=3) # S-L dev.copyeps(file="run7-z.eps") predict(fit) fitted(fit) ŷ1,..., ŷn resid(fit) e1,..., en hatvalues(fit) > source("run7.r") 3 # = 7 * # Gakureki Shushou Hokkaido Aomori Iwate # code Imi Tani Gakureki E95 ( ) Shushou A53 lm(formula = Shushou ~ Gakureki, data = dat) resid(fit)/sqrt(1 hatvalues(fit)) predict(fit) sqrt(abs(resid(fit)/(se * sqrt(1 hatvalues(fit))))) predict(fit) (Intercept) < e-1 *** Gakureki e-9 *** Signif. codes: ***.1 **.1 * Residual standard error:.95 on 5 degrees of freedom Multiple R-Squared:.53,Adjusted R-squared:.5 F-statistic: 51. on 1 and 5 DF, p-value: 5.93e-9 Residuals.... run7-z1 Residuals vs Fitted Okinawa Saga Hokkaido Fitted values lm(formula = Shushou ~ Gakureki, data = dat) run7-z3 Standardized residuals run7-z Scale Location plot Okinawa Hokkaido Saga Fitted values lm(formula = Shushou ~ Gakureki, data = dat) run7-z Shushou Gakureki run7-s1 Shushou predict(fit) run7-s. # run.r # source("run.r") dat <- mygetdat(c("e95","a13","c131","b11","a53"), c("gakureki","mikonw","shotoku","kion","shushou")) fit <- lm(shushou~.,dat) print(summary(fit)) plot(shushou~predict(fit),dat,pch=1) # = abline(,1,col=,lty=) # y= dev.copyeps(file="run-s1.eps") 39

11 plot(fit,which=3) # S-L dev.copyeps(file="run-z1.eps") > source("run.r") # = 7 * 5 # Gakureki MikonW Shotoku Kion Shushou Hokkaido Aomori Iwate # code Imi Tani Gakureki E95 ( ) MikonW A13 ( ) Shotoku C131 ( :thousandyen) Kion B11 ( C) Shushou A53 lm(formula = Shushou ~., data = dat) (Intercept) 3.3e+.1e e-7 *** Gakureki -1.5e-.57e * MikonW -.7e- 7.39e *** Shotoku 1.9e-5.3e Kion.13e- 5.9e *** Signif. codes: ***.1 **.1 * Residual standard error:.7 on degrees of freedom Multiple R-Squared:.731,Adjusted R-squared:.717 F-statistic: 3.37 on and DF, p-value:.7e-1 Shushou Standardized residuals predict(fit) Fitted values lm(formula = Shushou ~., data = dat) run-s1.3 Scale Location plot Hokkaido Nagano Fukui run-z1 y = β + β1x + βx + + βpx p + ɛ # run9.r # source("run.r") dat <- mygetdat(c("b3","b1"),c("yuki","hkion")) cat("# 1 \n") x <- dat[,"yuki"] <- dat[,"yuki"]/1 fit1 <- lm(hkion~yuki,dat) # fit <- lm(hkion~yuki+i(yuki^),dat) # fit3 <- lm(hkion~yuki+i(yuki^)+i(yuki^3),dat) # cat("# \n"); print(summary(fit1)) cat("# \n"); print(summary(fit)) cat("# \n"); print(summary(fit3)) plot(hkion~yuki,dat,pch=1) # abline(fit1,col=) # x <- seq(min(x),max(x),length=3) # x 3 newdat <- data.frame(yuki=x) # lines(x,predict(fit,newdat),col=3) # lines(x,predict(fit3,newdat),col=) # dev.copyeps(file="run9-s.eps") > source("run9.r") 1 # = 7 * # Yuki Hkion Hokkaido 15.3 Aomori Iwate # code Imi Tani Yuki B3 ( ) Hkion B1 ( C) # 1 # lm(formula = Hkion ~ Yuki, data = dat) (Intercept) < e-1 *** Yuki ** Signif. codes: ***.1 **.1 * Residual standard error: 1.3 on 5 degrees of freedom Multiple R-Squared:.199,Adjusted R-squared:.111 F-statistic: on 1 and 5 DF, p-value:.179 # lm(formula = Hkion ~ Yuki + I(Yuki^), data = dat) (Intercept) < e-1 *** Yuki ** I(Yuki^) e-5 *** Signif. codes: ***.1 **.1 * Residual standard error: 1.71 on degrees of freedom Multiple R-Squared:.719,Adjusted R-squared:.79 F-statistic: 19. on and DF, p-value: 7.931e-7 # lm(formula = Hkion ~ Yuki + I(Yuki^) + I(Yuki^3), data = dat) (Intercept) < e-1 *** Yuki *** I(Yuki^) *** I(Yuki^3) * Signif. codes: ***.1 **.1 * Residual standard error: 1.7 on 3 degrees of freedom Multiple R-Squared:.53,Adjusted R-squared:.51 F-statistic: 17.9 on 3 and 3 DF, p-value: 1.7e-7 > model.matrix(fit3) (Intercept) Yuki I(Yuki^) I(Yuki^3) Hokkaido Aomori Iwate Miyagi Ooita Miyazaki Kagoshima

12 Okinawa 1... attr(,"assign") [1] 1 3 # run7.r # dat$yuki <- x^; dat$yuki3 <- x^3 fit3b <- lm(hkion~yuki+yuki+yuki3,dat) cat("# \n"); print(summary(fit3b)) plot(hkion~yuki,dat,pch=1) # newdat$yuki <- x^; newdat$yuki3 <- x^3 pred3b <- as.matrix(cbind(1,newdat)) %*% coef(fit3b) Hokkaido Aomori Iwate > dim(newdat) [1] 3 3 > newdat[1:3,] Yuki Yuki Yuki3 1..e+.e e e e e-7 lines(x,pred3b,col=) # dev.copyeps(file="run7-s.eps") > source("run7.r") # lm(formula = Hkion ~ Yuki + Yuki + Yuki3, data = dat) Hkion Hkion Yuki run9-s Yuki run7-s (Intercept) < e-1 *** Yuki *** Yuki *** Yuki * Signif. codes: ***.1 **.1 * y = β + β1x1 + βx + ɛ 1. y. x1 3. x = 1 x = Residual standard error: 1.7 on 3 degrees of freedom Multiple R-Squared:.53,Adjusted R-squared:.51 F-statistic: 17.9 on 3 and 3 DF, p-value: 1.7e-7 > dim(dat) [1] 7 > dat[1:3,] Yuki Hkion Yuki Yuki3 5 # run71.r # y = (β + β) + β1x1 + ɛ y = β + β1x1 + ɛ source("run.r") source("japan.pref.r") cat("# japan.pref \n") print(japan.pref[1:5,]) dat <- mygetdat(c("c131","c"),c("shotoku","chokin")) dat <- cbind(dat,japan.pref) cat("# Shotoku 1 \n") dat[,"shotoku"] <- dat[,"shotoku"]/1 cat("# \n") fit1 <- lm(chokin~shotoku,dat) print(summary(fit1)) plot(chokin~shotoku,dat,type="n") text(dat$shotoku,dat$chokin,rownames(dat)) abline(fit1,col=) dev.copyeps(file="run71-s1.eps") cat("# \n") fit <- lm(chokin ~ Shotoku + I(Chihou=="Shikoku"), dat) print(summary(fit)) plot(predict(fit),dat$chokin,type="n") text(predict(fit),dat$chokin,rownames(dat)) abline(,1,col=) dev.copyeps(file="run71-s.eps") > source("run71.r") # japan.pref Jpref Jcity Longitude Latitude Umi Chihou Hokkaido Sonota Tohoku Aomori 1..9 Sonota Tohoku Iwate Taihei Tohoku Miyagi Taihei Tohoku Akita Nihon Tohoku # = 7 * # Shotoku Chokin Hokkaido Aomori Iwate 19.7 # code Imi Tani Shotoku C131 ( :thousandyen) Chokin C ( :1thousandyen) # Shotoku 1 7 # lm(formula = Chokin ~ Shotoku, data = dat) (Intercept) Shotoku e- *** Signif. codes: ***.1 **.1 * Residual standard error: 9. on 5 degrees of freedom Multiple R-Squared:.37,Adjusted R-squared:.35 F-statistic: 5.39 on 1 and 5 DF, p-value:.93e- # lm(formula = Chokin ~ Shotoku + I(Chihou == "Shikoku"), data = dat) (Intercept) Shotoku e- *** I(Chihou == "Shikoku")TRUE *** Signif. codes: ***.1 **.1 * Residual standard error: 79.7 on degrees of freedom Multiple R-Squared:.539,Adjusted R-squared:.5 F-statistic:. on and DF, p-value:.13e- > model.matrix(fit)

13 (Intercept) Shotoku I(Chihou == "Shikoku")TRUE Hokkaido Aomori Yamaguchi Tokushima Kagawa Ehime Kochi Fukuoka Saga Okinawa attr(,"assign") [1] 1 attr(,"contrasts") attr(,"contrasts")$"i(chihou == "Shikoku")" [1] "contr.treatment" Chokin Kagawa Wakayama Tokushima Fukui Gifu Toyama Nara Kyoto Osaka Nagano Hyogo Yamanashi Mie OkayamaIshikawa Hiroshima Shizuoka Kochi Ehime Gumma Yamaguchi Shiga Tochigi Tottori Niigata Ibaraki Kanagawa Shimane Saga Ooita Yamagata Fukuoka Hokkaido Nagasaki Iwate Fukushima Kumamoto Kagoshima Akita Miyagi Aomori Miyazaki Okinawa Chiba Saitama Shotoku run71-s1 Aichi Tokyo.5 1. y. x1 dat$chokin Kagawa Wakayama Tokushima Fukui Gifu Toyama Nara Kyoto Osaka Nagano Hyogo Aichi Yamanashi Mie OkayamaIshikawa Hiroshima Shizuoka Gumma Kochi Ehime Yamaguchi Shiga Tochigi Tottori Niigata Ibaraki Kanagawa Shimane Saga Ooita Yamagata Fukuoka Hokkaido Nagasaki Iwate Fukushima Kumamoto Kagoshima Akita Miyagi Aomori Miyazaki Okinawa y = β1x1 + βx + + β9x9 + ɛ 9 Chiba Saitama 5 7 predict(fit) run71-s Tokyo 3. x = 1 x =. x3 = 1 x3 = 5. x = 1 x =. x5 = 1 x5 = 7. x = 1 x =. x7 = 1 x7 = 9. x = 1 x = 1. x9 = 1 x9 = y = β + β1x1 + ɛ y = β3 + β1x1 + ɛ β # run7.r # cat("# beta Chihou \n") fit3 <- lm(chokin ~ -1 + Shotoku + Chihou, dat) print(summary(fit3)) plot(predict(fit3),dat$chokin,type="n") text(predict(fit3),dat$chokin,rownames(dat)) abline(,1,col=) dev.copyeps(file="run7-s1.eps") # beta Chihou lm(formula = Chokin ~ -1 + Shotoku + Chihou, data = dat) Shotoku *** ChihouChugoku ChihouKanto ChihouKinki * 5 ChihouKyushu ChihouShikoku ** ChihouShinetsu * ChihouTohoku ChihouTokai Signif. codes: ***.1 **.1 * Residual standard error: 57.7 on 3 degrees of freedom Multiple R-Squared:.991,Adjusted R-squared:.99 F-statistic: 7.1 on 9 and 3 DF, p-value: <.e-1 > 1-sum(resid(fit3)^)/sum(dat$Chokin^) # summary(lm()) R^ [1] > fit <- lm(chokin ~ 1,dat) # > 1-sum(resid(fit3)^)/sum(resid(fit)^) # R^ [1] > fit <- lm(chokin ~ Shotoku + Chihou, dat) # > summary(fit) # R^ lm(formula = Chokin ~ Shotoku + Chihou, data = dat) (Intercept) Shotoku *** ChihouKanto ChihouKinki ChihouKyushu ** ChihouShikoku ** ChihouShinetsu ChihouTohoku *** ChihouTokai Signif. codes: ***.1 **.1 * Residual standard error: 57.7 on 3 degrees of freedom 51 Multiple R-Squared:.7,Adjusted R-squared:.7371 F-statistic: 17.1 on and 3 DF, dat$chokin Kagawa Wakayama Tokushima Fukui Gifu Toyama Nara Kyoto Osaka Nagano Hyogo Aichi Yamanashi Mie OkayamaIshikawa Hiroshima Shizuoka Gumma Kochi Ehime Yamaguchi Shiga Tochigi Tottori Niigata Ibaraki Kanagawa Shimane Saga Ooita Yamagata Fukuoka Hokkaido Nagasaki Iwate Fukushima Kumamoto Kagoshima Akita Miyagi Aomori Miyazaki Okinawa Chiba Saitama 5 7 predict(fit) run71-s Tokyo p-value: 1.937e-1 dat$chokin Saga Ooita Yamagata Fukuoka Hokkaido Nagasaki Iwate Fukushima Kumamoto Kagoshima AkitaMiyagi Aomori Miyazaki Okinawa Kagawa Wakayama Tokushima Gifu Fukui Toyama Nagano NaraKyoto Osaka Hyogo Aichi Yamanashi Mie Okayama Hiroshima Ishikawa Shizuoka Gumma Kochi Ehime Yamaguchi Shiga Tochigi Tottori Ibaraki KanagawaNiigata Shimane predict(fit3) Saitama Chiba run7-s1 β R ( y = β + ɛ y = ɛ ) > model.matrix(fit3) Shotoku ChihouChugoku ChihouKanto ChihouKinki ChihouKyushu Hokkaido 73.1 Aomori.9 Iwate 1.9 Miyagi 77. Akita 57. Yamagata.9 Fukushima 73.7 Ibaraki Tochigi Gumma 3. 1 Saitama 3. 1 Chiba Tokyo 3. 1 Kanagawa Niigata 9.1 Toyama 9. Ishikawa 99. Fukui 9. Yamanashi.5 1 Nagano Tokyo

14 Gifu 93.1 Shizuoka 37.3 Aichi 359. Mie 7. Shiga Kyoto Osaka Hyogo 3. 1 Nara.7 1 Wakayama 3. 1 Tottori. 1 Shimane.5 1 Okayama 7. 1 Hiroshima Yamaguchi Tokushima 71. Kagawa.1 Ehime 5. Kochi 35.7 Fukuoka Saga Nagasaki. 1 Kumamoto Ooita. 1 Miyazaki Kagoshima Okinawa ChihouShikoku ChihouShinetsu ChihouTohoku ChihouTokai Hokkaido 1 Aomori 1 Iwate 1 Miyagi 1 Akita 1 Yamagata 1 Fukushima 1 Ibaraki Tochigi Gumma Saitama Chiba Tokyo Kanagawa 53 Niigata 1 Toyama 1 Ishikawa 1 Fukui 1 Yamanashi Nagano 1 Gifu 1 Shizuoka 1 Aichi 1 Mie 1 Shiga Kyoto Osaka Hyogo Nara Wakayama Tottori Shimane Okayama Hiroshima Yamaguchi Tokushima 1 Kagawa 1 Ehime 1 Kochi 1 Fukuoka Saga Nagasaki Kumamoto Ooita Miyazaki Kagoshima Okinawa attr(,"assign") [1] 1 attr(,"contrasts") attr(,"contrasts")$chihou [1] "contr.treatment" > model.matrix(fit) (Intercept) Shotoku ChihouKanto ChihouKinki ChihouKyushu Hokkaido Aomori 1.9 Iwate Miyagi Akita Yamagata 1.9 Fukushima Ibaraki Tochigi Gumma Saitama Chiba Tokyo Kanagawa Niigata Toyama 1 9. Ishikawa Fukui 1 9. Yamanashi Nagano Gifu Shizuoka Aichi Mie 1 7. Shiga Kyoto Osaka Hyogo Nara Wakayama Tottori 1. Shimane 1.5 Okayama 1 7. Hiroshima Yamaguchi Tokushima Kagawa 1.1 Ehime 1 5. Kochi Fukuoka Saga Nagasaki 1. 1 Kumamoto Ooita 1. 1 Miyazaki Kagoshima Okinawa ChihouShikoku ChihouShinetsu ChihouTohoku ChihouTokai Hokkaido 1 Aomori 1 Iwate 1 Miyagi 1 Akita 1 Yamagata 1 Fukushima 1 Ibaraki Tochigi Gumma Saitama Chiba Tokyo Kanagawa Niigata 1 Toyama 1 Ishikawa 1 Fukui 1 Yamanashi Nagano 1 Gifu 1 Shizuoka 1 Aichi 1 Mie 1 Shiga Kyoto Osaka Hyogo Nara Wakayama Tottori Shimane Okayama Hiroshima Yamaguchi Tokushima 1 Kagawa 1 5

15 Ehime 1 Kochi 1 Fukuoka Saga Nagasaki Kumamoto Ooita Miyazaki Kagoshima Okinawa attr(,"assign") [1] 1 attr(,"contrasts") attr(,"contrasts")$chihou [1] "contr.treatment" X japan.pref R ŷ y ŷ = y ŷ ri±sɛ 57

Copyright (c) 2004,2005 Hidetoshi Shimodaira :43:33 shimo X = x x 1p x n1... x np } {{ } p n = x (1) x (n) = [x 1,..

Copyright (c) 2004,2005 Hidetoshi Shimodaira :43:33 shimo X = x x 1p x n1... x np } {{ } p n = x (1) x (n) = [x 1,.. Copyright (c) 2004,2005 Hidetoshi Shimodaira 2005-01-19 09:43:33 shimo 1. 2. 3. 1 1.1 X = x 11... x 1p x n1... x np } {{ } p n = x (1) x (n) = [x 1,..., x p ] x (i) x j X X 1 1 n n1 nx R dat

More information

2. S 2 ɛ 3. ˆβ S 2 ɛ (n p 1)S 2 ɛ χ 2 n p 1 Z N(0, 1) S 2 χ 2 n T = Z/ S 2 /n n t- Z T = S2 /n t- n ( ) (n+1)/2 Γ((n + 1)/2) f(t) = 1 + t2 nπγ(n/2) n

2. S 2 ɛ 3. ˆβ S 2 ɛ (n p 1)S 2 ɛ χ 2 n p 1 Z N(0, 1) S 2 χ 2 n T = Z/ S 2 /n n t- Z T = S2 /n t- n ( ) (n+1)/2 Γ((n + 1)/2) f(t) = 1 + t2 nπγ(n/2) n Copright (c) 2004,2005 Hidetoshi Shimodaira 1. t- 2. 3. F 4. 1 t- 1.1 = β0 + β11 + + βpp + ɛ = Xβ + ɛ 2005-04-13 17:37:08 shimo S 2 ɛ ˆV ( ˆβi) = S 2 ɛ aii ŝe( ˆβi) = t-p- ti = ˆβi ŝe( ˆβi), ˆV ( ˆβi)

More information

第6回:データセットの結合

第6回:データセットの結合 6 2018 5 18 1 / 29 1. 2. 3. 2 / 29 Stata Stata dta merge master using _merge master only (1): using only (2): matched (3): 3 / 29 Stata One-to-one on key variables Many-to-one on key variables One-to-many

More information

第2回:データの加工・整理

第2回:データの加工・整理 2 2018 4 13 1 / 24 1. 2. Excel 3. Stata 4. Stata 5. Stata 2 / 24 1 cross section data e.g., 47 2009 time series data e.g., 1999 2014 5 panel data e.g., 47 1999 2014 5 3 / 24 micro data aggregate data 4

More information

-- 2-- 4-- HP 3 2004 HP 6-- 5 8-- 7 / / ( / ) 10-- 77 30 39 14 2 3 3 77 14 9 2514 N 25 % 79 80 85 53 11 %DS 83 85 97 65 12 MJ/kg-wet 1.57 1.48 2.53 0.68 N=1 :40% 10.4MJ/kg-wet 2613 12-- 12 120% 10 100%

More information

Supplementary data

Supplementary data Supplementary data Supplement to: Onozuka D, Gasparrini A, Sera F, Hashizume M, Honda Y. Future projections of temperature-related excess out-of-hospital cardiac arrest under climate change scenarios in

More information

Gift Selection Catalog ご注文例 美味しい卵かけごはんを食べてほしい おすすめセット以外の組み合わせでご注文の場合は 単品番号でご注文ください IWATE YAMAGUCHI KUMAMOTO MIYAZAKI KAGAWA SHIZUOKA AICHI KANAGAWA TOKYO IBARAKI GUNMA SAITAMA GIFU MIE SHIGA KYOTO

More information

(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

1308

1308 国内コンビニエンスストアコンビニエンスストアの店舗数店舗数の推移 推移 Number of stores in Japan *1 2012 年度 1H/FY FY2012 2013 年度 1H/FY FY2013 2013 年度計画 /FY FY2013 2013(Forecast Forecast) 2012.3.1-2012.8.31 2013.3.1-2013.8.31 2013.3.1-2014.2.28

More information

1311

1311 国内コンビニエンスストアコンビニエンスストアの店舗数店舗数の推移 推移 Number of stores in Japan *1 2012 年度 3Q/FY FY2012 2013 年度 3Q/FY FY2013 2013 年度計画 /FY FY2013 2013(Forecast Forecast) 2012.3.1-2012.11.30 2013.3.1-2013.11.30 2013.3.1-2014.2.28

More information

店舗の状況 Number of stores 国内コンビニエンスストアの店舗数の推移 Number of convenience stores in Japan * 2017 年度 /FY 年度 /FY 年度 ( 計画 )/FY2019 (Forecast) 20

店舗の状況 Number of stores 国内コンビニエンスストアの店舗数の推移 Number of convenience stores in Japan * 2017 年度 /FY 年度 /FY 年度 ( 計画 )/FY2019 (Forecast) 20 国内コンビニエンスストアの店舗数の推移 Number of convenience stores in Japan * 2017 年度 /FY2017 2018 年度 /FY2018 2019 年度 ( 計画 )/FY2019 (Forecast) 2017.3.1-2018.2.28 2018.3.1-2019.2.28 2019.3.1-2020.2.29 単体 Non-consolidated

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

100sen_Eng_h1_4

100sen_Eng_h1_4 Sapporo 1 Hakodate Japan 5 2 3 Kanazawa 15 7 Sendai Kyoto Kobe 17 16 10 9 18 20 Hiroshima 11 8 32 31 21 28 26 19 Fukuoka 33 25 13 35 34 23 22 14 12 40 37 27 24 29 41 38 Tokyo 36 42 44 39 30 Nagoya Shizuoka

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

y <- as.vector(xx %*% vv) # yy <- y %o% vv # sum((yy-xx)^) cat("\n") v0 <- rep(0,ncol(xx)-) # print(vv88(v0)) a <- optim(v0,rss88,control=list(trace=t

y <- as.vector(xx %*% vv) # yy <- y %o% vv # sum((yy-xx)^) cat(\n) v0 <- rep(0,ncol(xx)-) # print(vv88(v0)) a <- optim(v0,rss88,control=list(trace=t Copyright (c) 004,005 Hidetoshi Shimodaira.. 3.. x... xp X = xn... xnp {{ p n x () = = [x,..., xp] x (n) x (i) xj X X n n nx 005-0-9 09:43:33 shimo R dat

More information

The Environmental Monitoring 2017 Surface water [1] Total PCBs /surface water (pg/l) Monitored year :2017 stats Detection Frequency (site) :46/47(Miss

The Environmental Monitoring 2017 Surface water [1] Total PCBs /surface water (pg/l) Monitored year :2017 stats Detection Frequency (site) :46/47(Miss Surface water [1] Total PCBs /surface water (pg/l) Detection Frequency (site) :46/47(Missing value :0) Geometric mean 84 Detection Frequency (sample) :46/47(Missing value :0) Median 79 Detection limit

More information

1402

1402 国内コンビニエンスストアコンビニエンスストアの店舗数店舗数の推移 推移 Number of stores in Japan *1 2012 年度 /FY FY2012 2013 年度 /FY FY2013 2014 年度画 /FY FY2014 2014(Forecast Forecast) 2012.3.1-2013.2.28 2013.3.1-2014.2.28 2014.3.1-2015.2.28

More information

資料1-1(3)

資料1-1(3) Table1. Average Time Spent on Activities for All Persons Sample size Population 10 years and over (1000) Sleep Personal care Meals Commuting to and from school or work Work Schoolwork Housework Caring

More information

A Comprehensive Guide to

A Comprehensive Guide to (x 1.000 kl) Altri Vino Whiskey e brandy Shochu Sake Liquori La terza birra Happoshu Birra Produzione di bevande alcoliche in Giappone (kl) Totale Asia Nord America Unione Europea Sudest Asiatico America

More information

Microsoft PowerPoint - Sample info

Microsoft PowerPoint - Sample info List of Microbial Libraries ExMyco StrMyco PowKinoco Contact us http://www.hyphagenesis.co.jp info@hyphagenesis.co.jp HyphaGenesis Inc. 2 37, Tamagawagakuen 6 chome, Machida, Tokyo 194 0041 Tel: 042(860)6258

More information

2014 7 のタイムスリップは 素敵な会 場で 人 大 同窓会のプロ集団笑屋が 同窓会会場に適した全国約120会場を紹介します 同窓会をご検討中の方は 是非ご覧下さい 同窓会会場選びのポイント ヶ条 1 3 2 駅からの アクセスが良い 立食形式で 開催できる 5 窓が多く 天井が高い 開放感のある 会場 4 人数の増減に 柔軟に対応 してくれる 6 料理は量より 質を 飲物は バリエーションが

More information

Workbook1

Workbook1 Table s2. Lexical data from 59 Japonic languages and dialects. Note (1) [!] is pronounced as [m] before [m], [p], [b], [n] before [n], [t], [d], and [!] before [!], [k], [g] (2) [ N ] indicates pre-nasalised

More information

8 Liquor Tax (2) 製成数量の累年比較 ( 単位 :kl) Yearly comparison of volume of production 区 分 平成 23 年度 FY2011 平成 24 年度 FY2012 平成 25 年度 FY2013 平成 26 年度 FY2014 清 合

8 Liquor Tax (2) 製成数量の累年比較 ( 単位 :kl) Yearly comparison of volume of production 区 分 平成 23 年度 FY2011 平成 24 年度 FY2012 平成 25 年度 FY2013 平成 26 年度 FY2014 清 合 8 税 8-3 製成数量 Volume of Production (1) 製成数量 ( 単位 :kl) Volume of production 製 成 数 量 等 Volume of production, etc. 手持数量 Volume in stock 区 分 製 成 Production アルコール等 しょうちゅうの 混 和 品目別アルコール Mixing of alcohol, etc.

More information

2011 Wright 1918 per capita % 2002a, b, c per capita % C-WI C-SCICivil Society Index Y-CSISCI 07 N-SCI 2015 Ko-CHI2011S

2011 Wright 1918 per capita % 2002a, b, c per capita % C-WI C-SCICivil Society Index Y-CSISCI 07 N-SCI 2015 Ko-CHI2011S R-Score as an Indicator for the Relative Rating in Cross-Section Data Analysis Shinichi KUSAKABE Graduate School of Integrated Arts and Sciences, Hiroshima University Abstract Levels of Social Capital

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

01_定食01 (しょうがだし)

01_定食01 (しょうがだし) 006 YAMAGATA 016 TOYAMA 042 NAGASAKI 032 SHIMANE 030 WAKAYAMA 022 SHIZUOKA 037 KAGAWA 027 OSAKA 016 TOYAMA 016 TOYAMA 020 NAGANO 037 KAGAWA 020 NAGANO 016 TOYAMA 040 FUKUOKA 047 OKINAWA 012 CHIBA 004 MIYAGI

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

日本語・日本文化研修留学生各大学コースガイド一覧

日本語・日本文化研修留学生各大学コースガイド一覧 日本語版 の詳細は本リンク集 p.6を御覧ください English Version *Please see p.6 for the detail of ' '. 大学研修 番号コース 1 北海道大学 2019 年度 日本語 日本文化研修留学生コースガイド リンク集 URL List of ' Guide of JAPANESE STUDIES PROGRAM 2019' https://www.oia.hokudai.ac.jp/cier/wp/wpcontent/uploads/2018/11/46647030836572b947d744a5cdef10

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

回帰分析 単回帰

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

More information

都道府県別パネル・データを用いた均衡地価の分析: パネル共和分の応用

都道府県別パネル・データを用いた均衡地価の分析: パネル共和分の応用 No.04-J-7 4 3 * yumi.saita@boj.or.jp ** towa.tachibana@boj.or.jp *** **** toshitaka.sekine@boj.or.jp 103-8660 30 * ** *** London School of Economics **** : Λ y z x 4 3 / 1 (panel cointegration) Meese and

More information

目 次 Ⅰ はじめに Ⅰ-1 SNS とは 1 Ⅰ-2 SNS Chat! の概要 2 Ⅰ-3 画面構成 3 Ⅰ-4 動作環境 4 Ⅰ-5 グループ構成 5 Ⅱ インストール Ⅱ-1 IIS の設定方法 6 Ⅱ-2 SNS Chat! インストール方法 10 Ⅲ 利用者ページ Ⅲ-1 ログインの方法

目 次 Ⅰ はじめに Ⅰ-1 SNS とは 1 Ⅰ-2 SNS Chat! の概要 2 Ⅰ-3 画面構成 3 Ⅰ-4 動作環境 4 Ⅰ-5 グループ構成 5 Ⅱ インストール Ⅱ-1 IIS の設定方法 6 Ⅱ-2 SNS Chat! インストール方法 10 Ⅲ 利用者ページ Ⅲ-1 ログインの方法 情報モラル指導教材 Ver 1 ( 2016.01.01 作成 ) 岩手県立総合教育センター 目 次 Ⅰ はじめに Ⅰ-1 SNS とは 1 Ⅰ-2 SNS Chat! の概要 2 Ⅰ-3 画面構成 3 Ⅰ-4 動作環境 4 Ⅰ-5 グループ構成 5 Ⅱ インストール Ⅱ-1 IIS の設定方法 6 Ⅱ-2 SNS Chat! インストール方法 10 Ⅲ 利用者ページ Ⅲ-1 ログインの方法 12

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

> 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

Microsoft Word - 文書 1

Microsoft Word - 文書 1 第 2 部地震保険 Ⅰ. 地震保険制度の概要 Ⅱ. 地震保険統計 Ⅰ. 地震保険制度の概要 1. 地震保険制度創設の経緯 世界有数の地震国といわれるわが国では 明治以降大きな地震災害が発生するたびに地震保険創設の必要性が叫ばれてきました しかし 地震災害は発生頻度が低いことに加え 大規模な地震が発生すると損害が巨額になる可能性があるため なかなか実現には至りませんでした こうした中 昭和 39(1964)

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

Application for re-entry permit

Application for re-entry permit 再入国許可申請 ( 入国管理法第 26 条 ) About Application for RE-ENTRY PERMIT (Immigration Control Law Article 26) 申告場所 Where should I apply it? 申告場所 / 管轄入国管理局 (Application place) 居住地を管轄する地方入国管理官署に申請を出します 仕事の関係等で配偶者と異なる場所で生活している場合でも

More information

スライド 1

スライド 1 データ解析特論第 10 回 ( 全 15 回 ) 2012 年 12 月 11 日 ( 火 ) 情報エレクトロニクス専攻横田孝義 1 終了 11/13 11/20 重回帰分析をしばらくやります 12/4 12/11 12/18 2 前回から回帰分析について学習しています 3 ( 単 ) 回帰分析 単回帰分析では一つの従属変数 ( 目的変数 ) を 一つの独立変数 ( 説明変数 ) で予測する事を考える

More information

49 育児 児童手当 新制度施行に伴う追 加 0 歳から中学生までの子供を養育している方に手当が支給されます 支給額は子供の年齢や人数によって変わります 支給要件がありますので 市区町村の役場で確認してください 57 法律に関すること [Japan Legal Support Center] 日本司

49 育児 児童手当 新制度施行に伴う追 加 0 歳から中学生までの子供を養育している方に手当が支給されます 支給額は子供の年齢や人数によって変わります 支給要件がありますので 市区町村の役場で確認してください 57 法律に関すること [Japan Legal Support Center] 日本司 日本語学習 生活ハンドブック 新旧対照表 平成 24 年 11 月 5 日文化庁文化部国語課 頁新旧備考 19 1 新しい在留管理制度と外国人住民基本台帳制度 ~ ま ず身分を確保しよう!~ 1 外国人登録と在留手続 ~ まず身分を確保しよう!~ 21 2012 年 7 月 9 日から 新しい在留管理制度が始まりました また 外国人住民 も住民基本台帳の適用対象になりました ( 外国人登録制度は廃止されました

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

第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

情 報 モラル 指 導 教 材 Ver 2.0 ( 2016.05.06 作 成 ) 岩 手 県 立 総 合 教 育 センター http://www1.iwate-ed.jp/ ver2 新 機 能 スマホのバイブレーター 機 能 を 利 用 した 着 信 着 信 時 の 着 信 音 (PC ブラウザ 限 定 ) 自 由 グループ 設 定 ( 好 きな 人 とグループを 作 れる) ユーザ 相 関

More information

Microsoft PowerPoint - 資料04 重回帰分析.ppt

Microsoft PowerPoint - 資料04 重回帰分析.ppt 04. 重回帰分析 京都大学 加納学 Division of Process Control & Process Sstems Engineering Department of Chemical Engineering, Koto Universit manabu@cheme.koto-u.ac.jp http://www-pse.cheme.koto-u.ac.jp/~kano/ Outline

More information

<96DA8E9F2E786C73>

<96DA8E9F2E786C73> Health Statistics in Japan 2007 Contents Page 1.Patients 1-1 Trends in estimated number of patients (per day) by type of health care facility, 1975-2005 1 1-2 Trends in estimated number of patients (per

More information

ပ မ န ပပအလ ပ နၾ Job Fairမ င မည ႔ ပ မ လ ပ ငန ခ ပခင အ တ မ ထ ထက င ခ န အပပင လတ လပ တ င က င န ၂မက အ ပ င မည ႔ လ ပ ငန အ လ က လမည ႔လ က င အ င င က င အ င ပပအလ ပ ထ

ပ မ န ပပအလ ပ နၾ Job Fairမ င မည ႔ ပ မ လ ပ ငန ခ ပခင အ တ မ ထ ထက င ခ န အပပင လတ လပ တ င က င န ၂မက အ ပ င မည ႔ လ ပ ငန အ လ က လမည ႔လ က င အ င င က င အ င ပပအလ ပ ထ MYANMAR JOB FAIR TOKYO (2019 年 3 月 3 日 ( 日 )) 13:00~18:00 日本企業で働くビックチャンスを掴もう! ဂ ပန လ ပ ငန မ တင အလ ပ လ ပ က င က င မင မည ႔ အထ အခတင မည ႔အရ ၾ က ရယၾ ရအ ပက မက င မတန ပတ ပ ပခင ရတ ခ ယ က င ရန အမက အ မ ကမ လ ပ ငန အမ

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

jpn_dm

jpn_dm 946 Furukawa Electric 99 merged with JR East to East Japan JR Furukawa 99 JEF United Ichihara 005 JEF United Ichihara Chiba [Chiba, Chiba] by soccer library 976 99 000 00 004 006 008 00 0 04 06 98 Chuo

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

Excelにおける回帰分析(最小二乗法)の手順と出力

Excelにおける回帰分析(最小二乗法)の手順と出力 Microsoft Excel Excel 1 1 x y x y y = a + bx a b a x 1 3 x 0 1 30 31 y b log x α x α x β 4 version.01 008 3 30 Website:http://keijisaito.info, E-mail:master@keijisaito.info 1 Excel Excel.1 Excel Excel

More information

スライド 1

スライド 1 データ解析特論重回帰分析編 2017 年 7 月 10 日 ( 月 )~ 情報エレクトロニクスコース横田孝義 1 ( 単 ) 回帰分析 単回帰分析では一つの従属変数 ( 目的変数 ) を 一つの独立変数 ( 説明変数 ) で予測する事を考える 具体的には y = a + bx という回帰直線 ( モデル ) でデータを代表させる このためにデータからこの回帰直線の切片 (a) と傾き (b) を最小

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

楽しむ Enjoy

楽しむ Enjoy 楽しむ Enjoy 都道府県 Prefecture スポーツ行動者率 Participation Rate in Sports 77 余暇 Leisure 日曜日の休養 くつろぎ Average time spent on relaxation on Sunday 日曜日の趣味 娯楽 *1 日曜日の交際 付き合い Average time spent on social life on Sunday

More information

楽しむ Enjoy

楽しむ Enjoy 楽しむ Enjoy 都道府県 Prefecture スポーツ行動者率 Participation Rate in Sports 77 余暇 Leisure 日曜日の休養 くつろぎ Average time spent on relaxation on Sunday 日曜日の趣味 娯楽 *1 日曜日の交際 付き合い Average time spent on social life on Sunday

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

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

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

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

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

一般化線形 (混合) モデル (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

宿題の解答

宿題の解答 1 2006 1 17 prob=0.4 size=700 x 8.1 > x plot(x, pbinom(x, size=700, prob=0.4)) > abline(h=c(.025,.975), lty=2) 0.025 L = 254 0.025 U = 305 > pbinom(254, size=700, prob=0.4) [1] 0.02410222

More information

ando_yama.kama

ando_yama.kama 国民年金保険料納付率の都道府県別格差と政治不信 政経学部経済学科 3 年安藤雄祐 政経学部法律政治学科 3 年山本瑞葉 政経学部法律政治学科 3 年釜谷茉里 目次 1. はじめに 2. 先行研究 3. 仮説の提示 4. データ 5. 分析結果 6. 結論と今後の展望 1 1. はじめに 近年 日本では国民年金制度について 様々な問題が指摘されている 例えば 日本の国民年金制度は国民皆保険であるにもかかわらず

More information

11 Energy and Water

11 Energy and Water 381 Seepage383Supply and demand of energy. Indigenous production 2 25 DOMESTIC SUPPLY OF PRIMARY ENERGY (F.Y. 19902013) Import Export Stockpile change Coal Coal products Oil Oil products Natural gas 1)

More information

Jahs. 46(2): (2016)

Jahs. 46(2): (2016) 46 2 123 138 2016 2013 1, 2 * 1, 3 Stable isotopes in precipitation across Japan during an intensive observation period throughout 2013 Kimpei ICHIYANAGI 1, 2 * and Masahiro TANOUE 1, 3 Abstract To elucidate

More information

[R ] ˆ ˆ ˆ R ˆ R ˆ R S C UNIX AT&T( Lucent Technologies) ( C UNIX ) ˆ CRAN ˆ URL

[R ] ˆ ˆ ˆ R  ˆ R ˆ R S C UNIX AT&T( Lucent Technologies) ( C UNIX ) ˆ CRAN ˆ URL uda2008/main.tex 2008/05/02 http://www.is.titech.ac.jp/~shimo/class/ 1 37 1.1.......................................................... 37 1.2....................................................... 45

More information

tokei01.dvi

tokei01.dvi 2. :,,,. :.... Apr. - Jul., 26FY Dept. of Mechanical Engineering, Saga Univ., JAPAN 4 3. (probability),, 1. : : n, α A, A a/n. :, p, p Apr. - Jul., 26FY Dept. of Mechanical Engineering, Saga Univ., JAPAN

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

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

More information

Microsoft Word - 計量研修テキスト_第5版).doc

Microsoft Word - 計量研修テキスト_第5版).doc Q3-1-1 テキスト P59 10.8.3.2.1.0 -.1 -.2 10.4 10.0 9.6 9.2 8.8 -.3 76 78 80 82 84 86 88 90 92 94 96 98 R e s i d u al A c tual Fi tte d Dependent Variable: LOG(TAXH) Date: 10/26/05 Time: 15:42 Sample: 1975

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

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

と入力する すると最初の 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

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

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

uda2008/main.tex 2008/05/

uda2008/main.tex 2008/05/ uda2008/main.tex 2008/05/02 http://www.is.titech.ac.jp/~shimo/class/ 1 37 1.1.......................................................... 37 1.2....................................................... 45

More information

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

インターネットを活用した経済分析 - フリーソフト Rを使おう R 1 1 1 2017 2 15 2017 2 15 1/64 2 R 3 R R RESAS 2017 2 15 2/64 2 R 3 R R RESAS 2017 2 15 3/64 2-4 ( ) ( (80%) (20%) 2017 2 15 4/64 PC LAN R 2017 2 15 5/64 R R 2017 2 15 6/64 3-4 R 15 + 2017 2 15 7/64

More information

Microsoft Word - 計量研修テキスト_第5版).doc

Microsoft Word - 計量研修テキスト_第5版).doc Q10-2 テキスト P191 1. 記述統計量 ( 変数 :YY95) 表示変数として 平均 中央値 最大値 最小値 標準偏差 観測値 を選択 A. 都道府県別 Descriptive Statistics for YY95 Categorized by values of PREFNUM Date: 05/11/06 Time: 14:36 Sample: 1990 2002 Included

More information

4., ( 6) 5. ( 7) 6., ( 8) 7., ( 9)... 2, ( ) 33,,,,,,, 3 (1km ),. 25 (213 ) 1 26 (214 ) , ( 7),,,,, ( 9) 1, 2, (, ),., [3] [4],,82., 3, 3

4., ( 6) 5. ( 7) 6., ( 8) 7., ( 9)... 2, ( ) 33,,,,,,, 3 (1km ),. 25 (213 ) 1 26 (214 ) , ( 7),,,,, ( 9) 1, 2, (, ),., [3] [4],,82., 3, 3 ., ( 19 53 ) 33,,,,,,, 3 (1km ),. 25 (213 )1 26 (214 )6 6 18.,,82. 3, 3.,.,. 1 [1] [2].,. 27,,,,., 1 5 9 1/3 4 1/9., 1. ( 3) 2., ( 4) 3. ( 5) 66-81 TEL: 75-753-5515, E-mail: aki@i.kyoto-u.ac.jp 1 4., (

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

2.2 h h l L h L = l cot h (1) (1) L l L l l = L tan h (2) (2) L l 2 l 3 h 2.3 a h a h (a, h)

2.2 h h l L h L = l cot h (1) (1) L l L l l = L tan h (2) (2) L l 2 l 3 h 2.3 a h a h (a, h) 1 16 10 5 1 2 2.1 a a a 1 1 1 2.2 h h l L h L = l cot h (1) (1) L l L l l = L tan h (2) (2) L l 2 l 3 h 2.3 a h a h (a, h) 4 2 3 4 2 5 2.4 x y (x,y) l a x = l cot h cos a, (3) y = l cot h sin a (4) h a

More information

st.dvi

st.dvi 9 3 5................................... 5............................. 5....................................... 5.................................. 7.........................................................................

More information

80 X 1, X 2,, X n ( λ ) λ P(X = x) = f (x; λ) = λx e λ, x = 0, 1, 2, x! l(λ) = n f (x i ; λ) = i=1 i=1 n λ x i e λ i=1 x i! = λ n i=1 x i e nλ n i=1 x

80 X 1, X 2,, X n ( λ ) λ P(X = x) = f (x; λ) = λx e λ, x = 0, 1, 2, x! l(λ) = n f (x i ; λ) = i=1 i=1 n λ x i e λ i=1 x i! = λ n i=1 x i e nλ n i=1 x 80 X 1, X 2,, X n ( λ ) λ P(X = x) = f (x; λ) = λx e λ, x = 0, 1, 2, x! l(λ) = n f (x i ; λ) = n λ x i e λ x i! = λ n x i e nλ n x i! n n log l(λ) = log(λ) x i nλ log( x i!) log l(λ) λ = 1 λ n x i n =

More information

,, Poisson 3 3. t t y,, y n Nµ, σ 2 y i µ + ɛ i ɛ i N0, σ 2 E[y i ] µ * i y i x i y i α + βx i + ɛ i ɛ i N0, σ 2, α, β *3 y i E[y i ] α + βx i

,, Poisson 3 3. t t y,, y n Nµ, σ 2 y i µ + ɛ i ɛ i N0, σ 2 E[y i ] µ * i y i x i y i α + βx i + ɛ i ɛ i N0, σ 2, α, β *3 y i E[y i ] α + βx i Armitage.? SAS.2 µ, µ 2, µ 3 a, a 2, a 3 a µ + a 2 µ 2 + a 3 µ 3 µ, µ 2, µ 3 µ, µ 2, µ 3 log a, a 2, a 3 a µ + a 2 µ 2 + a 3 µ 3 µ, µ 2, µ 3 * 2 2. y t y y y Poisson y * ,, Poisson 3 3. t t y,, y n Nµ,

More information

Microsoft Word - 計量研修テキスト_第5版).doc

Microsoft Word - 計量研修テキスト_第5版).doc Q4-1 テキスト P83 多重共線性が発生する回帰 320000 280000 240000 200000 6000 4000 160000 120000 2000 0-2000 -4000 74 76 78 80 82 84 86 88 90 92 94 96 98 R e s i dual A c tual Fi tted Dependent Variable: C90 Date: 10/27/05

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

.3. (x, x = (, u = = 4 (, x x = 4 x, x 0 x = 0 x = 4 x.4. ( z + z = 8 z, z 0 (z, z = (0, 8, (,, (8, 0 3 (0, 8, (,, (8, 0 z = z 4 z (g f(x = g(

.3. (x, x = (, u = = 4 (, x x = 4 x, x 0 x = 0 x = 4 x.4. ( z + z = 8 z, z 0 (z, z = (0, 8, (,, (8, 0 3 (0, 8, (,, (8, 0 z = z 4 z (g f(x = g( 06 5.. ( y = x x y 5 y 5 = (x y = x + ( y = x + y = x y.. ( Y = C + I = 50 + 0.5Y + 50 r r = 00 0.5Y ( L = M Y r = 00 r = 0.5Y 50 (3 00 0.5Y = 0.5Y 50 Y = 50, r = 5 .3. (x, x = (, u = = 4 (, x x = 4 x,

More information

平成28年社会生活基本調査 生活行動に関する結果 結果の概要

平成28年社会生活基本調査 生活行動に関する結果 結果の概要 平成 28 年社会生活基本調査 生活行動に関する結果 結果の概要 平成 年 7 月 日 総務省統計局 - 調査の概要 - 社会生活基本調査は, 国民の生活時間の配分及び自由時間における主な活動について調査し, 仕事や家庭生活に費やされる時間, 地域活動等へのかかわりなどの実態を明らかにし, 各種行政施策の基礎資料を得ることを目的とし, 昭和 51 年の第 1 回調査以来 5 年ごとに実施している 平成

More information

読めば必ずわかる 分散分析の基礎 第2版

読めば必ずわかる 分散分析の基礎 第2版 2 2003 12 5 ( ) ( ) 2 I 3 1 3 2 2? 6 3 11 4? 12 II 14 5 15 6 16 7 17 8 19 9 21 10 22 11 F 25 12 : 1 26 3 I 1 17 11 x 1, x 2,, x n x( ) x = 1 n n i=1 x i 12 (SD ) x 1, x 2,, x n s 2 s 2 = 1 n n (x i x)

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

第9回 日経STOCKリーグレポート 審査委員特別賞<地域の元気がでるで賞>

第9回 日経STOCKリーグレポート 審査委員特別賞<地域の元気がでるで賞> 1/21 1 2 3 1 2 3 4 5 4 5 6 2/21 2 3 2 4 5 6 3/21 38 38 4 2007 10 471 10 10 () () () OKI () () () () () 1989 2008 4 13 10 10 1 2 3 4 1 3 1 4/21 2 3 3 2 5/21 3 100 1.5 1/2 4 () 1991 2002 10 3 1 6/21 10 6

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

以下の内容について説明する 1. VAR モデル推定する 2. VAR モデルを用いて予測する 3. グレンジャーの因果性を検定する 4. インパルス応答関数を描く 1. VAR モデルを推定する ここでは VAR(p) モデル : R による時系列分析の方法 2 y t = c + Φ 1 y t

以下の内容について説明する 1. VAR モデル推定する 2. VAR モデルを用いて予測する 3. グレンジャーの因果性を検定する 4. インパルス応答関数を描く 1. VAR モデルを推定する ここでは VAR(p) モデル : R による時系列分析の方法 2 y t = c + Φ 1 y t 以下の内容について説明する 1. VAR モデル推定する 2. VAR モデルを用いて予測する 3. グレンジャーの因果性を検定する 4. インパルス応答関数を描く 1. VAR モデルを推定する ここでは VAR(p) モデル : R による時系列分析の方法 2 y t = c + Φ 1 y t 1 + + Φ p y t p + ε t, ε t ~ W.N(Ω), を推定することを考える (

More information

Dependent Variable: LOG(GDP00/(E*HOUR)) Date: 02/27/06 Time: 16:39 Sample (adjusted): 1994Q1 2005Q3 Included observations: 47 after adjustments C -1.5

Dependent Variable: LOG(GDP00/(E*HOUR)) Date: 02/27/06 Time: 16:39 Sample (adjusted): 1994Q1 2005Q3 Included observations: 47 after adjustments C -1.5 第 4 章 この章では 最小二乗法をベースにして 推計上のさまざまなテクニックを検討する 変数のバリエーション 係数の制約係数にあらかじめ制約がある場合がある たとえばマクロの生産関数は 次のように表すことができる 生産要素は資本と労働である 稼動資本は資本ストックに稼働率をかけることで計算でき 労働投入量は 就業者数に総労働時間をかけることで計算できる 制約を掛けずに 推計すると次の結果が得られる

More information

第8回 全日本 学生フォーミュラ大会 プログラム

第8回 全日本 学生フォーミュラ大会 プログラム Official Program 8 th Student Formula SAE Competition of JAPAN 8 9.7-11 2010 Organizer (JSAE) Society of Automotive Engineers of Japan, Inc. ECOPA Contents Congratulatory Message President s Message Outline

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

σ 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

H22 BioS (i) I treat1 II treat2 data d1; input group patno treat1 treat2; cards; ; run; I

H22 BioS (i) I treat1 II treat2 data d1; input group patno treat1 treat2; cards; ; run; I H BioS (i) I treat II treat data d; input group patno treat treat; cards; 8 7 4 8 8 5 5 6 ; run; I II sum data d; set d; sum treat + treat; run; sum proc gplot data d; plot sum * group ; symbol c black

More information

7. フィリップス曲線 経済統計分析 (2014 年度秋学期 ) フィリップス曲線の推定 ( 経済理論との関連 ) フィリップス曲線とは何か? 物価と失業の関係 トレード オフ 政策運営 ( 財政 金融政策 ) への含意 ( 計量分析の手法 ) 関数形の選択 ( 関係が直線的でない場合の推定 ) 推

7. フィリップス曲線 経済統計分析 (2014 年度秋学期 ) フィリップス曲線の推定 ( 経済理論との関連 ) フィリップス曲線とは何か? 物価と失業の関係 トレード オフ 政策運営 ( 財政 金融政策 ) への含意 ( 計量分析の手法 ) 関数形の選択 ( 関係が直線的でない場合の推定 ) 推 7. フィリップス曲線 経済統計分析 ( 年度秋学期 ) フィリップス曲線の推定 ( 経済理論との関連 ) フィリップス曲線とは何か? 物価と失業の関係 トレード オフ 政策運営 ( 財政 金融政策 ) への含意 ( 計量分析の手法 ) 関数形の選択 ( 関係が直線的でない場合の推定 ) 推定結果に基づく予測シミュレーション 物価と失業の関係......... -. -. -........ 失業率

More information

fuj03-09_hokoku.indd

fuj03-09_hokoku.indd 1039 報 告 婦人科腫瘍委員会 第 54 回治療年報 2006 年に治療した子宮頸癌, 子宮体癌, 卵巣悪性 境界悪性腫瘍の 5 年治療成績について 婦人科腫瘍委員会の第 54 回治療年報 (2006 年治療開始例 ) の報告をいたします. なお, 第 49 回治療年報より, 従来の直接法最小生存率 * による方法から Kaplan-Meier 法に変更しました. 追跡不能症例 (Lost to

More information