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

Size: px
Start display at page:

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

Transcription

1 1 R Windows R 1.1 R The R project web R web Download [CRAN] CRAN Mirrors Japan Download and Install R [Windows 95 and later ] [base] R for Windows R [R win32.exe] 1.2 R Windows R [ ] [OK] R web 1

2 1.3 R web 1. RjpWiki 2. R-Tips 3. R 4. R R R mjin/r/index.html R URL1 web URL2 R 1 URL3 web 1 URL4 R PDF 2 R 2.1 R R Microsoft Excel R R > R 2

3 > # [1] -52 > 3 * 90 / 45 # [1] 6 > sqrt(2) # sqrt() [1] # 2 sqrt() 5 R > 12 ^ 2 # [1] 144 > sin(1) #sin" " [1] > cos(5) #cos" " [1] > tan(3) #tan" " [1] > log10(12) # ( 10 ) [1] > exp(1) # [1] R 3

4 +, -, *, / 2.2 R > a <- 244 # a > a # [1] 244 > b < # b > b [1] > c <- "Katasho" # c > c [1] "Katasho" 1 1 R 4

5 > a <- c(1, 2, 3, 4, 5) # > a [1] > b <- c("a", "b", "c", "d", "e") # > b [1] "a" "b" "c" "d" "e" > c <- c(1, "b", 3, "d", 5) # > c [1] "1" "b" "3" "d" "5" 1 c() 1 c a a [1, 2, 3, 4, 5] a [1, 2, 3, 4, 5] a

6 > dat <- matrix(c( + 1, 2, 3, + 4, 5, 6, + 7, 8, 9), nrow=3, ncol=3, byrow=t) > dat [,1] [,2] [,3] [1,] [2,] [3,] > dat2 <- matrix(c( + 1, 2, 3, + 4, 5, 6, + 7, 8, 9), ncol=3) > dat2 [,1] [,2] [,3] [1,] [2,] [3,] matrix() 2 matrix() nrow=3 3 ncol= ncol byrow byrow=t dat2 1 6

7 > dat4 <- cbind(x1, x2, x3) # cbind() > dat4 x1 x2 x3 [1,] [2,] [3,] > dat5 <- rbind(x1, x2, x3) # rbind() > dat5 [,1] [,2] [,3] x x x

8 > my.data <- data.frame(x1 = x1, X2 = x2, Y = x3) # > my.data X1 X2 Y > attach(my.data) #my.data > X1 [1] > X2 [1] > Y [1] > detach(my.data) # > X1 "X1" attach() detach() detach() 2.3 R 8

9 > dat <- rnorm(100, mean=50, sd=10) > mean(dat) # [1] > median(dat) # [1] > var(dat) # [1] > sd(dat) # [1] > dat2 <- rnorm(100, mean=100, sd=20) > var(dat, dat2) # [1] > cor(dat, dat2) # [1] t t t R R t t.test() paired paired=false t t var.equal=false 9

10 > group1 <- c(56, 49, 59, 42, 58, 61, 53) # > group2 <- c(73, 86, 54, 60, 65, 70, 53) # > t.test(group1, group2, var.equal=false) # t Welch Two Sample t-test data: group1 and group2 t = , df = 9.518, p-value = alternative hypothesis: true difference in means is not equal to 0 95 percent confidence interval: sample estimates: mean of x mean of y > t.test(group1, group2, paired=true) # t Paired t-test data: group1 and group2 t = , df = 6, p-value = alternative hypothesis: true difference in means is not equal to 0 95 percent confidence interval: sample estimates: mean of the differences summary() aov()

11 10 1 > #1 > class.one <- c(3.9, 3.8, 3.6, 4.4, 4.7, 3.5, 3.7, 4.6, 3.9, 3.6) > #2 > class.two <- c(5.8, 4.4, 4.5, 6.4, 4.9, 7.2, 4.8, 5.7, 5.6, 3.4) > #3 > class.thr <- c(6.0, 5.8, 6.1, 5.6, 6.2, 6.0, 6.1, 5.7, 6.4, 5.9) > group <- as.factor(rep(c(1, 2, 3), c(10, 10, 10))) # > # > my.data <- data.frame( + Y = c(class.one, class.two, class.thr), X = group) > result <- summary(aov(y ~ X, my.data)) # result > result # Df Sum Sq Mean Sq F value Pr(>F) X e-06 *** Residuals Signif. codes: 0 *** ** 0.01 * t R web web 11

12 4 R Excel > x <- rnorm(100) > y <- rnorm(100) > plot(x, y) # > plot(x, y, xlim=c(-3,3), ylim=c(-3,3)) #x y > plot(x, y, xlab=" ", ylab=" ") #x y > plot(x, y, col="red", pch=18) # (col) (pch) R plot() plot() plot() > x <- 1:6 > y <- c(1, 5, 6, 3, 9, 10) > plot(x, y, type="b") # > plot(x, y, type="b", lty=2) # plot() type type= l type= s type= n plot() barplot() 12

13 # 1 > x <- c(12, 34, 72, 56, 20) > names(x) <- c("a1", "A2", "A3", "A4", "A5") > barplot(x, col="blue") > abline(h=0) # 2 > y <- c(17, 34, 69, 32, 12) > mat <- rbind(x, y) > mat A1 A2 A3 A4 A5 x y > barplot(mat, beside=true, col=c("blue", "red")) > legend(2, 60, + paste(c(" "," ")), + fill=c("blue", "red")) # k 3 > g1 <- rnorm(10, 10, 1) > g2 <- rnorm(10, 20, 1) > g3 <- rnorm(10, 5, 1) > #x > plot(x, c(g1,g2,g3), xlab="group", ylab="score", xaxt="n") > axis(1, at=1:3, label=c("g1", "g2", "g3")) #x > M <- c(mean(g1), mean(g2), mean(g3)) # > x.jiku <- 1:3 # x > points(x.jiku, M, pch=3, col="red", type="b") # 13

14 5 5.1 (1) (2) (3) 3 mean() mean () ( ) { } 5.2 pow 1 pow(2) 2 2 = 4 # pow() pow <- function(x){ } res <- x ^ 2 res # > pow(2)#2 [1] 4 > pow(12) #12 [1]

15 # pow2 pow2 <- function(x, y){ res <- x ^ y res } # > pow2(2, 4) #2 4 [1] 16 > pow2(2, -4) #2-4 [1] R Windows R [ ][ ] R R sd() sd() } sd2 <- function(x){ var2 <- function(x){ } # x if(is.vector(x)) n <- length(x) # x if(is.matrix(x)) n <- nrow(x) var2 <- var(x) * (n-1) / n # sd2 <- sqrt(var2(x)) # var2 sd2 15

16 1 R R 5.3 R Excel R plot() #1 one.func <- function(x){ } 2*x + 1 # > plot(one.func) > thr.func <- function(x) 3*x^3-0.5*x^2 + sqrt(x) + (3/4) > plot(thr.func) plot() points() legend() lwd 16

17 > plot(thr.func, xlim=c(-2,2), ylim=c(-5,5)) #thr.func plot() > abline(h=0) # x > abline(v=0) # y > x.dat <- seq(-2, 2, 0.1) #one.func x > points(x.dat, 2*x.dat+1, type="l", col="pink") #points() > legend(-1.5, 4, + c("one.func", "thr.func"), lwd=2, + col=c("black", "pink")) # 17

「統 計 数 学 3」

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

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

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

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

linguistics

linguistics R @ linguistics 2007/08/24 ( ) R @ linguistics 2007/08/24 1 / 24 1 2 R 3 R 4 5 ( ) R @ linguistics 2007/08/24 2 / 24 R R: ( ) R @ linguistics 2007/08/24 3 / 24 R Life is short. Use the command line. (Crawley

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

宿題の解答

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

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

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

2.1 R, ( ),   Download R for Windows base. R ( ) R win.exe, 2.,.,.,. R > 3*5 # [1] 15 > c(19,76)+c(11,13) 3 ( ) R 3 1 61, 2016/4/7( ), 4/14( ), 4/21( ) 1 1 2 1 2.1 R, ( )................ 2 2.2 ggm............................ 3 2.3,................ 4 2.4...................................... 6 2.5 1 ( )....................

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

<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

(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

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

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

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

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

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

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

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

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

x y 1 x 1 y 1 2 x 2 y 2 3 x 3 y 3... x ( ) 2

x y 1 x 1 y 1 2 x 2 y 2 3 x 3 y 3... x ( ) 2 1 1 1.1 1.1.1 1 168 75 2 170 65 3 156 50... x y 1 x 1 y 1 2 x 2 y 2 3 x 3 y 3... x ( ) 2 1 1 0 1 0 0 2 1 0 0 1 0 3 0 1 0 0 1...... 1.1.2 x = 1 n x (average, mean) x i s 2 x = 1 n (x i x) 2 3 x (variance)

More information

第1回(全5回) Rの基礎と仮説検定

第1回(全5回) Rの基礎と仮説検定 1 環境統計学ぷらす 第 1 回 ( 全 5 回?) R の基礎と仮説検定 高木俊 shun.takagi@sci.toho-u.ac.jp 2013/10/24 2 今回やること R の基礎 仮説検定 Fisher の正確確率検定 2 群の平均値の差の検定 (t 検定 ) 結果の表し方 図と表 文章中の表現 * 今後 Win 版を前提に話を進めます * 次回以降も R の操作練習 統計の解説 論文での表現の

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

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

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

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

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

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

R EZR 2013 11 5 *1 1 R 2 1.1 R [2013 11 5 ]................................ 2 1.2 R................................................ 3 1.3 Rgui......................................... 3 1.4 EZR...................................................

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

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

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

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

R EZR 2016 10 3 *1 1 R 2 1.1 R [2016 10 3 ]................................ 2 1.2 R................................................ 3 1.3 Rgui......................................... 3 1.4 EZR...................................................

More information

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

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

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

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

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

R Commanderを用いたデータ解析

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

More information

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

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

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

More information

Microsoft PowerPoint - Econometrics

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

More information

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

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

こんにちは由美子です

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

More information

GraphicsWithPlotFull.nb Plot[{( 1), ( ),...}, {( ), ( ), ( )}] Plot Plot Cos x Sin x, x, 5 Π, 5 Π, AxesLabel x, y x 1 Plot AxesLabel

GraphicsWithPlotFull.nb Plot[{( 1), ( ),...}, {( ), ( ), ( )}] Plot Plot Cos x Sin x, x, 5 Π, 5 Π, AxesLabel x, y x 1 Plot AxesLabel http://yktlab.cis.k.hosei.ac.jp/wiki/ 1(Plot) f x x x 1 1 x x ( )[( 1)_, ( )_, ( 3)_,...]=( ) Plot Plot f x, x, 5, 3 15 10 5 Plot[( ), {( ), ( ), ( )}] D g x x 3 x 3 Plot f x, g x, x, 10, 8 00 100 10 5

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

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

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

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

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

AR(1) y t = φy t 1 + ɛ t, ɛ t N(0, σ 2 ) 1. Mean of y t given y t 1, y t 2, E(y t y t 1, y t 2, ) = φy t 1 2. Variance of y t given y t 1, y t

AR(1) y t = φy t 1 + ɛ t, ɛ t N(0, σ 2 ) 1. Mean of y t given y t 1, y t 2, E(y t y t 1, y t 2, ) = φy t 1 2. Variance of y t given y t 1, y t 87 6.1 AR(1) y t = φy t 1 + ɛ t, ɛ t N(0, σ 2 ) 1. Mean of y t given y t 1, y t 2, E(y t y t 1, y t 2, ) = φy t 1 2. Variance of y t given y t 1, y t 2, V(y t y t 1, y t 2, ) = σ 2 3. Thus, y t y t 1,

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 R 8 2 6 24 M1 M2 1 8 Takahashi, Y., Roberts, B.W., Yamagata, S., & Kijima, N. (in press). Personality traits show differential relations with anxiety and depression in a non-clinical sample. Psychologia:

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

Microsoft PowerPoint - R-intro-02.ppt

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

More information

こんにちは由美子です

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

More information

こんにちは由美子です

こんにちは由美子です Sample size power calculation Sample Size Estimation AZTPIAIDS AIDSAZT AIDSPI AIDSRNA AZTPr (S A ) = π A, PIPr (S B ) = π B AIDS (sampling)(inference) π A, π B π A - π B = 0.20 PI 20 20AZT, PI 10 6 8 HIV-RNA

More information

情報工学概論

情報工学概論 確率と統計 中山クラス 第 11 週 0 本日の内容 第 3 回レポート解説 第 5 章 5.6 独立性の検定 ( カイ二乗検定 ) 5.7 サンプルサイズの検定結果への影響練習問題 (4),(5) 第 4 回レポート課題の説明 1 演習問題 ( 前回 ) の解説 勉強時間と定期試験の得点の関係を無相関検定により調べる. データ入力 > aa

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

分布

分布 (normal distribution) 30 2 Skewed graph 1 2 (variance) s 2 = 1/(n-1) (xi x) 2 x = mean, s = variance (variance) (standard deviation) SD = SQR (var) or 8 8 0.3 0.2 0.1 0.0 0 1 2 3 4 5 6 7 8 8 0 1 8 (probability

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

Rプログラミング

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

More information

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

: Shift-Return evaluate 2.3 Sage? Shift-Return abs 2 abs? 2: abs 3: fac

: Shift-Return evaluate 2.3 Sage? Shift-Return abs 2 abs? 2: abs 3: fac Bulletin of JSSAC(2012) Vol. 18, No. 2, pp. 161-171 : Sage 1 Sage Mathematica Sage (William Stein) 2005 2 2006 2 UCSD Sage Days 1 Sage 1.0 4.7.2 1) Sage Maxima, R 2 Sage Firefox Internet Explorer Sage

More information

Rとは 統計言語であるSの思想に基づいて開発されたフリーのソフ トウェア ウェブから誰でも無料で入手できる 多様なプラットフォームに対応 Unix系OS Mac OS X, Windows 豊富なパッケージ群 パッケージ 共通の目的を達成するための関

Rとは 統計言語であるSの思想に基づいて開発されたフリーのソフ トウェア ウェブから誰でも無料で入手できる   多様なプラットフォームに対応 Unix系OS Mac OS X, Windows 豊富なパッケージ群 パッケージ 共通の目的を達成するための関 R講習会 2017年6月6日 10~12時 資源管理研究センター 資源管理グループ 市野川桃子 1 Rとは 統計言語であるSの思想に基づいて開発されたフリーのソフ トウェア ウェブから誰でも無料で入手できる http://www.rproject.org/ 多様なプラットフォームに対応 Unix系OS Mac OS X, Windows 豊富なパッケージ群 パッケージ 共通の目的を達成するための関数群

More information

untitled

untitled R kiyo@affrc.go.jp 1 Excel 1, 2.6, 2/3, 105.2, 0.0043 1, 3, 0, 245 A, B, C... ; 0 1 0.2, 3/4, 0.99 MS Excel»» R Macintosh MS Excel Excel Excel MS Excel MS Access Excel R R R R.Data win Mac ctrl + R Win,

More information

26 1 11 1 3 1.1............................ 3 1.2................................ 3 1.3................................... 4 1.4................................ 5 1.5 p (p-value)................................

More information

取扱説明書 [F-05E]

取扱説明書 [F-05E] F-05E 12.11 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 a b 22 c d e 23 24 a o c d a b p q b o r s e f h i j k l m g f n a b c d e f g h 25 i j k l m n o p q r s a X b SD 26 27 28 X 29 a b c

More information

初心者用

初心者用 初 心 者 用 R 言 語 講 座 第 2 版 2013 年 3 月 12 日 文 責 : 斎 藤 輪 太 郎 鈴 木 治 夫 0. はじめに R 言 語 は 統 計 処 理 を 得 意 とする 言 語 です 多 量 のデータを 科 学 技 術 計 算 を 駆 使 して 処 理 し そこに 含 まれる 傾 向 を 解 析 したり 可 視 化 したりといったことが 比 較 的 簡 単 にできます 本

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

kubostat2017b p.1 agenda I 2017 (b) probability distribution and maximum likelihood estimation :

kubostat2017b p.1 agenda I 2017 (b) probability distribution and maximum likelihood estimation : kubostat2017b p.1 agenda I 2017 (b) probabilit distribution and maimum likelihood estimation kubo@ees.hokudai.ac.jp http://goo.gl/76c4i 2017 11 14 : 2017 11 07 15:43 1 : 2 3? 4 kubostat2017b (http://goo.gl/76c4i)

More information

untitled

untitled BioCIS 0.3 2005/09/14 1. 2. 3. 4. 5. 6. 7. 8. 9. 10. 11. 12. 13. 14. 15. Excel BioCIS 0.3 1 1. 2. URL http://biokey.museum.hokudai.ac.jp/classification/ 2. Internet Explorer BioCIS 0.3 2 3. BioCIS 4. (

More information

橡00扉.PDF

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

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

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

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

表1-表4_No78_念校.indd

表1-表4_No78_念校.indd mmmmmmmmmmmmmmmmmmmmmmmmmmmmmmmmm mmmmmmmmmmmmmmmmmmmmmmmmmmmmmmmmm Fs = tan + tan. sin(1.5) tan sin. cos Fs ccccccccccccccccccccccccccccccccccccccccccccccccccccccccccccc ccccccccccccccccccccccccccccccccccccccccccccccccccccccccccccc

More information

untitled

untitled 1 1 1 1 2 3 4 5 5 7 11 11 14 22 23 26 28 30 37 44 48 48 48 48 49 51 51 52 52 52 58 59 2 2 100 sample population (2) qualitative data quantitative data A 50 B 60 B A 10 1.2 ratio scale 3 15 18 3 1.2 0 interval

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

R による心理学研究法入門 5 章教育測定に関する実証研究 2015/07/15( ) D1 D1 1

R による心理学研究法入門 5 章教育測定に関する実証研究 2015/07/15( ) D1 D1 1 R による心理学研究法入門 5 章教育測定に関する実証研究 2015/07/15( ) D1 D1 1 Overview [ ] (2012) [ ] R [ ] [ ] [ ] [ ] (I-T ) [ ] I-T [ ] [ ] [ ] 2 Overview [ ] (2012) [ ] R [ ] [ ] [ ] [ ] (I-T ) [ ] I-T [ ] [ ] [ ] 3 古典的テスト理論

More information

数量的アプローチ 年 6 月 11 日 イントロダクション データ分析をマスターする 12 のレッスン ウェブサポートページ ( 有斐閣 ) 水落研究室 R http:

数量的アプローチ 年 6 月 11 日 イントロダクション データ分析をマスターする 12 のレッスン ウェブサポートページ ( 有斐閣 )   水落研究室 R http: イントロダクション データ分析をマスターする 12 のレッスン ウェブサポートページ ( 有斐閣 ) http://yuhikaku-nibu.txt-nifty.com/blog/2017/09/22103.html 水落研究室 R http://depts.nanzan-u.ac.jp/ugrad/ps/mizuochi/r.html 1 この授業では統計ソフト R を使って分析を行います データを扱うソフトとして

More information

<4D F736F F F696E74202D BD95CF97CA89F090CD F6489F18B4195AA90CD816A>

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

More information

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

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

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

dicutil1_5_2.book

dicutil1_5_2.book Kabayaki for Windows Version 1.5.2 ...1...1 1...3...3 2...5...5...5...7...7 3...9...9...9...10...10...11...12 1 2 Kabayaki ( ) Kabayaki Kabayaki ( ) Kabayaki Kabayaki Kabayaki 1 2 1 Kabayaki ( ) ( ) CSV

More information