2.1 R, ( ), Download R for Windows base. R ( ) R win.exe, 2.,.,.,. R > 3*5 # [1] 15 > c(19,76)+c(11,13)

Size: px
Start display at page:

Download "2.1 R, ( ), Download R for Windows base. R ( ) R win.exe, 2.,.,.,. R > 3*5 # [1] 15 > c(19,76)+c(11,13)"

Transcription

1 3 ( ) R , 2016/4/7( ), 4/14( ), 4/21( ) R, ( ) ggm , ( ) ( ) ,,.,,.,,. 2.,, 2 (p. 10). 1, 6 356, matsui@mist.i.u-tokyo.ac.jp; TA. jikken3.html 1

2 2.1 R, ( ), Download R for Windows base. R ( ) R win.exe, 2.,.,.,. R > 3*5 # [1] 15 > c(19,76)+c(11,13) # [1] > x <- c(3,1,4,1,5,9) # > 1:4 # [1] > 1:4+1 # (1:4)+1 [1] > f <- function(x,y){ sqrt(x^2+y^2) } # > f(3,4) [1] 5 R, ,. 2. R...,., browser()., R, URL. 2 PC R 2

3 1. R R web 3 sum, prod, cumsum abs, log, sqrt mean, sd, min, median, max scale combine, c list, matrix, array %*% t rbind, cbind diag cor det or apply solve read.table, write.table plot, pairs EPS dev.copy2eps which pnorm, rnorm ls, rm browser for, while, repeat 2.2 ggm, ggm (Graphical Gaussian Models). 1. R ( Japan (Tsukuba) ). 2. ggm. 3. package ggm successfully unpacked and MD5 sums checked. graph RBGL graph R : graph > source(" > bioclite("graph") RBGL 3 3

4 RBGL > source(" > bioclite("rbgl").,., R 1.,,,. > library(ggm) 2.3,,.,,,.., ggm marks,.. > data(marks) > marks mechanics vectors algebra analysis statistics ( ) , 5, 88.,., (X t,i ) 1 t n,1 i p (n = 88, p = 5). X 2,3 = 80. summary (min), 1 (1st Qu.), = 2 (median), (mean), 3 (3rd Qu.), (max)., X i = 1 n 4 n t=1 X t,i

5 , 25%, 50%, 75%. > summary(marks) mechanics vectors algebra analysis statistics Min. : 0.00 Min. : 9.00 Min. :15.00 Min. : 9.00 Min. : st Qu.: st Qu.: st Qu.: st Qu.: st Qu.:31.00 Median :41.50 Median :51.00 Median :50.00 Median :49.00 Median :40.00 Mean :38.97 Mean :50.59 Mean :50.60 Mean :46.68 Mean : rd Qu.: rd Qu.: rd Qu.: rd Qu.: rd Qu.:51.50 Max. :77.00 Max. :82.00 Max. :80.00 Max. :70.00 Max. : (r i,j ) r i,j = s i,j si,i s j,j, s i,j = 1 n (X t,i n X i )(X t,j X j ) t=1 > cor(marks) mechanics vectors algebra analysis statistics mechanics vectors algebra analysis statistics > round(cor(marks),3) # 3 mechanics vectors algebra analysis statistics mechanics vectors algebra analysis statistics i j,,. R,., ( ) 1. marks,, mechanics statistics., 2,., vectors mechanics statistics,. 4,. 5

6 mechanics vectors algebra analysis statistics :. > pairs(marks), 2,.,,,.,, G, V E V V., (= G = (V, E)). V = {a, b, c, d}, E = {(a, b), (a, c), (b, d)} ggm., drawgraph adjust TRUE,.. > amat <- UG(~ a*b + a*c + b*d) > amat a b c d a b c d > drawgraph(amat,adjust=false) d a c b 6

7 2.5 1 ( ),, ( ),,., web (1997),., R = (r i,j ), R 1 = (r i,j )., p i,j = r i,j r i,i r j,j (i j), 1 (i = j) (1), i j. P = (p i,j )., ( ) 1.,.,, ( )., S1 = mechanics, S2 = vectors, S3 = algebra, S4 = analysis, S5 = statistics. 1: ( ) ( ). S1 S2 S3 S4 S5 S S S S1 S2 S3 S4 S5 S S S S , R, P. I cor2par <- function(r){ X <- solve(r) p <- nrow(r) P <- matrix(0,p,p) dimnames(p) <- dimnames(r) for(i in (1:p)){ for(j in (1:p)){ if(i!= j) P[i,j] <- -X[i,j]/sqrt(X[i,i]*X[j,j]) if(i == j) P[i,j] <- 1 }} P } 7

8 II cor2par <- function(r){ X <- solve(r) d <- sqrt(diag(x)) P <- -X / (d %*% t(d)) diag(p) <- 1 P } 2.6, 4 8.,,,, StatLib web. : "math" "phys" "chem" "eng" "1" "2" "3" "4" "5" "6" mark4.txt R...,, : > X <- read.table("mark4.txt") 3., ( Word ) ( ) i j p i,j, 8

9 i j, i j.. 1 ( ).., i j,, p i,j., i j p i,j = 0., p i,j = 0, i j,.,, analysis mechanics (p 41 = 0.001) 0.,, vectors, algebra, statistics, analysis mechanics.,, 5., ,, 10 4.,, 2.., ,,. 2: ( ) ( ) S1 S2 S3 S4 S5 S S S S1 S2 S3 S4 S5 S S S S ,. (1997) ( [2]). 2 ( )., a, b, s, a b s (a b s, )., s, a b. 5,.,. 9

10 2:., a = {vectors}, b = {statistics}, s = {algebra}, 2 2., algebra, vectors statistics (mechanics analysis )., a = {mechanics,vectors}, b = {analysis,statistics}, s = {algebra}, 2., mechanics vectors algebra. 4. a = {mechanics}, b = {statistics}, s = {vectors,analysis} a b s (, 1 2 )., web.,,,., R, n ( n = 88). AIC ( ) G, G M = M(G), P = P (G),.., G, G,,., AIC (Akaike s Information Criterion) ( ), AIC = 2 ( ) 2 ( ) + ( ) 10

11 ., AIC 0 ( web )., ggm fitcongraph. 2, AIC. fitcongraph, AIC > options(digits=3) # 3 > X <- marks # > n <- nrow(x); p <- ncol(x) # > R <- cor(x) # > amat <- matrix(1,p,p)-diag(p); #, # amat <- UG(~a*b*c*d*e). > dimnames(amat) <- dimnames(r) # > amat[4,1] <- amat[1,4] <- 0 # (4,1) > amat[4,2] <- amat[2,4] <- 0 # (4,2) > amat[5,1] <- amat[1,5] <- 0 # (5,1) > amat[5,2] <- amat[2,5] <- 0 # (5,2) > amat # mechanics vectors algebra analysis statistics mechanics vectors algebra analysis statistics > f <- fitcongraph(amat,r,n) # > f # $Shat # mechanics vectors algebra analysis statistics mechanics vectors algebra analysis statistics $dev # [1] 0.9 $df # [1] 4 $it # [1] 2 > f$dev # [1] 0.9 > aic <- f$dev - 2*f$df # AIC > aic [1]

12 . 1. G ( ). M = R. AIC 0 AIC. 2. M (R ) P = (p i,j ) ( 2 ). 3. G (i, j), p i,j (i, j), G. 4. G M = M(G) AIC = AIC(G) (fitcongraph fitcongraph M R ). 5. AIC 2. AIC, G (i, j), p ij (i, j),. G amat., select.ij <- function(p,amat){ p <- nrow(p); minabsp <- Inf for(i in (2:p)){ for(j in (1:(i-1))){ if(amat[i,j] == 1 && abs(p[i,j]) < minabsp){ minabsp <- abs(p[i,j]); i0 <- i; j0 <- j }}} c(i0,j0) },. 1,. M 0, P 0. M 0 S1 S2 S3 S4 S5 S S S P 0 S1 S2 S3 S4 S5 S S S S P 0 AIC 0 AIC 0 = 0. P 0, (4,1) (4,1). fitcongraph, AIC, 12

13 M 1 S1 S2 S3 S4 S5 S S S P 1 S1 S2 S3 S4 S5 S S S S AIC 1 AIC 0. AIC 1 = 2 P 1, (5,2) 0.02 (P 0 P 1 )., (5,2), M 2 S1 S2 S3 S4 S5 S S S P 2 S1 S2 S3 S4 S5 S S S S AIC 2 = AIC 2 AIC 1,., P 2 (5, 1) (0.032), M 3 S1 S2 S3 S4 S5 S S S P 3 S1 S2 S3 S4 S5 S S S S AIC 3 = 5.86 P 3 (4, 2) (0.085), M 4 S1 S2 S3 S4 S5 S S S P 4 S1 S2 S3 S4 S5 S S S S AIC 4 = 7.1 P 4 (3, 1) (0.235), M 5 S1 S2 S3 S4 S5 S S S P 5 S1 S2 S3 S4 S5 S S S S AIC 5 =

14 . AIC 5 > AIC 4, P ,,, P 0 P 1,. web.) 2.9 3, 2.3, 2.8. ( ) 3 4 (zip )., PDF, or Word. (2.3 ). (2.3 ). (2.8 ), AIC..... matsui@mist.i.u-tokyo.ac.jp 2016/4/28( ).,. 3,. [1] (2004), The R Book R,. [2] (1997),,. 14

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

R による統計解析入門

R による統計解析入門 R May 31, 2016 R R R R Studio GUI R Console R Studio PDF URL http://ruby.kyoto-wu.ac.jp/konami/text/r R R Console Windows, Mac GUI Unix R Studio GUI R version 3.2.3 (2015-12-10) -- "Wooden Christmas-Tree"

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

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

講義のーと : データ解析のための統計モデリング. 第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

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

48 * *2

48 * *2 374-1- 17 2 1 1 B A C A C 48 *2 49-2- 2 176 176 *2 -3- B A A B B C A B A C 1 B C B C 2 B C 94 2 B C 3 1 6 2 8 1 177 C B C C C A D A A B A 7 B C C A 3 C A 187 187 C B 10 AC 187-4- 10 C C B B B B A B 2 BC

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

講義のーと : データ解析のための統計モデリング. 第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

講義のーと : データ解析のための統計モデリング. 第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

untitled

untitled R (1) R & R 1. R Ver. 2.15.3 Windows R Mac OS X R Linux R 2. R R 2 Windows R CRAN http://cran.md.tsukuba.ac.jp/bin/windows/base/ R-2.15.3-win.exe http://cran.md.tsukuba.ac.jp/bin/windows/base/old/ 3 R-2.15.3-win.exe

More information

「産業上利用することができる発明」の審査の運用指針(案)

「産業上利用することができる発明」の審査の運用指針(案) 1 1.... 2 1.1... 2 2.... 4 2.1... 4 3.... 6 4.... 6 1 1 29 1 29 1 1 1. 2 1 1.1 (1) (2) (3) 1 (4) 2 4 1 2 2 3 4 31 12 5 7 2.2 (5) ( a ) ( b ) 1 3 2 ( c ) (6) 2. 2.1 2.1 (1) 4 ( i ) ( ii ) ( iii ) ( iv)

More information

PSCHG000.PS

PSCHG000.PS a b c a ac bc ab bc a b c a c a b bc a b c a ac bc ab bc a b c a ac bc ab bc a b c a ac bc ab bc de df d d d d df d d d d d d d a a b c a b b a b c a b c b a a a a b a b a

More information

(2/24) : 1. R R R

(2/24) : 1. R R R R? http://hosho.ees.hokudai.ac.jp/ kubo/ce/2004/ : kubo@ees.hokudai.ac.jp (2/24) : 1. R 2. 3. R R (3/24)? 1. ( ) 2. ( I ) : (p ) : cf. (power) p? (4/24) p ( ) I p ( ) I? ( ) (5/24)? 0 2 4 6 8 A B A B (control)

More information

... 1... 2... 2... 3... 3... 4... 4... 5... 6 (a) 20... 6 (b) 10... 7 (c) 10... 8 (d) 24... 8 (e) 7... 9 (f) 7... 10... 10 (a) 12... 10 (b) 34... 11..

... 1... 2... 2... 3... 3... 4... 4... 5... 6 (a) 20... 6 (b) 10... 7 (c) 10... 8 (d) 24... 8 (e) 7... 9 (f) 7... 10... 10 (a) 12... 10 (b) 34... 11.. ... 1... 2... 2... 3... 3... 4... 4... 5... 6 (a) 20... 6 (b) 10... 7 (c) 10... 8 (d) 24... 8 (e) 7... 9 (f) 7... 10... 10 (a) 12... 10 (b) 34... 11... 13 (a) 7... 13 (b) 8... 14 (c) 19... 14... 16...

More information

2 Excel =sum( ) =average( ) B15:D20 : $E$26 E26 $ =A26*$E$26 $ $E26 E$26 E$26 $G34 $ E26 F4

2 Excel =sum( ) =average( ) B15:D20 : $E$26 E26 $ =A26*$E$26 $ $E26 E$26 E$26 $G34 $ E26 F4 1234567 0.1234567 = 2 3 =2+3 =2-3 =2*3 =2/3 =2^3 1:^, 2:*/, 3:+- () =2+3*4 =(2+3)*4 =3*2^2 =(3*2)^2 =(3+6)^0.5 A12 =A12+B12 ( ) ( )0.4 ( 100)0.9 % 1 2 Excel =sum( ) =average( ) B15:D20 : $E$26 E26 $ =A26*$E$26

More information

untitled

untitled R R R 2 R 2 R R R R R R R R R R 3 R R 4 R C JAVA 5 R EXCEL GUI 6 R SAS SPSS 7 R 8 R EXCEL GUI R GUI RR Commander 9 R Auckland Ross Ihaka Robert Gentleman Fred Hutchinson Cancer Research Center AT&T Lucent

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

行列代数2010A

行列代数2010A (,) A (,) B C = AB a 11 a 1 a 1 b 11 b 1 b 1 c 11 c 1 c a A = 1 a a, B = b 1 b b, C = AB = c 1 c c a 1 a a b 1 b b c 1 c c i j ij a i1 a i a i b 1j b j b j c ij = a ik b kj b 1j b j AB = a i1 a i a ik

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

- 1-128 - 2 -

- 1-128 - 2 - 127 - 1-128 - 2 - - 3-129 - 4 - 2-5 - 130-6 - - 7-131 - 8 - - 9-132 - 10 - 6041 3 () 1 ( ) () 6041 (1010) 1041 (192) 1941 () 2 (1) (2) (3) () 3 1 1 () 4 2 () 5 1 2 3 4 () 6 () 7-11 - 133-12 - 134 135 136

More information

15 2004.03 194

15 2004.03 194 The Statistical Processing using EXCEL MIYOSHI Yoshihiko In this paper, I summarize the method of performing statistical processing using only the basic function of EXCEL without the VBA macro, add-in

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

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

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

1997 1... 1... 2... 2... 2... 3... 6... 9... 9... 24... 39... 54... 69 4 1995 1996 A B C D 1 1 2 1 2 3 3 1 1 (1) (2) (3) 32 2 (1) (2) (3) 3 3 4 1 11 12 13 21 22 / / 23 5 4 4 1 9 1997 2 1 1 1 2 1 1 3 2

More information

yamadaiR(cEFA).pdf

yamadaiR(cEFA).pdf R 2012/10/05 Kosugi,E.Koji (Yamadai.R) Categorical Factor Analysis by using R 2012/10/05 1 / 9 Why we use... 3 5 Kosugi,E.Koji (Yamadai.R) Categorical Factor Analysis by using R 2012/10/05 2 / 9 FA vs

More information

i I Excel iii Excel Excel Excel

i I Excel iii Excel Excel Excel Excel i I Excel iii 1 1 2 Excel 2 2.1..................................... 2 2.2 Excel................................................ 2 2.3 Excel................................................ 4 2.4..............................................

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

5 5.1 A B mm 0.1mm Nominal Scale 74

5 5.1 A B mm 0.1mm Nominal Scale 74 5 73 5 5.1 A B 2 1 2 1mm 0.1mm 5.1.1 Nominal Scale 74 5.2. Calc 5.1.2 Ordinal Scale (1) (2) (3) (4) (5) 5 1 5 1 5 4 5-2 -1 0 1 2 1 5 15 25 55 1 1 2 3 4 5 1 5.1.3 5.1.3 Interval Scale 100 80 20 80 100 5

More information

FAX780TA_chap-first.fm

FAX780TA_chap-first.fm FAX-780TA ABCDEFGHIα 01041115:10 :01 FAX-780CL α 1 1 2 3 1 2 f k b a FAX-780TA α n p q 09,. v m t w FAX-780TA A BC B C D E F G H I c i c s s i 0 9 i c i k o o o t c 0 9 - = C t C B t - = 1 2 3

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

III 1 (X, d) d U d X (X, d). 1. (X, d).. (i) d(x, y) d(z, y) d(x, z) (ii) d(x, y) d(z, w) d(x, z) + d(y, w) 2. (X, d). F X.. (1), X F, (2) F 1, F 2 F

III 1 (X, d) d U d X (X, d). 1. (X, d).. (i) d(x, y) d(z, y) d(x, z) (ii) d(x, y) d(z, w) d(x, z) + d(y, w) 2. (X, d). F X.. (1), X F, (2) F 1, F 2 F III 1 (X, d) d U d X (X, d). 1. (X, d).. (i) d(x, y) d(z, y) d(x, z) (ii) d(x, y) d(z, w) d(x, z) + d(y, w) 2. (X, d). F X.. (1), X F, (2) F 1, F 2 F F 1 F 2 F, (3) F λ F λ F λ F. 3., A λ λ A λ. B λ λ

More information

PowerPoint プレゼンテーション

PowerPoint プレゼンテーション 1 2 20083 3 4 5 6 7 8 2008 10-12 2008 10-12 2007 10-12 669 749 700 7.0 % 70 116 99 16.5 % 599 633 600 5.4 % 331 331 312 6.0 % 328 328 308 6.5 % 191 191 171 11.4 % EPS 322 322 283 13.6 % 5,928 5,928 6,048-2.0

More information

Stata 11 Stata ROC whitepaper mwp anova/oneway 3 mwp-042 kwallis Kruskal Wallis 28 mwp-045 ranksum/median / 31 mwp-047 roctab/roccomp ROC 34 mwp-050 s

Stata 11 Stata ROC whitepaper mwp anova/oneway 3 mwp-042 kwallis Kruskal Wallis 28 mwp-045 ranksum/median / 31 mwp-047 roctab/roccomp ROC 34 mwp-050 s BR003 Stata 11 Stata ROC whitepaper mwp anova/oneway 3 mwp-042 kwallis Kruskal Wallis 28 mwp-045 ranksum/median / 31 mwp-047 roctab/roccomp ROC 34 mwp-050 sampsi 47 mwp-044 sdtest 54 mwp-043 signrank/signtest

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

0701_H1-4fix.eps

0701_H1-4fix.eps 1 2 3 Technology Operation 4 Windows & Mac HighSpeed USB Windows HighSpeed USB 5 6 Windows & Mac SuperSpeed USB BD TD Bridge Windows BASE TD Bridge 7 8 TD Bridge TD Bridge HighSpeed USB HighSpeed USB Windows

More information

Excel97関数編

Excel97関数編 Excel97 SUM Microsoft Excel 97... 1... 1... 1... 2... 3... 3... 4... 5... 6... 6... 7 SUM... 8... 11 Microsoft Excel 97 AVERAGE MIN MAX SUM IF 2 RANK TODAY ROUND COUNT INT VLOOKUP 1/15 Excel A B C A B

More information

T rank A max{rank Q[R Q, J] t-rank T [R T, C \ J] J C} 2 ([1, p.138, Theorem 4.2.5]) A = ( ) Q rank A = min{ρ(j) γ(j) J J C} C, (5) ρ(j) = rank Q[R Q,

T rank A max{rank Q[R Q, J] t-rank T [R T, C \ J] J C} 2 ([1, p.138, Theorem 4.2.5]) A = ( ) Q rank A = min{ρ(j) γ(j) J J C} C, (5) ρ(j) = rank Q[R Q, (ver. 4:. 2005-07-27) 1 1.1 (mixed matrix) (layered mixed matrix, LM-matrix) m n A = Q T (2m) (m n) ( ) ( ) Q I m Q à = = (1) T diag [t 1,, t m ] T rank à = m rank A (2) 1.2 [ ] B rank [B C] rank B rank

More information

FdData社会歴史

FdData社会歴史 ( ) Home [http://www.fdtext.com/dat/ ] [ ](1 ) (1) (2) (1) (1) (2) [ ](1) (2) [ ] [ ](3 ) () () [ ] [ ] (1874 ) (1876 ) 1877 ( 10 ) ( (1877) ) [ ](2 ) 1877 (1) [ ] (2) (1) (2) [ ](1) (2) [ ](2 ) 1877 (

More information

P P P P P P P P P P P P P

P P P P P P P P P P P P P P P P P P P P P P P P P P 1 (1) (2) (3) (1) (2) (3) 1 ( ( ) ( ) ( ) 2 ( 0563-00-0000 ( 090-0000-0000 ) 052-00-0000 ( ) ( ) () 1 3 0563-00-0000 3 [] g g cc [] [] 4 5 1 DV 6 7 1 DV 8 9 10 11 12 SD 13 .....

More information

vol.31_H1-H4.ai

vol.31_H1-H4.ai http://www.jmdp.or.jp/ http://www.donorsnet.jp/ CONTENTS 29 8,715 Vol. 31 2 3 ac ad bc bd ab cd 4 Point! Point! Point! 5 Point! Point! 6 7 314 611 122 4 125 2 72 2 102 3 2 260 312 0 3 14 3 14 18 14 60

More information

DPCはやわかり表紙_2014_H1-H4.indd

DPCはやわかり表紙_2014_H1-H4.indd C O N T E N T S 1 2 3 4 5 6 7 A B AB 15 15 25 2SD 1 1 A B 15 AB 25 2SD 1 1 1 A B 25 2SD 10 10 10 AB 1 1 1 1 A 1 A 1 B1 15 B 2SD 8 9 10 11 12 13 14 15 16 17 18 DPCA DPCA 7 DPCA DPCA 7 DPCA DPCA 7 DPCA DPCA

More information

Microsoft Word - .....J.^...O.|Word.i10...j.doc

Microsoft Word - .....J.^...O.|Word.i10...j.doc P 1. 2. R H C H, etc. R' n R' R C R'' R R H R R' R C C R R C R' R C R' R C C R 1-1 1-2 3. 1-3 1-4 4. 5. 1-5 5. 1-6 6. 10 1-7 7. 1-8 8. 2-1 2-2 2-3 9. 2-4 2-5 2-6 2-7 10. 2-8 10. 2-9 10. 2-10 10. 11. C

More information

program_japanese

program_japanese Eng Eng Eng - 40 - Eng Eng - 41 - Eng Eng - 42 - Eng - 43 - Eng - 44 - Eng Eng - 45 - Eng - 46 - - 47 - Eng - 48 - - 49 - - 50 - - 51 - - 52 - - 53 - - 54 - - 55 - - 56 - - 57 - - 58 - - 59 - - 60 - -

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

PowerPoint プレゼンテーション

PowerPoint プレゼンテーション 200831012 200810-12 200810-12 200710-12 669 749 700 7.0 % 70 116 99 16.5 % 599 633 600 5.4 % 331 331 312 6.0 % 328 328 308 6.5 % 191 191 171 11.4 % EPS 322 322 283 13.6 % 5,928 5,928 6,048-2.0 % EPS

More information

13 Student Software TI-Nspire CX CAS TI Web TI-Nspire CX CAS Student Software ( ) 1 Student Software 37 Student Software Nspire Nspire Nspir

13 Student Software TI-Nspire CX CAS TI Web TI-Nspire CX CAS Student Software ( ) 1 Student Software 37 Student Software Nspire Nspire Nspir 13 Student Software TI-Nspire CX CAS TI Web TI-Nspire CX CAS Student Software ( ) 1 Student Software 37 Student Software 37.1 37.1 Nspire Nspire Nspire 37.1: Student Software 13 2 13 Student Software esc

More information

Excel基礎講座演習-表紙とはじめにv1.3.doc

Excel基礎講座演習-表紙とはじめにv1.3.doc Future Lifestyle Inc. IT Microsoft Excel 2000 Microsoft Microsoft Corporation B4 11 14 1999 1 C4 E7 C4 E7 2 =C4+D4+E4 SUM MAX MIN B3 F7 Sheet2 1999 2000 3 B3 F7 C4 F7 Delete C4 F7 SUM SUM() C4 SUM 4 B3

More information

A A = a 41 a 42 a 43 a 44 A (7) 1 (3) A = M 12 = = a 41 (8) a 41 a 43 a 44 (3) n n A, B a i AB = A B ii aa

A A = a 41 a 42 a 43 a 44 A (7) 1 (3) A = M 12 = = a 41 (8) a 41 a 43 a 44 (3) n n A, B a i AB = A B ii aa 1 2 21 2 2 [ ] a 11 a 12 A = a 21 a 22 (1) A = a 11 a 22 a 12 a 21 (2) 3 3 n n A A = n ( 1) i+j a ij M ij i =1 n (3) j=1 M ij A i j (n 1) (n 1) 2-1 3 3 A A = a 11 a 12 a 13 a 21 a 22 a 23 a 31 a 32 a 33

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

s t 1, 2,..., 10 s t a, b,..., k t s 1, 2,..., 10 1 a, b,..., k 1 s t ts 1 0 ( 2.25) ½ ¾ ½¼ x 1j = 1 x 2c = 1 x 3e = 1

s t 1, 2,..., 10 s t a, b,..., k t s 1, 2,..., 10 1 a, b,..., k 1 s t ts 1 0 ( 2.25) ½ ¾ ½¼ x 1j = 1 x 2c = 1 x 3e = 1 72 2 2 2 2.24 2 s t, 2,..., 0 s t a, b,..., k t s, 2,..., 0 a, b,..., k s t 0 ts 0 ( 2.25) 2.24 2 ½ ¾ ½¼ x j = x 2c = x 3e = x 4s = x 5g = x 6i = x 7d = x 8h = x 9f = x 0k = x ta = x tb = x ts = 9 2.26

More information

13,825,228 3,707,995 26.8 4.9 25 3 8 9 1 50,000 0.29 1.59 70,000 0.29 1.74 12,500 0.39 1.69 12,500 0.55 10,000 20,000 0.13 1.58 30,000 0.00 1.26 5,000 0.13 1.58 25,000 40,000 0.13 1.58 50,000 0.00 1.26

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

大学等における社会人の受け入れ状況調査

大学等における社会人の受け入れ状況調査 1 1 2 3 4 - - - - - - 6 8 6 2001 30 7 6 3 30 8 6 1 4 3,6,9,12 4 1 1 E 1 3 13 15 4 3 1 ( ) 8. 6 14 8 6 2002 8 8 3 7 60 1 4 4 32 100 12

More information

橡表紙参照.PDF

橡表紙参照.PDF CIRJE-J-58 X-12-ARIMA 2000 : 2001 6 How to use X-12-ARIMA2000 when you must: A Case Study of Hojinkigyo-Tokei Naoto Kunitomo Faculty of Economics, The University of Tokyo Abstract: We illustrate how to

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

1 2 3 4 5 1 1:30 NPO 16 1 19 16 2 17-6 - 10 2008 2010 120 150 IT( ) 60 21 40-7 - - 8-10 ( ) NPO 2 10 16:40-9 - 10 ii NPO NPO ( ) ( ) 11 12 13 14 15 22 26 27 28 29 30 31 32 33 34 m3 m3

More information

1 R ID 1. ID Before After 1 X 1 Y 1 2 X 2 Y n 1 X n 1 Y n 1 n X n Y n. ID Group Measure. 1 1 Y 1... n 1 1 Y n1 n Y n n 0 Y n 1 E

1 R ID 1. ID Before After 1 X 1 Y 1 2 X 2 Y n 1 X n 1 Y n 1 n X n Y n. ID Group Measure. 1 1 Y 1... n 1 1 Y n1 n Y n n 0 Y n 1 E 2010 R 0 C626 R 2 t Welch t Wilcoxon 3 Fisher McNemar Box-Muller p- Excel R 1 B USB tomo-statim i.softbank.jp R WWW D3 C626 E-Mail d082905 hiroshima-u.ac.jp url http://home.hiroshima-u.ac.jp/d082905/r.html

More information

LGBZ3107-T3A1

LGBZ3107-T3A1 LGBZ3107 - T3B LGBZ3107 - T3D LGBZ3107 - T3F LGBZ3107 - T3H LGBZ3107 - T3J LGBZ3107 - T3L LGBZ3107 - T3K LGBZ3107 - T3I LGBZ3107 - T3G1 LGBZ3107 - T3E1 LGBZ3107 - T3C1 LGBZ3107 - T3A1 N0215-010615

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

untitled

untitled . x2.0 0.5 0 0.5.0 x 2 t= 0: : x α ij β j O x2 u I = α x j ij i i= 0 y j = + exp( u ) j v J = β y j= 0 j j o = + exp( v ) 0 0 e x p e x p J j I j ij i i o x β α = = = + +.. 2 3 8 x 75 58 28 36 x2 3 3 4

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

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

¥¤¥ó¥¿¡¼¥Í¥Ã¥È·×¬¤È¥Ç¡¼¥¿²òÀÏ Âè2²ó

¥¤¥ó¥¿¡¼¥Í¥Ã¥È·×¬¤È¥Ç¡¼¥¿²òÀÏ Âè2²ó 2 2015 4 20 1 (4/13) : ruby 2 / 49 2 ( ) : gnuplot 3 / 49 1 1 2014 6 IIJ / 4 / 49 1 ( ) / 5 / 49 ( ) 6 / 49 (summary statistics) : (mean) (median) (mode) : (range) (variance) (standard deviation) 7 / 49

More information

countif Excel E4:E10E4:E10 OK 2/25

countif Excel E4:E10E4:E10 OK 2/25 1....................... 1 2............................... 2 2.1 -countif(2 ) 2.2 (7 ) 2.3 frequency(7 ) 3 []............ 8 4................................. 8 4.1 (8 ) 4.2 (11 ) 4.3 (12 ) 4.4 (13 )

More information

Microsoft Word - 教材ガイド一覧ビデオ.doc

Microsoft Word - 教材ガイド一覧ビデオ.doc V V V V V V V V V V V V 1 V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V IT Web CG V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V V NO V V V V V

More information

Microsoft Word - 表紙資料2-4

Microsoft Word - 表紙資料2-4 (1) / 130 g 25 g 520% 170 g 30 g 560% 70 mg 600 mg 11.6% 0 10.5 mg 0% (1) (2) / 50100 g 25 g 200400% 50100 g 30 g 167333% 5001000 mg 600 mg 83167% 1020 mg 10.5 mg 95190% (2) / (1) 45.6 g 30 g 152% (2)

More information

2 2.1 Excel 2013 Excel

2 2.1 Excel 2013 Excel 4 1 4 : (1) (2) 1 (spread sheet) APPLE II 1 Microsoft Excel 2 2.1 Excel 2013 Excel 2013 4 2 1 4 3 2.2 1 A,B,C,... 1,2,3... F8 F8 G3 A1 F17 A,B,... 1,2,... 2.2.1 End 1 2.2.2 Excel + 2.2.3 (1) (2) Enter

More information

1

1 0 1 http://barrierfree.nict.go.jp/accessibility/index.html ( ) http://www.soumu.go.jp/joho_tsusin/w_access/index.html JIS X 8341-3 JISC JIS http://www.jisc 2 3 JIS X 8341-3 5.2e 1-62e) JIS X 8341-3 5.2e

More information

2.2 Sage I 11 factor Sage Sage exit quit 1 sage : exit 2 Exiting Sage ( CPU time 0m0.06s, Wall time 2m8.71 s). 2.2 Sage Python Sage 1. Sage.sage 2. sa

2.2 Sage I 11 factor Sage Sage exit quit 1 sage : exit 2 Exiting Sage ( CPU time 0m0.06s, Wall time 2m8.71 s). 2.2 Sage Python Sage 1. Sage.sage 2. sa I 2017 11 1 SageMath SageMath( Sage ) Sage Python Sage Python Sage Maxima Maxima Sage Sage Sage Linux, Mac, Windows *1 2 Sage Sage 4 1. ( sage CUI) 2. Sage ( sage.sage ) 3. Sage ( notebook() ) 4. Sage

More information

2

2 1 3 2 ( ) 2 3 1 5 1.1.......................... 5 1.2.................... 8 2 4 13 2.1.......................... 14 2.2.......................... 17 2.3 I......................... 20 3 5 23 3.1 I............................

More information

Mobile Base Station RTR-500MBS-A / Web Storage - RTR-500MBS LED / Copyright T&D Corporation. All rights reserved. 2017. 07 16504810016 8 -------------------------------------- 3 -----------------------------------------------

More information

ブック

ブック ARMA Estimation on Process of ARMA Time Series Model Sanno University Bulletin Vol.26 No. 2 February 2006 ARMA Estimation on Process of ARMA Time Series Model Many papers and books have been published

More information

7... 1... 34... 55... 86... 108 15 2003 1 2 3 1 7 pdf 2 8 1996 2-1 9010 5 247 362 4 7 5 4 11 7 22 4 29 45 5 59 6 61 4 63 10 2 820 3 1646 19 1944 1 2 4 11 3 11 22 4 1 340 2 20 3 13 4 450 1 2 3 4 2-2 29

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

Powered by TCPDF ( Title 第 11 講 : フィッシャー統計学 II Sub Title Author 石川, 史郎 (Ishikawa, Shiro) Publisher Publication year 2018 Jtitle コペンハーゲン解

Powered by TCPDF (  Title 第 11 講 : フィッシャー統計学 II Sub Title Author 石川, 史郎 (Ishikawa, Shiro) Publisher Publication year 2018 Jtitle コペンハーゲン解 Powered by TCPDF (www.tcpdf.org) Title 第 11 講 : フィッシャー統計学 II Sub Title Author 石川, 史郎 (Ishikawa, Shiro) Publisher Publication year 018 Jtitle コペンハーゲン解釈 ; 量子哲学 (018. 3),p.381-390 Abstract Notes 慶應義塾大学理工学部大学院講義ノート

More information

2 1 2 3 27 2 6 2 5 19 50 1 2

2 1 2 3 27 2 6 2 5 19 50 1 2 1 2 1 2 3 27 2 6 2 5 19 50 1 2 2 17 1 5 6 5 6 3 5 5 20 5 5 5 4 1 5 18 18 6 6 7 8 TA 1 2 9 36 36 19 36 1 2 3 4 9 5 10 10 11 2 27 12 17 13 6 30 16 15 14 15 16 17 18 19 28 34 20 50 50 5 6 3 21 40 1 22 23

More information