DAA02

Size: px
Start display at page:

Download "DAA02"

Transcription

1

2

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

4 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"

5 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]

6 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]

7

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

9 > 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,]

10 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

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

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

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

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

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

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

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

18 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

19 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))

20 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

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

22

23 v1 = seq(-3,3,0.1) v2 = v1^2 > plot(x = v1, y = v2) y x col= color > plot(v1, v2, col = 'red') y x

24 marker pch = N > plot(v1, v2, col= red ) > plot(v1, v2, col= red, pch = 20) # N: 0~25 # help(points)

25 marker cex = N > plot(v1, v2, col= red, pch = 20) > plot(v1, v2, col= red, pch = 20, cex = 3)

26

27 type= style > plot(v1, v2) > plot(v1, v2, type = l ) # style: p:points l:line b:both (points & line) o:overlay (points & line) n:none

28 lty = N #N: 1~6 lwd = W > plot(v1,v2,type='l',lty=4,lwd=3) y x

29 plot(v1, v2, main = "THIS IS THE TITLE", xlab = "Label for X-axis", ylab = "Label for Y-axis") THIS IS THE TITLE Label for Y-axis Label for X-axis

30 plot(v1, v2, main = "THIS IS THE TITLE", cex.lab = 1.5, xlab = "Label for X-axis",ylab = "Label for Y-axis")

31 X Y plot(v1, v2, main = "TITLE", xlab = "X here",ylab = "Y here", xlim = c(-3.5, 3.5), TITLE ylim = c(-0.5, 10)) Label for Y-axis THIS IS THE TITLE Y here Label for X-axis X here

32 plot(v1, v2, col = "blue", type = "o", lty = 2, pch = 19, cex.lab = 1.5, lwd = 3, main = "Y=X*X", xlab = "X", ylab="x*x", xlim=c(-3.5,3.5), ylim=c(-0.5, 10))

33 Histogram > dat<- read.csv(" > hist(dat$h)

34 Histogram > hist(dat$h, breaks = 20, main = Histogram of Height, xlab = "Height", col = 'blue', xlim = c(140, 190))

35 dens<-density(dat$h); # hist(dat$h, main = "Histogram of Height", xlab = "Height", xlim = c(140,190), probability = T) lines(dens, lwd = 2, col = red, lty=2) # Histogram of Height Density Height

36 #lines plot(v1, v2, col = "blue", type = "l", pch = 19, cex.lab = 1.5, lwd = 3, xlab = "X", ylab="f(x)", xlim=c(-3.5,3.5), ylim=c(-0.5, 10)) lines(v1, v1^3, col='red',lwd = 3)

37 #legend legend("bottomright", c("x^2","x^3"), col=c('blue','red'), lwd=2)

38 > boxplot(dat$h,main="boxplot of Height", ylab="height", col='cyan', ylim=c(140,190)) > boxplot(dat$h,main="boxplot of Height", xlab="height", col= ornage', horizontal=t) Boxplot of Height Height

39

40 boxplot(dat$h ~ dat$gender, main="distribution of Height by Gender", ylab="gender", xlab="height", col=c('blue','cyan'), ylim=c(140,190), horizontal=t) Distribution of Height by Gender Gender F M

41 dat<-read.table(" boxplot(dat$h ~ dat$gender + dat$affil, main="distribution of Height by Gender and Affiliation", ylab="gender x Affiliation", xlab="height", col=c('blue,'cyan,'red,'magenta'), ylim=c(140,190),horizontal=t) Distribution of Height by Gender and Affiliation Gender x Affiliation F.cs M.cs F.psy M.psy Height

42 interaction.plot(dat$gender, dat$affil, dat$h, Y pch=c(20,20), col=c("skyblue","orange"), xlab="gender", ylab= height", lwd=3,type='b',cex=2, trace.label="affiliation") Legend X

43 Distribution of Height by Gender and Affiliation Gender x Affiliation F.cs M.cs F.psy M.psy Height

44 HISTOGRAM par(mfrow=c(1,2)) # figure Dist. of Height for Female Participants Dist. of Height for Male Participants Density Density Height Height

45 HISTOGRAM hist(dat[dat$gender=='f',]$h, main="dist. of Height for Female Participants", xlab="height", xlim=c(140,190), probability=t) dens.f = density(dat[dat$gender=='f',]$h) lines(dens.f, col='blue',lwd=2) hist(dat[dat$gender== M,]$h, main= Dist. of Height for Male Participants, xlab= Height, xlim=c(140,190), probability=t,ylim=c(0,0.08)) dens.m = density(dat[dat$gender=='m',]$h) lines(dens.m, col='green', lwd=2)

46 HISTOGRAM Dist. of Height for Female Participants Dist. of Height for Male Participants Density Density Height Height

47 par(mfrow=c(1,1)) plot(dens.f,col='blue',lwd=2, ylab='density', xlim=c(140,190), main="dist. of Height by gender",xlab='height') lines(dens.m,col='green',lwd=2) legend("topleft", c('female','male'), col=c('blue','green'), cex=1.5,lwd=2)

48 # text(x,y, TEXT ) text(157.5, 0.04, 'Female', col='blue', cex=2) text(170, 0.04,'Male', col='green', cex=2) Dist. of Height by gender density Female Male Height

49

50 # 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 shoesize

51 txt = paste("r =",round(cor(dat$shoesize,dat$h), 4)) > txt[1] "r = 0.875" a=1:3 paste("s",a) => [1] "s 1" "s 2" "s 3" paste( s, a, sep= ) => [1] "s1" "s2" "s3"

52 txt = paste("r =", round(cor(dat$shoesize,dat$h), 4)) text(22, 175, txt, cex = 1.5) Relationship b/w shoesize and height height r = shoesize

53 abline: abline(h = mean(dat$h), col='blue'); abline(v = mean(dat$shoesize), col='green'); Relationship b/w shoesize and height H V height r = mean height mean shoesize shoesize

54 abline(lm(dat$h~dat$shoesize), lty=2, lwd=2) Relationship b/w shoesize and height height r = shoesize

55 plot(dat[dat$gender=='f',]$shoesize, dat[dat$gender=='f',]$h, main="relationship b/w shoesize and height", xlab='shoesize', ylab='height', cex.lab=1.5, pch=19, col='blue', xlim=c(20,29), ylim=c(140,190)) Relationship b/w shoesize and height height Female Male shoesize

56 lines(dat[dat$gender=='m',]$shoesize,dat[dat$gender=='m',]$h, type = 'p', pch = 15, col = 'green') legend("topleft", c('female','male'), pch =c(19,15), col = c('blue','green'), cex = 1.5) height Female Male Relationship b/w shoesize and height shoesize

57 plot(dat.reg, pch=20, col=c('blue')) material price design sales

58 plot(dat.pca, pch = rownames(dat.pca), cex = 1.7, col = 'blue') writing a b c d e f g h i a b c d e f g h i a b c d e f g h i thesis a b c d e f g h i a b c d e f g h i a b c d e f g h i interview

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

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

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

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

More information

1 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

「統 計 数 学 3」

「統 計 数 学 3」 関数の使い方 1 関数と引数 関数の構造 関数名 ( 引数 1, 引数 2, 引数 3, ) 例 : マハラノビス距離を求める関数 mahalanobis(data,m,v) 引数名を指定して記述する場合 mahalanobis(x=data, center=m, cov=v) 2 関数についてのヘルプ 基本的な関数のヘルプの呼び出し? 関数名 例 :?mean 例 :?mahalanobis 指定できる引数を確認する関数

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回

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

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

RとExcelを用いた分布推定の実践例

RとExcelを用いた分布推定の実践例 R Excel 1 2 1 2 2011/11/09 ( IMI) R Excel 2011/11/09 1 / 12 (1) R Excel (2) ( IMI) R Excel 2011/11/09 2 / 12 R Excel R R > library(fitdistrplus) > x fitdist(x,"norm","mle")

More information

https://sites.google.com/site/prj311/ 2011-03- 11 14:46:18 ##### Ruby ##### h = Hash.new(0) while line = gets() if line =~ /^.*?\x01(.*?)\x01/ h[$1] += 1 end end h.sort_by { k,v - v }.each { k,v print

More information

バイオインフォマティクス特論12

バイオインフォマティクス特論12 藤 博幸 事後予測分布 パラメータの事後分布に従って モデルがどんなデータを期待するかを予測する 予測分布が観測されたデータと 致するかを確認することで モデルの適切さを確認できる 前回と同じ問題で事後予測を う 3-1-1. 個 差を考えない場合 3-1-2. 完全な個 差を考える場合 3-1-3. 構造化された個 差を考える場合 ベイズ統計で実践モデリング 10.1 個 差を考えない場合 第 10

More information

Microsoft PowerPoint - R-intro-02.ppt

Microsoft PowerPoint - R-intro-02.ppt R で学ぶデータ解析とシミュレーション 2 ~ グラフ作成入門 ~ 2 時間目のメニュー グラフの作成方法 グラフ作成の第一歩 高水準作図関数 高水準作図関数の種類 関数 plot() を用いた作図例 低水準作図関数 低水準作図関数の種類 低水準作図関数を用いた作図例 数学関数のプロット 数学関数の定義方法 数学関数の作図例 参考 ( 重ねた図の描き方,R の画像の編集方法 ) 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

5 LATEX 2ε 2010

5 LATEX 2ε 2010 2010-11-27 15:30 16:00 TEX 5 LATEX 2ε 2010 1986 Lisp-Stat 1996 ptex 1987 ASCII TEX 1990 ptex 1993 JIS X 4051 1994 ptex JIS 1995 ptex 3.0 platex 2ε 2000 jsarticle 2008 ε-ptex e-ptex 2010 TEX Live 2010

More information

Microsoft PowerPoint - 統計科学研究所_R_重回帰分析_変数選択_2.ppt

Microsoft PowerPoint - 統計科学研究所_R_重回帰分析_変数選択_2.ppt 重回帰分析 残差分析 変数選択 1 内容 重回帰分析 残差分析 歯の咬耗度データの分析 R で変数選択 ~ step 関数 ~ 2 重回帰分析と単回帰分析 体重を予測する問題 分析 1 身長 のみから体重を予測 分析 2 身長 と ウエスト の両方を用いて体重を予測 分析 1 と比べて大きな改善 体重 に関する推測では 身長 だけでは不十分 重回帰分析における問題 ~ モデルの構築 ~ 適切なモデルで分析しているか?

More information

PowerPoint Presentation

PowerPoint Presentation R で自動作図 どんな絵でも, 何十回でも, 何百枚でも 竹中明夫 ( 国立環境研 ) プログラミング環境 + 実行環境 統計解析関数群 描画関数群 プログラム作図のすすめまずは描いてみる高水準作図関数と低水準作図関数繰り返し作業をプログラムで画像の保存 この話の目指すところ R のプログラムで絵が描けるよう になる R のプログラムで絵が描けそうな 気になる R のプログラムで絵を描きたくなる やる気にさえなれば,

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

宿題の解答

宿題の解答 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

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

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

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

<4D F736F F F696E74202D2088E D8C768A7789C482CC8A778D5A F939D8C76835C FC96E52E >

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

More information

II - ( 02 ) 1,,,, 2, 3. ( ) HP,. 2 MATLAB MATLAB, C Java,,., MATLAB, Workspace, Workspace. Workspace who. whos. MATLAB, MATLAB Workspace. 2.1 Workspac

II - ( 02 ) 1,,,, 2, 3. ( ) HP,. 2 MATLAB MATLAB, C Java,,., MATLAB, Workspace, Workspace. Workspace who. whos. MATLAB, MATLAB Workspace. 2.1 Workspac II - ( 02 ) 1,,,, 2, 3 ( ) HP, 2 MATLAB MATLAB, C Java,,, MATLAB, Workspace, Workspace Workspace who whos MATLAB, MATLAB Workspace 21 Workspace 211 Workspace save, Workspace, MATLAB MAT, load, MAT Workspace

More information

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

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

More information

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

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

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

レジャー産業と顧客満足の課題 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

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

スライド 1

スライド 1 担当 : 田中冬彦 016 年 4 月 19 日 @ 統計モデリング 統計モデリング 第二回配布資料 文献 : A. J. Dobson and A. G. Barnett: An Introduction to Generalized Linear Models 3rd ed., CRC Press. 配布資料の PDF は以下からも DL できます. 短縮 URL http://tinyurl.com/lxb7kb8

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

<4D F736F F F696E74202D BD95CF97CA89F090CD F6489F18B4195AA90CD816A>

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

More information

掲示用ヒート表 第34回 藤沢市長杯 2017

掲示用ヒート表 第34回 藤沢市長杯 2017 34 8 4 2 Round 1 Round 2 SEMI FINAL 30 16 8 H1 H5 H1 H1 Red 12401821 2 Red 12601360 2 1-1 Red 12501915 1 1-1 Red 12501915 4 White 12900051 4 White 12600138 3 3-1 White 12802412 2 3-1 White 12801091 1 Yellow

More information

pp R R Word R R R R Excel SPSS R Microsoft Word 2016 OS Windows7 Word2010 Microsoft Office2010 R Emacs ESS R R R R https:

pp R R Word R R R R Excel SPSS R Microsoft Word 2016 OS Windows7 Word2010 Microsoft Office2010 R Emacs ESS R R R R https: 計量国語学 アーカイブ ID KK300604 種別 解説 タイトル データの視覚化 (6) Rによる樹形図の作成 Title Data Visualization (6): Making Dendrogram in R statics 著者 林直樹 Author HAYASHI Naoki 掲載号 30 巻 6 号 発行日 2016 年 9 月 20 日 開始ページ 378 終了ページ 390 著作権者

More information

Microsoft PowerPoint - Rによる演習v2.ppt [互換モード]

Microsoft PowerPoint - Rによる演習v2.ppt [互換モード] 土木学会応用力学委員会逆問題小委員会 逆問題スプリングスクール R 言語による演習 206 年 3 月 5 日 9: ~2: 講師 : 大竹雄 ( 新潟大学 ) : 山本真哉 ( 清水建設 ) : 西村伸一 ( 岡山大学 ) 内 容 第一部 : プログラミングの基本的理解 (70min) R 言語とは? 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

2009 SEP. No.664 9 18 100460345 209710798 %0.11 3350955 9750799 12.1 0.93 100350 19 100600453 209700800 %0.03 3200065 9740873 11.0 0.98 90490 20 100750364 209680396 %0.81 321 844 978 591 11.6

More information

sarupaw.dvi

sarupaw.dvi PAW Which Even Monkeys Can Use H.Kitamura & His Company 9 8 19 preface PAW Which Even Monkies Can Use bold itaric vector ntuple v nt ( ) quit e-mail kitamura@phys01.phys.kobe-u.ac.jp homepage http://phys01.phys.kobe-u.ac.jp:2080/~kohama/sarupaw.html

More information

MH MH 9.50 8.50 9.40 8.40 9.30 9.20 8.30 9.10 9.00 8.20 8.90 8.80 8.10 8.70 8.60 8.00 8.50 7.90 8.40 8.30 7.80 8.20 8.10 7.70 8.00 7.60 7.90 7.80 7.50 7.70 7.60 7.40 1 7.50 7.40 7.30 2 7.30 7.20 7.20

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

★結果★ 藤沢市長杯 掲示用ヒート表

★結果★ 藤沢市長杯 掲示用ヒート表 AA 35 Round 1 8 4 Round 2 28 16 SEMI FINAL H1 H5 H1 H1 Red 12802015 1 Red 12802109 1 1-1 Red 12802015 2 1-1 Red 12702346 White 12800232 2 White 12702406 3 3-1 White 12702346 1 3-1 White 12802109 Yellow

More information

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

¥¤¥ó¥¿¡¼¥Í¥Ã¥È·×¬¤È¥Ç¡¼¥¿²òÀÏ Âè2²ó 2 212 4 13 1 (4/6) : ruby 2 / 35 ( ) : gnuplot 3 / 35 ( ) 4 / 35 (summary statistics) : (mean) (median) (mode) : (range) (variance) (standard deviation) 5 / 35 (mean): x = 1 n (median): { xr+1 m, m = 2r

More information

タイの食品市場(国庫用)訂正.PDF

タイの食品市場(国庫用)訂正.PDF 7 2004 ( ) ... 1... 2... 4... 7...11... 14... 16... 23... 24... 27... 29... 34... 39... 39... 43... 53... 58... 61... 62 ... 70... 78... 79... 83... 83... 86... 92... 93... 95... 101... 102... 104... 105...110...113...116...118...119...

More information

なぜRでグラフを 書 くの? 1.グラフがきれい 2. 書 き 直 しが 簡 単 3. 同 じようなグラフを 簡 単 に 書 ける

なぜRでグラフを 書 くの? 1.グラフがきれい 2. 書 き 直 しが 簡 単 3. 同 じようなグラフを 簡 単 に 書 ける Rでグラフ 作 成! - 基 礎 の 基 礎 の 入 門 編 - 担 当 : 河 崎 祐 樹 森 林 保 護 D2 なぜRでグラフを 書 くの? 1.グラフがきれい 2. 書 き 直 しが 簡 単 3. 同 じようなグラフを 簡 単 に 書 ける なぜRでグラフを 書 くの? 1.グラフがきれい グラフがきれいだと 気 持 ちがいい 2. 書 き 直 しが 簡 単 3. 同 じようなグラフを 簡 単

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

¥¤¥ó¥¿¡¼¥Í¥Ã¥È·×¬¤È¥Ç¡¼¥¿²òÀÏ Âè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

R-introduction.R

R-introduction.R による統計解析 三中信宏 minaka@affrc.go.jp http://leeswijzer.org 305-8604 茨城県つくば市観音台 3-1-3 国立研究開発法人農業 食品産業技術総合研究機構農業環境変動研究センター統計モデル解析ユニット専門員 租界 R の門前にて : 統計言語 R との極私的格闘記録 http://leeswijzer.org/r/r-top.html 教科書と参考書

More information

Studies of Foot Form for Footwear Design (Part 9) : Characteristics of the Foot Form of Young and Elder Women Based on their Sizes of Ball Joint Girth

Studies of Foot Form for Footwear Design (Part 9) : Characteristics of the Foot Form of Young and Elder Women Based on their Sizes of Ball Joint Girth Studies of Foot Form for Footwear Design (Part 9) : Characteristics of the Foot Form of Young and Elder Women Based on their Sizes of Ball Joint Girth and Foot Breadth Akiko Yamamoto Fukuoka Women's University,

More information

Debian での数学ことはじめ。 - gnuplot, Octave, R 入門

Debian での数学ことはじめ。 - gnuplot, Octave, R 入門 .... Debian gnuplot, Octave, R mkouhei@debian.or.jp IRC nick: mkouhei 2009 11 14 OOo OS diff git diff --binary gnuplot GNU Octave GNU R gnuplot LaTeX GNU Octave gnuplot MATLAB 1 GNU R 1 MATLAB (clone)

More information

Titleエジプトにおける 私 的 土 地 所 有 権 の 確 立 Author(s) 加 藤, 博 Citation Issue 1983-12-14 Date Type Thesis or Dissertation Text Version publisher URL http://hdl.handle.net/10086/18306 Right Hitotsubashi University

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

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

! & # # w w w w w w w w l & w_ # w_ w # w w w # w w # w w # w w w w bw w bw w bw w w bw w b w w_ l !!!!!! 6!!!! 6 ' ' ' ' ' ' ' ' ' ' ' '! ' ' ' ' ' ' ' ' ' ' ' ' ' '! ' ' ' ' ' ' ' ' ' ' '

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

第32回新春波乗り大会2018

第32回新春波乗り大会2018 AA 32 Round 1 4 SEMI FINAL 2 20 8 FINAL H1 H1 H1 Red 12701793 1 1-1 Red 12701793 2 1-1 Red 11800623 White 12900058 4 3-1 White 12402115 4 2-1 White 12402209 Yellow 11603976 3 2-2 Yellow 12301534 3 1-2

More information

4 100g

4 100g 100g 10 20 30 40 50 60 70 80 4 5 7 9 12 15 19 24 60 100 10 80 100 20 10 5 20 195 20-1- 60 60 15 100 60 100 15 15 15 100 15 15 60 100 10 60 100 100 15 10 10 60 100 15 10 15 10 5-2- 80 80 24 100 80 100 24

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

裁定審議会における裁定の概要 (平成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

和県監査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

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

-1- 4 1 2 4-2- -- 2 2 cm 0 80cm 2 80cm 80cm 80cm 50cm 80cm 50cm 6 80cm 100 50 50 cm 10 6 4 50cm 4 4 50cm -4- -5- cm 50cm 4 4 4 50cm 50cm 4 80cm 50cm 80cm 50cm 6 cm -6- 20 250cm 1 2 1 4 0cm 60cm cm cm 1

More information

untitled

untitled () () () () () ( ) () ( ) () ( ) () 2 () () 2 () () ( ) () () () 2 () () 2 3 ( ) () ( ) 2 3 4 () () 2 3 4 () () ( )( ) ( ) 2 ( ) 3 () () 2 3 () () 2 3 () () () () () () () () (( ) ( ) (( ))( )( ) ) 2 3

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

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

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

( )

( ) ( ) () () 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

-26-

-26- -25- -26- -27- -28- -29- -30- -31- -32- -33- -34- -35- -36- -37- -38- cm -39- -40- 1 2 3 4 4 3 2 1 5 5-41- -42- -43- -44- -45- -46- -47- -48- -49- -50- cm -51- -52- -53- -54- -55- -56- -57- -58- -59- -60-

More information

河川砂防技術基準・基本計画編.PDF

河川砂防技術基準・基本計画編.PDF 4 1 1 1 1 1 2 1 2.1 1 2.2 2 2.3 2 2.4 2 3 2 4 3 2 4 1 4 1.1 4 1.2 4 2 4 2.1 4 2.2 4 2.3 5 2.4 5 2.5 5 2.5.1 5 2.5.2 5 2.6 5 2.6.1 5 2.6.2 5 2.6.3 5 2.6.4 5 2.6.5 6 2.7 6 2.7.1 6 2.7.2 6 2.7.3 6 2.7.4

More information