DAA01

Size: px
Start display at page:

Download "DAA01"

Transcription

1

2

3

4

5

6 dat<-data.frame( condition score=c(78,70,66,76,78,76,88, 76, 76,72,60,72,70,72,84,70), cond=c(rep('low',8), rep('high',8))) score high low summary(aov(score ~ cond, data = dat)) Df Sum Sq Mean Sq F value Pr(>F) cond Residuals

7

8 dat.lm <- lm(ani~otouto, data=dat) abline(dat.lm, col = 'red',lwd = 2.5)

9 Polynomial regression plot(grade~study,data=dat,pch=20,xlab = "hours studied",xlim=c(3,27), ylim =c(0,110),cex=2) x = seq(0,30,0.1) y = *x *x^2 lines(x,y,col='red',lwd=3)

10 ( ) = exp ( b 0 + b 1 shoesize) 1+ exp( b 0 + b 1 shoesize) P M Coefficients: gender Estimate Std. Error z value Pr(> z ) (Intercept) e-06 *** shoesize e-06 *** P(M 23)=1/(1+exp(-1*( *23)))= P(M 25)=1/(1+exp(-1*( *25)))= P(M 27)=1/(1+exp(-1*( *27)))= age

11 Ability! ",$ %&''(%) =! ",$ %&''(%) = + +,-./ ,-./ Item Characteristic Curves Probability V1 V2 V3 V4 V5 V6 V7 V8 V9 V

12 > dat.pca$loadings Loadings: Comp.1 Comp.2 Comp.3 writing thesis interview Comp writing f hesis c erview b a h g i e d Comp.1

13 dat<-read.csv(" header=true, row.names=1) > dat admirable useful good big strong fast noisy young honest firm busy monk banker comic_artist designer nursery_teach professor med_doctor police_officer journalist sailor athlete author actor flight_attn

14 dat.cluster=hclust(dist(dat),method="average ) plot(dat.cluster,cex=1.5) Cluster Dendrogram Height banker monk professor author flight_attn actor comic_artist designer sailor athlete nursery_teach med_doctor police_officer journalist dist(dat) hclust (*, "average")

15 Height banker dat.pca=princomp(dat) biplot(dat.pca) monk professor author flight_attn actor Cluster Dendrogram comic_artist designer dist(dat) hclust (*, "average") sailor athlete nursery_teach med_doctor police_officer journalist Comp young comic_artist designer actor flight_attn busy nursery_teach good noisy honest admirable sailor big useful journalist athlete fast strong police_officer banker med_doctor author firm professor monk Comp.1

16

17 > # [1] 6 > # [1] 0 > 1*2*3 # [1] 6 > 10/2 # [1] 5

18 > 2^4 # [1] 16 > 10%/%3 # [1] 3 > 10%%3 # [1] 1

19 > 1==1 #equal [1] TRUE > 1==2 [1] FALSE > 1!=2 #not equal [1] TRUE > 1<1.1 [1] TRUE

20 > 1 == c(1,2) [1] TRUE FALSE > all(1 == c(1,2)) [1] FALSE > any(1 == c(1,2)) [1] TRUE

21 > a=1:10 [1] > which(a<5) [1] > b=10:1 [1] > which(b<5) [1]

22 c(var1,var2,...,varn) > x<-c(1,2,3,4) > x [1] > x2<-c(x,5,6,7,8) > x2 [1]

23 c(var1,var2,...,varn) > y=c('a0','a1','b0','b1') > y [1] "a0" "a1" "b0" "b1 > z=c(x,y) > z [1] "1" "2" "3" "4" "a0" "a1" "b0" "b1"

24 seq(start, end, increment/decrement) > x<-seq(1,4,1) [1] > x<-seq(0,40,10) [1] > x<-seq(10,2,-2) [1] > x<-1:4 # [1] > x<-10:1 # - [1]

25 rep(x, times) > x<-rep(1,4) (1) [1] > x<-rep(c(1,7,87),3) (2) [1,7,87] [1] > x<-rep(1:4,3) (3) 1:4 seq [1] > x<-sort(rep(1:4,3)) (4) (3) [1]

26

27 > x<-matrix(1:8, nrow=2) [,1] [,2] [,3] [,4] [1,] [2,] > x<-matrix(1:8, nrow=2,byrow=t) [,1] [,2] [,3] [,4] [1,] [2,]

28 data01<-data.frame(score = c(2,4,3,4), dose = c(rep(10,2),rep(100,2)), condition = rep(c('exp','control'),2)) > data01 score dose condition exp control exp control

29 dat01<-read.csv(" header=t) > dat01 x y z

30 dat02<-read.csv(" header=t, row.name=1) > dat02 x y z katsuo wakame tarachan

31 > dat03<-read.table(" header=t, row.name=4) > dat03 x y z sazae masuo tarachan

32 matrix M[ ] > dat03 x y z sazae masuo tarachan > dat03[1,1] #1 1 [1] 11

33 n M[n, ] m M[, m] > dat03 x y z sazae masuo tarachan > dat03[2,] # x y z masuo > dat03[,1] #1 [1]

34 M$varName > dat03 x y z sazae masuo tarachan > dat03$x [1] > dat03$y [1] > dat03$z [1]

35 > dat03 x y z sazae masuo tarachan > colnames(dat03)<-c("var1","var2","var3") > dat03 var1 var2 var3 sazae masuo tarachan

36 Dat03 score dat03 var1 var2 var3 Name Conditionn, var1, var2, var3 > dat04 score name condition 1 11 sazae var1 > dat masuo var2 var1 var2 var tarachan var3 sazae sazae var1 masuo masuo var tarachan var3 tarachan sazae var masuo var tarachan var3

37 score var1 var2 var3 Name Conditionn, var1, var2, var3 > dat04<-data.frame(score=c(dat03$var1,dat03$var2,dat03$var3), name=rep(rownames(dat03),3), condition = rep(c("var1","var2","var3"),3))

38 dat<-read.csv(" > head(dat) shoesize header=t); h gender M M M M F F > head(dat) shoesize height (meter) gender M M M M F F

39 mean(dat$shoesize[dat$gender == "M"]) [1] # mean(dat$shoesize[dat$gender == "F"]) [1] # mean(dat$shoesize[dat$h > 180]) [1] 27.5 # 180cm

DAA02

DAA02 c(var1,var2,...,varn) > x x [1] 1 2 3 4 > x2 x2 [1] 1 2 3 4 5 6 7 8 c(var1,var2,...,varn) > y=c('a0','a1','b0','b1') > y [1] "a0" "a1" "b0" "b1 > z=c(x,y) > z [1] "1" "2"

More information

DAA09

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

More information

統計研修R分散分析(追加).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

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

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

DAA04

DAA04 # plot(x,y, ) plot(dat$shoesize, dat$h, main="relationship b/w shoesize and height, xlab = 'shoesize, ylab='height, pch=19, col='red ) Relationship b/w shoesize and height height 150 160 170 180 21 22

More information

untitled

untitled Cluster Dendrogram 20 15 10 5 Height 0 29 30 2 4 2011 10 Re2011 11 12 7 8 2 9 2011 6 18 upport 5 21 22 1 3 19 17 20 24 25 26 27 JBCI 2009 44 43 13 39 23 13 40 42 15 16 14 37 23 28 dist hclust (*, "ward")

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

DAA12

DAA12 Observed Data (Total variance) Predicted Data (prediction variance) Errors in Prediction (error variance) Shoesize 23 24 25 26 27 male female male mean female mean overall mean Shoesize 23 24 25 26 27

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

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

R分散分析06.indd

R分散分析06.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 DM2

More information

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

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

More information

DAA03

DAA03 par(mfrow=c(1,2)) # figure Dist. of Height for Female Participants Dist. of Height for Male Participants Density 0.00 0.02 0.04 0.06 0.08 Density 0.00 0.02 0.04 0.06 0.08 140 150 160 170 180 190 Height

More information

新入_本文.smd

新入_本文.smd 52 28 220 28 4 1 017-777-1511 2 2 8 2 9 8 9 47.2% 12.8% 11.5% 6.0% 4 2 (49.6%)(13.0%) (14.7%) (7.4%)(8.4%) (52.3%)(9.1%) (11.4%) (10.0%) 33.0% 23.4% 15.6% 9.6% (26.0%) (18.3%) (46.5%) (30.0%) (20.0%) 2

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

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

(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

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

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

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

橡00扉.PDF

橡00扉.PDF SQ2.1 SQ2.2 ( ) 19971998 1981-97

More information

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

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

More information

mosaic Daniel Kaplan * 1 Nicholas J. Horton * 2 Randall Pruim * 3 Macalester College Amherst College Calvin College St. Paul, MN Amherst, MA Grand Rap

mosaic Daniel Kaplan * 1 Nicholas J. Horton * 2 Randall Pruim * 3 Macalester College Amherst College Calvin College St. Paul, MN Amherst, MA Grand Rap mosaic Daniel Kaplan * 1 Nicholas J. Horton * 2 Randall Pruim * 3 Macalester College Amherst College Calvin College St. Paul, MN Amherst, MA Grand Rapids, MI 2013 8 17 1 1 2 3 2.1 R RStudio.......................................

More information

untitled

untitled 146,650 168,577 116,665 122,915 22,420 23,100 7,564 22,562 140,317 166,252 133,581 158,677 186 376 204 257 5,594 6,167 750 775 6,333 2,325 298 88 5,358 756 1,273 1,657 - - 23,905 23,923 1,749 489 1,309

More information

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

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

More information

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

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

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

kubostat2017j p.2 CSV CSV (!) d2.csv d2.csv,, 286,0,A 85,0,B 378,1,A 148,1,B ( :27 ) 10/ 51 kubostat2017j (http://goo.gl/76c4i

kubostat2017j p.2 CSV CSV (!) d2.csv d2.csv,, 286,0,A 85,0,B 378,1,A 148,1,B ( :27 ) 10/ 51 kubostat2017j (http://goo.gl/76c4i kubostat2017j p.1 2017 (j) Categorical Data Analsis kubo@ees.hokudai.ac.jp http://goo.gl/76c4i 2017 11 15 : 2017 11 08 17:11 kubostat2017j (http://goo.gl/76c4i) 2017 (j) 2017 11 15 1 / 63 A B C D E F G

More information

レジャー産業と顧客満足の課題

レジャー産業と顧客満足の課題 1 ( ) 2 3 4 5 () 6 2 7 8 9 10 11 12 ( ) 47 48 8 4 13 48 3 14 9 13 6421 8770 () 14 15 19941995 2001 1996 2002 1988 1995 http://www.j-area2.com/index.html http://gonta13.at.infoseek.co.jp/ http://www.ekanji.com/telephone/

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

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

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

More information

インターネットを活用した経済分析 - フリーソフト 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

lec03

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

More information

19 22 25 27 28 31 36 1 38 38 39 4 41 >CREATING TOMORROW

19 22 25 27 28 31 36 1 38 38 39 4 41 >CREATING TOMORROW CREATIVITY-DRIVEN GROWTH KNOWS NO END 19 22 25 27 28 31 36 1 38 38 39 4 41 >CREATING TOMORROW FOR ALL STAKEHOLDERS 1 2 12, 3. 1, 2.5 * 24 * 8, 6, 2. 1.5 4, 1. 2,.5 '76.3 '5.3 1, 8, 6, 4, 2, 5 4 3 2 1 '1.3

More information

untitled

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

More information

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

²¾ÁÛ¾õ¶·É¾²ÁË¡¤Î¤¿¤á¤Î¥Ñ¥Ã¥±¡¼¥¸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

untitled

untitled 1 211022 2 11150 211022384 3 1000 23% 77% 10% 10% 5% 20% 15% 40% 5% 3% 8% 16% 15% 42% 5% 6% 4 =1000 = 66 5 =1000 = 59 6 52%(42% 1000 7 56% 41% 40% 97% 3% 11%, 2% 3%, 41 7% 49% 30%, 18%, 40%, 83% =1000

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

*p145-174_Œâ‡í‡ê‡é

*p145-174_Œâ‡í‡ê‡é *p145-174_ 問 われる 09.1.16 10:34 PM ページ145 2007 200708 146 147 a s 148 a s d f g 153 a s d 158 a s d f g h j 166 a s d f 171 2009 145 *p145-174_ 問 われる 09.1.16 10:34 PM ページ146 45 2007 2008 146 *p145-174_

More information

2 of 46 07.2.10 4:30 PM

2 of 46 07.2.10 4:30 PM 1 of 46 07.2.10 4:30 PM 2 of 46 07.2.10 4:30 PM 3 of 46 07.2.10 4:30 PM 4 of 46 07.2.10 4:30 PM 5 of 46 07.2.10 4:30 PM 6 of 46 07.2.10 4:30 PM 7 of 46 07.2.10 4:30 PM 8 of 46 07.2.10 4:30 PM 9 of 46 07.2.10

More information

紀要No.9_006王_CS.indd

紀要No.9_006王_CS.indd 1 2 3 4 5 87 9 2009 1937.1 6 1937.1 2 1937.3 1937.9 73 1941.6 77 1941.10 27 1943.9 1943.10 1944.12 1946.12 1947.1 5 1948.4 L 1949.9 10 1950.10 1953.1 1953.12 1956.5.16 1956.6 1966.9 30 1966.10 1967.4 1967.9

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

: (EQS) /EQUATIONS V1 = 30*V F1 + E1; V2 = 25*V *F1 + E2; V3 = 16*V *F1 + E3; V4 = 10*V F2 + E4; V5 = 19*V99

: (EQS) /EQUATIONS V1 = 30*V F1 + E1; V2 = 25*V *F1 + E2; V3 = 16*V *F1 + E3; V4 = 10*V F2 + E4; V5 = 19*V99 218 6 219 6.11: (EQS) /EQUATIONS V1 = 30*V999 + 1F1 + E1; V2 = 25*V999 +.54*F1 + E2; V3 = 16*V999 + 1.46*F1 + E3; V4 = 10*V999 + 1F2 + E4; V5 = 19*V999 + 1.29*F2 + E5; V6 = 17*V999 + 2.22*F2 + E6; CALIS.

More information

1 Amazon.co.jp *1 5 review *2 web Google web web 5 web web 5 (a) (b) (c) 3 S-PLUS S S-PLUS 1 S-PLUS S R R RMeCab *3 R term matrix S-PLUS S-PLUS *1 Ama

1 Amazon.co.jp *1 5 review *2 web Google web web 5 web web 5 (a) (b) (c) 3 S-PLUS S S-PLUS 1 S-PLUS S R R RMeCab *3 R term matrix S-PLUS S-PLUS *1 Ama 5 1 2 2 3 2.1....................................... 3 2.2............................... 4 2.3....................................... 5 2.4................................ 5 3 6 3.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

VDM-SL VDM VDM-SL Toolbox VDM++ Toolbox 1 VDM-SL VDM++ Web bool

VDM-SL VDM VDM-SL Toolbox VDM++ Toolbox 1 VDM-SL VDM++ Web bool VDM-SL VDM++ 23 6 28 VDM-SL Toolbox VDM++ Toolbox 1 VDM-SL VDM++ Web 2 1 3 1.1............................................... 3 1.1.1 bool......................................... 3 1.1.2 real rat int

More information

17 17 17 17 11 21 28 1 24 12 36 2,000 2 22 11 3.67 3.38 22 2.97 21 10 1.7 1.12 22 10 13 2.75 11 10 15 24 10 12 14 3 17 17 2006 4 17 10 24 12 17 5 15 17 17 11 40 6 17 40 17 11 7 24 17 24 17 8 40 17 17 9

More information

PowerPoint Presentation

PowerPoint Presentation 2 9/ 3 3 9/ 9 4 5 , PR () 6 ,,, (11) 7 PR 8 9 10 11 TEL. 106 8/131512/291/3 TEL. 107 12/291/3 12 http://www.f-turn.jp/ 13 21 4 21 14 200910 U 200911 U 200911 20102 15 20102 PR 20103 20103 16 20103 20104

More information

untitled

untitled ,337 37 35 0,349,09 35 55 988 3 0 0 3,387 7 90 0,369,46 5 57 5 0 90 38 8,369 3 4 5 6 7 8 9 0 3 4 5 6 7 8 9 0 3 4 5 6 8 9 30 3 3 5,400 7,00 9,000 0,800,600 4,400 6,00 8,000 9,800,600 3,400 5,00 7,000 8,800

More information

,877 61,524 33, ,292, ,653 57,601 95,188 2,416 1,767,

,877 61,524 33, ,292, ,653 57,601 95,188 2,416 1,767, 02 02 02 180,771 07 02 01 1,377 07 02 02 1,051,703 07 02 05 220,099 07 03 01 926,597 08 02 04 1,877,566 08 04 02 2,973,603 08 05 03 672,950 10 06 03 778,433 10 06 04 735,789 10 06 06 225,392 10 06 07 365,442

More information

5 Armitage x 1,, x n y i = 10x i + 3 y i = log x i {x i } {y i } 1.2 n i i x ij i j y ij, z ij i j 2 1 y = a x + b ( cm) x ij (i j )

5 Armitage x 1,, x n y i = 10x i + 3 y i = log x i {x i } {y i } 1.2 n i i x ij i j y ij, z ij i j 2 1 y = a x + b ( cm) x ij (i j ) 5 Armitage. x,, x n y i = 0x i + 3 y i = log x i x i y i.2 n i i x ij i j y ij, z ij i j 2 y = a x + b 2 2. ( cm) x ij (i j ) (i) x, x 2 σ 2 x,, σ 2 x,2 σ x,, σ x,2 t t x * (ii) (i) m y ij = x ij /00 y

More information

PackageSoft/R-033U.tex (2018/March) R:

PackageSoft/R-033U.tex (2018/March) R: ................................................................................ R: 2018 3 29................................................................................ R AI R https://cran.r-project.org/doc/contrib/manuals-jp/r-intro-170.jp.pdf

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

180 30 30 180 180 181 (3)(4) (3)(4)(2) 60 180 (1) (2) 20 (3)

180 30 30 180 180 181 (3)(4) (3)(4)(2) 60 180 (1) (2) 20 (3) 12 12 72 (1) (2) (3) 12 (1) (2) (3) (1) (2) (1) (2) (3) (4) (5) (6) (7) (8) (9) (10) (11) (1) (2) 180 30 30 180 180 181 (3)(4) (3)(4)(2) 60 180 (1) (2) 20 (3) 30 16 (1) 31 (2) 31 (3) (1) (2) (3) (4) 30

More information

... 6

... 6 ... 6 1) 2) No. 01 02 03 04 05 06 07 08 09 10 11 12 No. 1 2 2 3 3cm 4

More information

untitled

untitled 1....1 2....2 2.1...2 2.2...2 3....14 3.1...14 3.2...14 4....15 4.1...15 4.2...18 4.3...21 4.4...23 4.5...26 5....27 5.1...27 5.2...35 5.3...54 5.4...64 5.5...75 6....79 6.1...79 6.2...85 6.3...94 6.4...

More information

113 120cm 1120cm 3 10cm 900 500+240 10 1 2 3 5 4 5 3 8 6 3 8 6 7 6 8 4 4 4 4 23 23 5 5 7

More information

untitled

untitled 21 14 487 2,322 2 7 48 4 15 ( 27) 14 3(1867) 3 () 1 2 3 ( 901923 ) 5 (1536) 3 4 5 6 7 8 ( ) () () 9 10 21 11 12 13 14 16 17 18 20 1 19 20 21 22 23 21 22 24 25 26 27 28 22 5 29 30cm 7.5m 1865 3 1820 5

More information

1948 1907 4024 1925 14 19281929 30 111931 4 3 15 4 16 3 15 4 161933 813 1935 12 17 11 17 1938 1945 2010 14 221 1945 10 1946 11 1947 1048 1947 1949 24

1948 1907 4024 1925 14 19281929 30 111931 4 3 15 4 16 3 15 4 161933 813 1935 12 17 11 17 1938 1945 2010 14 221 1945 10 1946 11 1947 1048 1947 1949 24 15 4 16 1988 63 28 19314 29 3 15 4 16 19283 15294 16 1930 113132 3 15 4 16 33 13 35 12 3 15 4 16 1945 10 10 10 10 40 1948 1907 4024 1925 14 19281929 30 111931 4 3 15 4 16 3 15 4 161933 813 1935 12 17 11

More information

裁定審議会における裁定の概要 (平成23年度)

裁定審議会における裁定の概要 (平成23年度) 23 23 23 4 24 3 10 11 12 13 14 () 1 23 7 21 23 12 14 (19 ) 30 1.876% 60 8 24 19 78 27 1 (10) 37 (3) 2 22 9 21 23 5 9 21 12 1 22 2 27 89 10 11 6 A B 3 21 12 1 12 10 10 12 5 1 9 1 2 61 ( 21 10 1 11 30 )

More information

Microsoft Word - 入居のしおり.doc

Microsoft Word - 入居のしおり.doc 1 1 2 2 2 3 2 4 3 5 3 6 3 7 3 8 4 1 7 2 7 3 7 4 8 5 9 6 9 7 10 8 10 9 11 10 11 11 11 12 12 13 13 1 14 2 17 3 18 4 19 5 20 6 22 (1) 24 (2) 24 (3) 24 (4) 24 (5) 24 (6) 25 (7) 25 (8) 25 (9) 25 1 29 (1) 29

More information

和県監査H15港湾.PDF

和県監査H15港湾.PDF ...1...1...1...1...1...1...1...1...2...2...2...3...3...3...5...5...10...11...12...13...13...13...14...14...14...14...14...14...15...15...15...15...15 ...16...17 14...17...18...18...19...21...23 2...25...27...27...28...28...28

More information

( )

( ) ( ) () () 3 cm cm cm cm cm cm 1000 1500 50 500 1000 1000 1500 1000 10 50 300 1000 2000 1000 1500 50 10 1000 2000 300 50 1000 2000 1000 1500 50 10 1000 2000 300 30 10 300 1000 2000 1000 1500 1000

More information

2002 (1) (2) (3) (4) (5) (1) (2) (3) (4) (5) (1) (2) (3) (4) (5) (6) (7) (8) (1) (2) (3) (4) (1) (2) (3) (4) (5) (6) (7) (8) No 2,500 3 200 200 200 200 200 50 200 No, 3 1 2 00 No 2,500 200 7 2,000 7

More information