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

Size: px
Start display at page:

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

Transcription

1

2 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 Amazon.co.jp web *2 web *3 web 2

3 2 2.1 Google web Yahoo 1 3

4 1 web 5 ivedoor 3 Yahoo 2 5 ivedoor 2 Yahoo 1 5 ivedoor 3 Yahoo data.frame() 4 matrix() 4 S-PLUS 6.2J for Windows ward R ward S-PLUS mass corresp() R MASS S-PLUS R RMeCab

5 2.3 Relative Value, RV n X = (x 1, x 2, x 3,..., x n ) x i RV i = 1 i = k(1 < k < n) RV = n i=2 (x i x 1 ) 2 n (1) RV = k 1 i=1 (x i x k ) 2 + n i=k+1 (x i x k ) 2 n (2) i = n RV = n 1 i=1 (x i x n ) 2 n (3) *4 RV S-PLUS RV() RV2() *4 i = 1 k 1 1 RV() 1 RV2() RV() 5

6 Not Adjusted Adjusted y y x x 1 1 Adjusted Bubble Plot Bubble Chart evaluation 1 RV x y RV athome pina RV 6

7 RV athome mailish md pina evaluation 2 RV mailish pina RV RV athome RV 4 RV

8 3 5 comprehensive food service atmosphere food 3 4 atmosphere RV 4 5 comprehensive service RV RV RV comprehensive food service atmosphere evaluation x = 0 2 RV RV 5 7 RV

9 RV evaluation ward , 7; 8, 6, 4; 3, 2; , 7 8, 6, 4 3, ; 7, 2, 4, 5; 3, 6, 8 3 3, 5, 7; 1, 4; 6, 8; 2 9

10 5 Classification CA Classification PCA 3 Height hclust (*, "ward") 5 Classification CA Classification PCA Height sub1.txt sub7.txt sub2.txt sub4.txt sub5.txt sub3.txt sub6.txt sub8.txt sub2.txt sub3.txt sub5.txt sub7.txt sub1.txt sub4.txt sub6.txt sub8.txt hclust (*, "ward") 6 10

11 *5 *6 node, span, *5 RMeCab RMeCabFreq() *6 RMeCab collocate() 11

12 RV RV 12

13 ?? R S-PLUS 13

14 1 R Text Mining Studio S-PLUS R S S-PLUS GUI Text Mining Studio S-PLUS R S-PLUS R web 1 [1] Brian S. Everitt. An R and S-PLUS Companion to Multivariate Analysis. Springer-Verlag, R S-PLUS [2],,,,.., [3]. R., [4].., [5] Uwe Ligges. Programmieren mit R. Springer-Verlag, R [6]. R.,

15 # # OK # 1 # # x <- c(4, 1, 1, 2, 5) # # y <- RV(x) # RV <- function(x){ n <- length(x) res <- sum((x[2:n] - x[1])^2) / n res # RV() # OK # # x <- c(4, 1, 1, 2, 5) # # y <- RV2(x) # RV2 <- function(dat){ n <- length(dat) # res <- numeric(n) # n res for(i in 1:n){ if(i == 1){ # 1, num1 <- dat[i] # 1 num1 num2 <- dat[(i+1):n] # 2 n num2 res[i] <- RV(c(num1, num2)) else if(i == n){ # n, num1 <- dat[i] # n num1 num2 <- dat[1:(i-1)] # 1 n-1 num2 res[i] <- RV(c(num1, num2)) else{ # : 2 n-1, num1 <- dat[i] # i(1 > i > n) num2 <- c(dat[1:(i-1)], dat[(i+1):n]) res[i] <- RV(c(num1, num2)) 15

16 return(res) # arw.plot.df() arw.plot.mat() arw.plot2 <- function(x, y, arw=false, renew=false, pcol, ylimit=false, xlimit=false){ xy.tbl <- table(x, y) # nx <- nrow(xy.tbl) # ny <- ncol(xy.tbl) # vx <- as.numeric(rownames(xy.tbl)) # numeric vy <- as.numeric(colnames(xy.tbl)) # numeric # # renew == TRUE plot() if(renew == FALSE){ plot( c(-1, ifelse(xlimit=="true", as.numeric(readline("xlim : ")), max(x)+1)), c(-1, ifelse(ylimit=="true", as.numeric(readline("ylim : ")), max(y)+1)), xlab="evaluation", ylab="rv", type="n") abline(h=0, v=0, lty=3) # # xy.tbl cex for (i in 1:nx) { for (j in 1:ny) { if (xy.tbl[i, j] > 0) points(vx[i], vy[j], cex=xy.tbl[i, j], col=pcol) a <- cbind(x, y) a <- a[order(a[,1]), ] points(a[,1], a[,2], col=pcol, type="c") xm <- mean(x) # x ym <- mean(y) # y points(xm, ym, pch="+", cex=2, col=pcol) # (xm,ym) 16

17 # (arw.plot2() RV2() ) # 1, 2 ( ) # DF:,adj: TRUE arw.plot.df <- function(df, adj=false, legend.adj=false){ nc <- ncol(df) if(nc > 2) stop(message=" ") lab <- levels(df[, 2]) # 2 lab.n <- length(lab) # for(i in 1:lab.n){ x <- DF[DF[,2] == lab[i], ] # i x <- x[,1] # x y <- RV2(x) # RV y if(i == 1){ # adj=true arw.plot2(x, y, pcol=i, xlimit=adj, ylimit=adj) else{ # arw.plot2(x, y, pcol=i, renew=true) # legend( ifelse(legend.adj=="true", as.numeric(readline("x : ")), -1), ifelse(legend.adj=="true", as.numeric(readline("y : ")), 1), c(lab), col=1:lab.n, lwd=2) # (arw.plot2() RV2() ) # dat:,rc:1,2 # adj: arw.plot.mat <- function(dat, rc, adj=false, legend.adj=false){ nr <- nrow(dat) # nc <- ncol(dat) # # rc=1 if(rc == 1){ for(i in 1:nr){ 17

18 x <- c(dat[i, ]) # i y <- RV2(x) # RV if(i == 1){ arw.plot2(x, y, pcol=i, xlimit=adj, ylimit=adj) else{ arw.plot2(x, y, pcol=i, renew=true) # #,NULL row.name <- rownames(dat) if(is.null(row.name) == TRUE) row.name <- as.character(1:nr) legend( ifelse(legend.adj=="true", as.numeric(readline("x : ")), -1), ifelse(legend.adj=="true", as.numeric(readline("y : ")), 1), row.name, col=1:nr, lwd=2) else{ # rc=1 for(i in 1:nc){ x <- c(dat[, i]) # i y <- RV2(x) # RV if(i == 1){ arw.plot2(x, y, pcol=i, xlimit=adj, ylimit=adj) else{ arw.plot2(x, y, pcol=i, renew=true) # #,NULL col.name <- colnames(dat) if(is.null(col.name) == TRUE) col.name <- as.character(1:nc) legend( ifelse(legend.adj=="true", as.numeric(readline("x : ")), -1), ifelse(legend.adj=="true", as.numeric(readline("y : ")), 1), col.name, col=1:nc, lwd=2) 18

19 4 3.5 pina 2.5 pina 2.5 pina 3 pina 5 pina 4 pina 5 pina 3 pina 5 pina 5 pina 3 mailish 3.5 mailish 3 mailish 2 mailish 1.5 mailish 3 mailish 3 mailish 3 mailish 4 athome 3 athome 4 athome 3 athome 3.5 athome 4 athome 5 athome 3 athome 4 athome 5 athome 1 athome 5 athome 5 athome 4 athome 3 md 3 md 4 md 19

20 aice rikimaru popopopo

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

スライド 1

スライド 1 22 YES NO ( ) 15 4 3 15 5 : Wikipedia text mining : Wikipedia Data mining DM heuristic, 1: 2: 1: 2: 1: 2: 3: 4: 5: 6: 7: 8: 1: 2: 1: 2: 1: 2: 3: 4: 5: 1: 2: 1: 2: 3: 4: 5: 1: 2: 3: 1: 2: 1: 2: 3:

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

損保ジャパンの現状2011

損保ジャパンの現状2011 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 62 62 63 64 65 66 67 68 69

More information

() () () 200,000 160,000 120,000 80,000 40,000 3.3 144,688 43,867 3.1 162,624 52,254 170,934 171,246 172,183 3 2.8 2.6 57,805 61,108 65,035 3.5 3 2.5 2 1.5 1 0.5 0 0 2 7 12 17 22 10.1 12.7 17 22.3 73.4

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

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 による統計解析入門

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

RMeCab RCaBoCha p. 2/29 RMeCab R MeCab R MeCab

RMeCab RCaBoCha p. 2/29 RMeCab R MeCab R MeCab RMeCab RCaBoCha p. 1/29 RMeCab RCaBoCha RMeCab RCaBoCha p. 2/29 RMeCab R MeCab R MeCab RMeCab RCaBoCha p. 2/29 RMeCab R MeCab R MeCab RMeCab RCaBoCha p. 3/29 footnote2 RMeCab R MeCab R MeCab Google Windows

More information

() (MeCab) *1 Juman ChaSen *2 MeCab ChaSen 1.3 MeCab MeCab OS Windows MeCab [] [Binary package for MS-Windows] [] sourceforge.net [mecab-win32] Mac OS

() (MeCab) *1 Juman ChaSen *2 MeCab ChaSen 1.3 MeCab MeCab OS Windows MeCab [] [Binary package for MS-Windows] [] sourceforge.net [mecab-win32] Mac OS RMeCab 2008 11 8 1 MeCab RMeCab 1 1.1.............................................. 1 1.2............................................ 1 1.3 MeCab......................................... 2 1.4 RMeCab..........................................

More information

() (MeCab) *1 Juman ChaSen *2 MeCab ChaSen 1.3 MeCab MeCab OS Windows MeCab [] [Binary package for MS-Windows] [] sourceforge.net [mecab-win32] Mac OS

() (MeCab) *1 Juman ChaSen *2 MeCab ChaSen 1.3 MeCab MeCab OS Windows MeCab [] [Binary package for MS-Windows] [] sourceforge.net [mecab-win32] Mac OS RMeCab 2008 6 16 1 MeCab RMeCab 1 1.1.............................................. 1 1.2............................................ 1 1.3 MeCab......................................... 2 1.4 RMeCab..........................................

More information

.T.C.Y._.E..

.T.C.Y._.E.. 25 No.33 C O N T E N T S REVIEW 1 2 5 4 3 6 7 8 9 1 11 1, 1, 7,5 75 916,95 (121) 756,67 (15) 718,89 (13) 91,496 (169) 54,2 (179) 3,243 (75) 727,333 (129) 564,47 (112) 55,458 (11) 6,68,953 (18) 5,624,957

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

夏目小兵衛直克

夏目小兵衛直克 39(1906)1222 14(1817) 3(1832)1514(1843) 2628 6 (1853) (1854)3727 3(1856) 1 / 13 5(1858)6(1859) 5(1853) () () () () () () 3(1867)29 504111( 2 / 13 )98 23 18 2(1869)310283 100 50() 58 226 3313200982 5033

More information

-1-

-1- -1- -2- -3-1 8 6% 2 4 6 8 1 48 63 43 6 55 38 78 58 2 88 67 11 22 78 1 56 22 89 47 34 36 32 38 4 34 26 7 -4- 18-5- 3 25 28 (6.%) (6.%) (.9%) 2 15 18 158 1 (3.8%) (56.4%) 5 2 137 27 8 1 68 119 26 71 28 65

More information

( )

( ) Web Web 1 3 1 21 11 22 23 24 3 2 3 4 5 1 1 11 22 9 2 3 15 11 22 2 11 21 4 5 ( ) 102 ( ) 1 ( 1 2001 Web 1 5 4 1 1 - 7 - [] - 7 10 11 12 12 1 10 1 12 - [] 1 1 2 Q1 Q2 Q3 Q4 Q5 Q6 Q7 Q8 Q9 Q10 3 1 47

More information

nenkin.PDF

nenkin.PDF 1 31 1 WEB 10 3,544 429 13 10 22 11 7 WEB 1 2 41.0 15 80.0 20 46.7% 1000 55.8 1000 34.4 21 18.2 1000 23 25 41.0 49.2 29 90.6 42.7 33 56.4% 79.2% 67.4 51.7 37 39 83.7 1 91.0 93.6 9 2 3 1000 96.3 300 1000

More information

chisq.test corresp plot

chisq.test corresp plot Research and Analysis about Study Time using R MIYOSHI Yoshihiko In Saitama W. J. College, we have implemented many surveys which are the freshman questionnaire, the graduate satisfaction questionnaire,

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

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

離散数学 第 1回 論理 (1):命題論理

離散数学 第 1回  論理 (1):命題論理 1 (1) okamotoy@uecacjp 2012 4 10 2012 4 11 10:57 () (1) 2012 4 10 1 / 53 () (1) 2012 4 10 2 / 53 () 1 (1) (4 10 ) () (4 17 ) 2 (1) (4 24 ) 3 (2) (5 1 ) 4 (2) (5 8 ) 5 (3) (5 15 ) 6 (1) (5 22 ) 7 (2) (5

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

1 1 1. 19800 2. 2 1. 2. ( ) ( ) 3 1. ( ) ( ) 60 ( ) ( ) 2. ( ) ( ) ( ) ( ) 4 1. 2. 2/32

1 1 1. 19800 2. 2 1. 2. ( ) ( ) 3 1. ( ) ( ) 60 ( ) ( ) 2. ( ) ( ) ( ) ( ) 4 1. 2. 2/32 1 1 1. 19800 2. 2 1. 2. ( ) ( ) 3 1. ( ) ( ) 60 ( ) ( ) 2. ( ) ( ) ( ) ( ) 4 1. 2. 2/32 3. 5 1. 6 1. 2. 3. 7 1. 30 3 20 2. 100 8 1. 2. 100 3. 100 9 1. 10 1. setuzei_gaido@mail.goo.ne.jp 3/32 4/32 5/32

More information

情報科学概論 第1回資料

情報科学概論 第1回資料 1. Excel (C) Hiroshi Pen Fujimori 1 2. (Excel) 2.1 Excel : 2.2Excel Excel (C) Hiroshi Pen Fujimori 2 256 (IV) :C (C 65536 B4 :2 (2 A3 Excel (C) Hiroshi Pen Fujimori 3 Tips: (1) B3 (2) (*1) (3) (4)Word

More information

p.1/22

p.1/22 p.1/22 & & & & Excel / p.2/22 & & & & Excel / p.2/22 ( ) ( ) p.3/22 ( ) ( ) Baldi Web p.3/22 ( ) ( ) Baldi Web ( ) ( ) ( p.3/22 ) Text Mining for Clementine True Teller Text Mining Studio Text Miner Trustia

More information

d_appendixB-asp10appdev.indd

d_appendixB-asp10appdev.indd 付録 B jquery Visual Studio 00 ASP.NET jquery ASP.NET MVC Scripts jquery jquery-...js jquery jquery とは jquery JavaScript JavaScript jquery Ajax HTML 図 B- jqurey とブラウザの関係 Visual Studio 00 jquery JavaScript

More information

信州 佐久町  茂来山山麓の「茂来山たたら」遺跡

信州 佐久町  茂来山山麓の「茂来山たたら」遺跡 5. 4 5 5 7 5 2 22 2 26 3 9 Walk 2005.2.26. 2005.3.9. 5 5 2 26 20 200m 30X50M : : : 2005.2.26. 240m 2005.2.26. 2005.2.26. key ward 4 5 2005.2.26. Mutsu Nazkanishi 5 6,7 4 5 5 3 2 1449 5 walk 2005.3.9.

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

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

23.9 26.0 20083 3 20074 200712 20093 3 20084 200812 20083 3 20074 200712 20093 3 20084 200812 5 5 SBI 2004 2005 2006 2007 2008 5 1 10 30,000 25,000 20,000 15,000 10,000 5,000 0 1Q 2Q 3Q 4Q 1Q 2Q 3Q 4Q

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

In [168]: soup.find_all("label")

In [168]: soup.find_all(label) step 1 kakaku.com/bicycle/bicycle-battery/ web web Chrome cntl + Source Code and Copy cd 'kakaku_com_bicycle_bicycle-battery.html' In [166]: from bs4 import BeautifulSoup In [167]: html = open('kakaku_com_bicycle_bicycle-battery_2017.html')

More information

Rによる計量分析:データ解析と可視化 - 第2回 セットアップ

Rによる計量分析:データ解析と可視化 - 第2回 セットアップ R 2 2017 Email: gito@eco.u-toyama.ac.jp October 16, 2017 Outline 1 ( ) 2 R RStudio 3 4 R (Toyama/NIHU) R October 16, 2017 1 / 34 R RStudio, R PC ( ) ( ) (Toyama/NIHU) R October 16, 2017 2 / 34 R ( ) R

More information

2014 x n 1 : : :

2014 x n 1 : : : 2014 x n 1 : : 2015 1 30 : 5510113 1 x n 1 n x 2 1 = (x 1)(x+1) x 3 1 = (x 1)(x 2 +x+1) x 4 1 = (x 1)(x + 1)(x 2 + 1) x 5 1 = (x 1)(x 4 + x 3 + x 2 + x + 1) 1, 1,0 n = 105 2 1 n x n 1 Maple 1, 1,0 n 2

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

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

Taro-WebGLサンプルの説明

Taro-WebGLサンプルの説明 WebGL 2017/ 1/19 V.2 cim3d_webgl.zip index_ad01.html DEFINITIONS_ad01.js 6 index.html HTML Document DEFINITIONS.js JavaScript DATA/ UNIX LINUX index.html DEFINITIONS.js DATA/ OS UNIX LINUX Web Apache HTTP

More information

I: 2 : 3 +

I: 2 : 3 + I: 1 I: 2008 I: 2 : 3 + I: 3, 3700. (ISBN4-00-010352-0) H.P.Barendregt, The lambda calculus: its syntax and semantics, Studies in logic and the foundations of mathematics, v.103, North-Holland, 1984. (ISBN

More information

untitled

untitled OCN 1.0 2005615 OCN OCN OCN OCN http://www.ocn.ne.jp/hosting/usersupport/ OCN NTT OCNNTT 7 1.0 1 2 1.0 0. 0.1 CGI CGI CGI 0.2 xxxx(*1).html index.html index2.html intro.swf xxxx(*1) flash gallery img include

More information

「統 計 数 学 3」

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

More information

Excel ではじめる数値解析 サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます. このサンプルページの内容は, 初版 1 刷発行時のものです.

Excel ではじめる数値解析 サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます.   このサンプルページの内容は, 初版 1 刷発行時のものです. Excel ではじめる数値解析 サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます. http://www.morikita.co.jp/books/mid/009631 このサンプルページの内容は, 初版 1 刷発行時のものです. Excel URL http://www.morikita.co.jp/books/mid/009631 i Microsoft Windows

More information

インターネットマガジン2001年9月号―INTERNET magazine No.80

インターネットマガジン2001年9月号―INTERNET magazine No.80 +CD-ROM Å 5 M0.9. A N S W E R function calc () { t = ocument.getelementbyi("tboy"); for(i = 0; i < t.rows.length; i++) { win = Number(t.rows[i].cells[3].firstChil.noeValue); lost = Number(t.rows[i].cells[].firstChil.noeValue);

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

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

10.00mm 2 A4 0 A4 MS 72pt 25mm MS 25mm MS 2

10.00mm 2 A4 0 A4 MS 72pt 25mm MS 25mm MS 2 Silhouette Studio silhouette CAMEO Silhouette Studio silhouette CAMEO Windows Silhouette Studio mm mm F mm OK 1 10.00mm 2 A4 0 A4 MS 72pt 25mm MS 25mm MS 2 3 4 Silhouette Silhouette Silhouette silhouette

More information

N 847 1085 1932 2966 3336 6302 % 43.8 56.2 100 47.1 52.9 100 28 72 41.34 28 77 51.52 N 84 750 580 478 28 12 1932 % 4.3 38.8 30.0 24.7 1.4 0.6 100 N 1079 2710 1318 1083 60 52 6302 % 17.1 43.0 20.9 17.2

More information

橡統計担当者のためのエクセル表紙.PDF

橡統計担当者のためのエクセル表紙.PDF Num Lock(Pad Lock) ( Num Lock) [ ][ ] [ ][ ] Alt Alt 4 + ( ) 3+3 - ( ) 3-1 -1 * ( ) 3*3 / ( ) 3/3 % ( ) 20% ^ ( ) 3^2 (3*3 ) 2 TRUE FALSE = ( ) A1=B1 > ( ) A1>B1 < ( ) A1= ( ) A1>=B1

More information

fx-370ES_912ES_UsersGuide_J02

fx-370ES_912ES_UsersGuide_J02 Eng Eng 3 A Eng 1 1,234 Eng a 1234= W W 2 123 Eng a 123= 1W( ) S-D S-D π 72 A S-D π π nπ n d π c a b π c π ' f ' A S-D 1 A '5c6= f f f 73 2 π A 15(π)*'2c5= f 3 ' A!2e*!3= f 74 (CMPLX) 15 CMPLX N2 A u u

More information

r3.dvi

r3.dvi 00 3 2000.6.10 0 Java ( 7 1 7 1 GSSM 1? 1 1.1 4 4a 4b / / 0 255 HTML X 0 255 16 (0,32,255 #0020FF Java xclock -bg #0020FF xclock ^C (Control C xclock 4c 1 import java.applet.applet; import java.awt.*;

More information

Excel2000

Excel2000 Microsoft Excel 2000 Excel Excel ( )m...1...1...1 Shift...2 Shift...2...3...4...6...7...8...10...11...12...13...14...16...17...19...19...20 Excel B2 E5 E5 1/21 Shift B2 Shift E5 Shift B2 Shift Shift 2/21

More information

応用数学特論.dvi

応用数学特論.dvi 1 1 1.1.1 ( ). P,Q,R,.... 2+3=5 2 1.1.2 ( ). P T (true) F (false) T F P P T P. T 2 F 1.1.3 ( ). 2 P Q P Q P Q P Q P or Q P Q P Q P Q T T T T F T F T T F F F. P = 5 4 Q = 3 2 P Q = 5 4 3 2 P F Q T P Q T

More information

HG M-PRO 110pt 38mm HG M-PRO 110pt 38mm HG M-PRO 2

HG M-PRO 110pt 38mm HG M-PRO 110pt 38mm HG M-PRO 2 Graphtec Studio Graphtec Studio Graphtec Studio PC Windows Graphtec Studio A4 10.00mm 2 1 HG M-PRO 110pt 38mm HG M-PRO 110pt 38mm HG M-PRO 2 3 0 LCD 4 5 6 Graphtec Studio (F) (T) All Files(. ) OK 7 8 8

More information

新版明解C言語入門編

新版明解C言語入門編 175cm 60kg ( ) 175cm 175.3cm 175.869758 cm 175cm 60kg p.177 18-1 vx - vy vx vy List -1 List -1 int vx, vy; puts(""); printf(" vx "); scanf("%d", &vx); printf(" vy "); scanf("%d", &vy); printf("vx + vy

More information

きれいなグラフを作ろう!gnuplot 入門 1. 基本 1.1. プロット :test.plt plot x, sin(x) 1.2. データファイルのプロット 1:data.plt plot "data.dat" 1.3. データファイルのプロット 2:data2.plt plot "data2

きれいなグラフを作ろう!gnuplot 入門 1. 基本 1.1. プロット :test.plt plot x, sin(x) 1.2. データファイルのプロット 1:data.plt plot data.dat 1.3. データファイルのプロット 2:data2.plt plot data2 きれいなグラフを作ろう!gnuplot 入門 1. 基本 1.1. プロット :test.plt plot x, sin(x) 1.2. データファイルのプロット 1:data.plt plot "data.dat" 1.3. データファイルのプロット 2:data2.plt plot "data2.dat" using 1:3 2. 例題 2.1. カラーマップ :color_map.plt #

More information

90 120.0 80 70 72.8 75.1 76.7 78.6 80.1 80.1 79.6 78.5 76.8 74.8 72.4 69.5 95.6% 66.4 100.0 60 80.0 50 40 60.0 30 48.3% 38.0% 40.0 20 10 10.4% 20.0 0 S60 H2 H7 H12 H17 H22 H27 H32 H37 H42 H47 H52 H57 0.0

More information

1.500 m X Y m m m m m m m m m m m m N/ N/ ( ) qa N/ N/ 2 2

1.500 m X Y m m m m m m m m m m m m N/ N/ ( ) qa N/ N/ 2 2 1.500 m X Y 0.200 m 0.200 m 0.200 m 0.200 m 0.200 m 0.000 m 1.200 m m 0.150 m 0.150 m m m 2 24.5 N/ 3 18.0 N/ 3 30.0 0.60 ( ) qa 50.79 N/ 2 0.0 N/ 2 20.000 20.000 15.000 15.000 X(m) Y(m) (kn/m 2 ) 10.000

More information

=

= 2. 2.1 2.2 kuri@ice.uec.ac.jp ( 2007/10/30/16:46) 1 . 1. 1 + 2 = 5. 2. 180. 3. 3 3. 4.. 5.. 2 2.1 1.,,,,. 2., ( ) ( ).,,,, 3.,. 4.,,,. 3 1.,. 1. 1 + 2 = 5. (, ) 2. 180. (, ) 3. 3, 3. (, ) 4.. (, ) 5..

More information

「Android Studioではじめる 簡単Androidアプリ開発」正誤表

「Android Studioではじめる 簡単Androidアプリ開発」正誤表 Android Studio Android 2016/04/19 Android Studio Android *1 Android Studio Android Studio Android Studio Android Studio Android PDF : Android Studio Android Android Studio Android *2 c R TM *1 Android

More information

manual.dvi

manual.dvi oscommerce 2002 9 6 oscommerce oscommerce 2.2 1 1 1.1................................................. 1 1.1.1......................................... 1 1.2.................................................

More information

u V u V u u +( 1)u =(1+( 1))u =0 u = o u =( 1)u x = x 1 x 2. x n,y = y 1 y 2. y n K n = x 1 x 2. x n x + y x α αx x i K Kn α K x, y αx 1

u V u V u u +( 1)u =(1+( 1))u =0 u = o u =( 1)u x = x 1 x 2. x n,y = y 1 y 2. y n K n = x 1 x 2. x n x + y x α αx x i K Kn α K x, y αx 1 5 K K Q R C 5.1 5.1.1 V V K K- 1) u, v V u + v V (a) u, v V u + v = v + u (b) u, v, w V (u + v)+w = u +(v + w) (c) u V u + o = u o V (d) u V u + u = o u V 2) α K u V u α αv V (a) α, β K u V (αβ)u = α(βv)

More information

1 1.1 C 2 1 double a[ ][ ]; 1 3x x3 ( ) malloc() 2 double *a[ ]; double 1 malloc() dou

1 1.1 C 2 1 double a[ ][ ]; 1 3x x3 ( ) malloc() 2 double *a[ ]; double 1 malloc() dou 1 1.1 C 2 1 double a[ ][ ]; 1 3x3 0 1 3x3 ( ) 0.240 0.143 0.339 0.191 0.341 0.477 0.412 0.003 0.921 1.2 malloc() 2 double *a[ ]; double 1 malloc() double 1 malloc() free() 3 #include #include

More information

8 if switch for while do while 2

8 if switch for while do while 2 (Basic Theory of Information Processing) ( ) if for while break continue 1 8 if switch for while do while 2 8.1 if (p.52) 8.1.1 if 1 if ( ) 2; 3 1 true 2 3 false 2 3 3 8.1.2 if-else (p.54) if ( ) 1; else

More information

立ち読みページ

立ち読みページ 3 3-1 3-2 3-3 3-4 3-5 3-6 163 3-1 3-1-1 Web 1 2 LATCH 3-1-2 1 GUI GUI 164 165 ON/OFF 2 3-1-3 1 ISO 924111 166 2 Web Web Web WebWeb Web 3 3-1-4 2 1 1 2 3 167 168 2 169 2 3 1 3 1 2 3 4 5 170 171 3-2 3-2-1

More information

solutionJIS.dvi

solutionJIS.dvi May 0, 006 6 morimune@econ.kyoto-u.ac.jp /9/005 (7 0/5/006 1 1.1 (a) (b) (c) c + c + + c = nc (x 1 x)+(x x)+ +(x n x) =(x 1 + x + + x n ) nx = nx nx =0 c(x 1 x)+c(x x)+ + c(x n x) =c (x i x) =0 y i (x

More information

インターネットマガジン1999年7月号―INTERNET magazine No.54

インターネットマガジン1999年7月号―INTERNET magazine No.54 A MagnaviIp9907Htmltips +CD-ROM 3 3 A N S W E R HTML TIPS&TRICKS A N S W E R function Init() { block.style.setexpression("left",

More information

main

main 14 1. 12 5 main 1.23 3 1.230000 3 1.860867 1 2. 1988 1925 1911 1867 void JPcalendar(int x) 1987 1 64 1 1 1 while(1) Ctrl C void JPcalendar(int x){ if (x > 1988) printf(" %d %d \n", x, x-1988); else if(x

More information

I

I SR-SaaS I. - 1 - 1. 1-1) URL 1-2) ID SAAS - 2 - 1-3) - 3 - 2. 2-1) RemoteApp SR-SaaS 2-2) RemoteApp 2-3) : SAAS SSZK9999 ID SAAS OK - 4 - 2-4) RemoteApp 2-5) SR-SaaS - 5 - II. Windows - 6 - 1. Windows

More information