40 4 qcc: R k = 20 ˆ sample ˆ D 6. pistonrings n = 5 ˆ sample ID ˆ diameter ˆ size ˆ trial TRUE FALSE qcc R qcc qcc qcc qcc() Shewhart qcc() 4.1

Size: px
Start display at page:

Download "40 4 qcc: R k = 20 ˆ sample ˆ D 6. pistonrings n = 5 ˆ sample ID ˆ diameter ˆ size ˆ trial TRUE FALSE qcc R qcc qcc qcc qcc() Shewhart qcc() 4.1"

Transcription

1 39 4 qcc: R 4.1 qcc SQC [36] ˆ ˆ cusum EWMA ˆ OC: Operating Characteristic ˆ ˆ 1. circuit 3 x size trial k = 48 ˆ x 100 ˆ size ˆ trial TRUE FALSE 2 2. dyedcloth k = 10 ˆ x 50 ˆ size 3. orangejuice ˆ sample ID ˆ D ˆ size ˆ trial TRUE FALSE 2 4. orangejuice2 5. pcmanufact Scrucca[36]

2 40 4 qcc: R k = 20 ˆ sample ˆ D 6. pistonrings n = 5 ˆ sample ID ˆ diameter ˆ size ˆ trial TRUE FALSE qcc R qcc qcc qcc qcc() Shewhart qcc() 4.1 qcc.groups() pistonrings diameter pistonrings > library(qcc) # qcc > data(pistonrings) > attach(pistonrings) # > dim(pistonrings) # dimension [1]200 3 > pistonrings diameter sample trial TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE > str(pistonrings) data.frame : 200 obs. of 3 variables: $ diameter: num $ sample : int

3 4.2 qcc 41 $ trial : logi TRUE TRUE TRUE TRUE TRUE TRUE... > hist(pistonrings$diameter) # pistonrings > boxplot(pistonrings$diameter) # pistonrings > qqnorm(pistonrings$diameter) # pistonrings QQ > diameter <- qcc.groups(diameter, sample) # > dim(diameter) [1]40 5 > diameter [,1] [,2] [,3] [,4] [,5] diameter QQ 25 X > obj <- qcc(diameter[1:25,], type="xbar") qcc() 4.2 qcc summary summary() > summary(obj) Call: qcc(data = diameter[1:25, ], type = "xbar") xbar chart for diameter[1:25, ] Summary of group statistics: Min. 1st Qu. Median Mean 3rd Qu. Max Group sample size: 5 Number of groups: 25 Center of group statistics: Standard deviation:

4 42 4 qcc: R 4.1 qcc type "xbar" X "xbar.one" X 1 "R" R "S" s type "np" np 2 "p" p np 2 n "c" c "u" u c n Control limits: LCL UCL X 4.2 Number of groups k LCL UCL Center X StdDev standard deviation

5 Center Line ±3σ nsigmas confidence.level ±3σ (c) Montgomery[33] Wetherill and Brown[39] center std.dev limits 4.3 qcc plot=false qcc() > plot(obj) 4.2 add.stats=false 5 > obj <- qcc(diameter[1:25,], type="xbar", newdata=diameter[26:40,]) X qcc() chart.all=false plot() > plot(obj, chart.all=false) qcc() help(qcc) 4.1 n = 1 X type="xbar.one" l 2 size p

6 44 4 qcc: R 4.3 X > data(orangejuice) > attach(orangejuice) > orangejuice sample D size trial TRUE TRUE TRUE FALSE FALSE > obj2 <- qcc(d[trial], sizes=size[trial], type="p") 30 trial 4.4 OC 2 OC qcc > par(mfrow=c(1,2)) > oc.curves(obj) > oc.curves(obj2) oc.curves() 2 help(oc.curves) ) identify=true e

7 OC 4.5 n = 1 Montgomery[33] C i = i (x j µ 0 ) (4.1) j=1 i C i µ 0 1 i qcc qcc 4.5 cusum() cumulative sum > cusum(obj) 1 qcc target 2 decision.int 5 se.shift 1

8 46 4 qcc: R EWMA *1 z i = λx i + (1 λ)z i 1 (4.2) λ 0 < λ < = 1 i = 1 z 0 = µ 0 (4.3) x (4.2) i 1 z i = λ (1 λ) j x i j + (1 λ) i z 0 (4.4) j=0 λ(1 λ) j i 1 λ(1 λ) j = 1 (4.5) j=0 qcc λ 0.2 *1 Exponentially Weighted Moving Average

9 lambda qcc EWMA 4.6 > ewma(obj) 4.6 EWMA 4.7 process.capability() qcc xbar xbar.one spec.limits LSL USL qcc > process.capability(obj, spec.limits=c(73.95,74.05)) Process Capability Analysis Call: process.capability(object = obj, spec.limits = c(73.95, 74.05)) Number of obs = 125 Target = 74 Center = LSL = StdDev = USL = Capability indices: Value 2.5% 97.5% Cp Cp_l Cp_u

10 48 4 qcc: R Cp_k Cpm Exp<LSL 0% Obs<LSL 0% Exp>USL 0% Obs>USL 0% 4.7 pistonrings diameter target qcc std.dev confidence.level process.capability.sixpack.plots() 1 ˆ X ˆ R n > 10 s ˆ run chart ˆ ˆ QQ ˆ

11 > process.capability.sixpack(obj, spec.limits=c(73.95,74.05), + target= 74.01) 4.8 pareto.chart() > defect <- c(80, 27, 66, 94, 33) > names(defect) <- c("price code", "schedule date", "supplier code", + "contact num.", "part num.") > pareto.chart(defect) > # QCtools > defect <- data.frame(defect, names(defect)) 4.8 help(pareto.chart) 4.8 1

12 50 4 qcc: R qcc cause.and.effect() 2 1 cause 1 effect cex fonts > cause.and.effect( + cause=list(measurements=c("microscopes", "Inspectors") + Materials=c("Alloys", "Suppliers"), + Personnel=c("Supervisors", "Operators"), + Environment=c("Condensation", "Moisture"), + Methods=c("Brake", "Engager", "Angle"), + Machines=c("Speed", "Bits", "Sockets")), + effect="surface Flaws") qcc.options() qcc help(qcc.options) n p p

13 z * type stats.type,sd.type and limits.type p stats.p.std <- function(data, sizes) { data <- as.vector(data) sizes <- as.vector(sizes) pbar <- sum(data)/sum(sizes) z <- (data/sizes - pbar)/sqrt(pbar*(1-pbar)/sizes) list(statistics = z, center = 0) } sd.p.std <- function(data, sizes) return(1) limits.p.std <- function(center, std.dev, sizes, conf) { if (conf >= 1) { lcl <- -conf ucl <- +conf } else { if (conf > 0 & conf < 1) { nsigmas <- qnorm(1 - (1 - conf)/2) lcl <- -nsigmas ucl <- +nsigmas } else stop("invalid conf argument.") } limits <- matrix(c(lcl, ucl), ncol = 2) rownames(limits) <- rep("", length = nrow(limits)) colnames(limits) <- c("lcl", "UCL") return(limits) } 4.10 # n > n <- c(rep(50,5), rep(100,5), rep(25, 5)) # n =0.2 > x <- rbinom(length(n), n, 0.2) > par(mfrow=c(1,2)) # > qcc(x, type="p", size=n) # > qcc(x, type="p.std", size=n) *2 6.3 z

14 52 4 qcc: R 4.10 p

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

講義のーと : データ解析のための統計モデリング. 第2回

講義のーと :  データ解析のための統計モデリング. 第2回 Title 講義のーと : データ解析のための統計モデリング Author(s) 久保, 拓弥 Issue Date 2008 Doc URL http://hdl.handle.net/2115/49477 Type learningobject Note この講義資料は, 著者のホームページ http://hosho.ees.hokudai.ac.jp/~kub ードできます Note(URL)http://hosho.ees.hokudai.ac.jp/~kubo/ce/EesLecture20

More information

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

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

¥¤¥ó¥¿¡¼¥Í¥Ã¥È·×¬¤È¥Ç¡¼¥¿²òÀÏ Âè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による計量分析:データ解析と可視化 - 第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

こんにちは由美子です

こんにちは由美子です 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

分布

分布 (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

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

(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

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

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

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

こんにちは由美子です

こんにちは由美子です 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

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

統計研修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

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

Excel97関数編

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

More information

1 1 ( ) ( 1.1 1.1.1 60% mm 100 100 60 60% 1.1.2 A B A B A 1

1 1 ( ) ( 1.1 1.1.1 60% mm 100 100 60 60% 1.1.2 A B A B A 1 1 21 10 5 1 E-mail: qliu@res.otaru-uc.ac.jp 1 1 ( ) ( 1.1 1.1.1 60% mm 100 100 60 60% 1.1.2 A B A B A 1 B 1.1.3 boy W ID 1 2 3 DI DII DIII OL OL 1.1.4 2 1.1.5 1.1.6 1.1.7 1.1.8 1.2 1.2.1 1. 2. 3 1.2.2

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

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

JMP V4 による生存時間分析

JMP V4 による生存時間分析 V4 1 SAS 2000.11.18 4 ( ) (Survival Time) 1 (Event) Start of Study Start of Observation Died Died Died Lost End Time Censor Died Died Censor Died Time Start of Study End Start of Observation Censor

More information

Microsoft Word - 計量研修テキスト_第5版).doc

Microsoft Word - 計量研修テキスト_第5版).doc Q10-2 テキスト P191 1. 記述統計量 ( 変数 :YY95) 表示変数として 平均 中央値 最大値 最小値 標準偏差 観測値 を選択 A. 都道府県別 Descriptive Statistics for YY95 Categorized by values of PREFNUM Date: 05/11/06 Time: 14:36 Sample: 1990 2002 Included

More information

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

ATM M.Shimura JCD02773@nifty.ne.jp 2003 12 13 JAPLA2003 1 queue ATM ATM queue 1.1 ATM No (Sec (Sec 1 13 37 60 26 28 99 1 25 40 39 143 202 14 88 190 27 1 184 2 170 37 40 130 317 15 121 72 28 48 115 3 101

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

kubostat2018d p.2 :? bod size x and fertilization f change seed number? : a statistical model for this example? i response variable seed number : { i

kubostat2018d p.2 :? bod size x and fertilization f change seed number? : a statistical model for this example? i response variable seed number : { i kubostat2018d p.1 I 2018 (d) model selection and kubo@ees.hokudai.ac.jp http://goo.gl/76c4i 2018 06 25 : 2018 06 21 17:45 1 2 3 4 :? AIC : deviance model selection misunderstanding kubostat2018d (http://goo.gl/76c4i)

More information

2 Part A B C A > B > C (0) 90, 69, 61, 68, 6, 77, 75, 20, 41, 34 (1) 8, 56, 16, 50, 43, 66, 44, 77, 55, 48 (2) 92, 74, 56, 81, 84, 86, 1, 27,

2 Part A B C A > B > C (0) 90, 69, 61, 68, 6, 77, 75, 20, 41, 34 (1) 8, 56, 16, 50, 43, 66, 44, 77, 55, 48 (2) 92, 74, 56, 81, 84, 86, 1, 27, / (1) (2) (3) ysawano@tmu.ac.jp (4) (0) (10) 11 (10) (a) (b) (c) (5) - - 11160939-11160939- - 1 2 Part 1. 1. 1. A B C A > B > C (0) 90, 69, 61, 68, 6, 77, 75, 20, 41, 34 (1) 8, 56, 16, 50, 43, 66, 44,

More information

C言語によるアルゴリズムとデータ構造

C言語によるアルゴリズムとデータ構造 Algorithms and Data Structures in C 4 algorithm List - /* */ #include List - int main(void) { int a, b, c; int max; /* */ Ÿ 3Ÿ 2Ÿ 3 printf(""); printf(""); printf(""); scanf("%d", &a); scanf("%d",

More information

yamadaiR(cEFA).pdf

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

More information

レイアウト 1

レイアウト 1 1 1 3 5 25 41 51 57 109 2 4 Q1 A. 93% 62% 41% 6 7 8 Q1-(1) Q2 A. 24% 13% 52% Q3 Q3 A. 68% 64 Q3-(2) Q3-(1) 9 10 A. Q3-(1) 11 A. Q3-(2) 12 A. 64% Q4 A. 47% 47% Q5 QQ A. Q Q A. 13 QQ A. 14 Q5-(1) A. Q6

More information

10_11p01(Ł\”ƒ)

10_11p01(Ł\”ƒ) q q q q q q q q q q q q q q q q q q q q q q q q q qq q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q q

More information

¥×¥í¥°¥é¥ß¥ó¥°±é½¬I Exercise on Programming I [1zh] ` `%%%`#`&12_`__~~~ alse

¥×¥í¥°¥é¥ß¥ó¥°±é½¬I  Exercise on Programming I [1zh] ` `%%%`#`&12_`__~~~alse I Exercise on Programming I http://bit.ly/oitprog1 1, 2 of 14 ( RD S ) I 1, 2 of 14 1 / 44 Ruby Ruby ( RD S ) I 1, 2 of 14 2 / 44 7 5 9 2 9 3 3 2 6 5 1 3 2 5 6 4 7 8 4 5 2 7 9 6 4 7 1 3 ( RD S ) I 1, 2

More information

服用者向け_資料28_0623

服用者向け_資料28_0623 1 2 3 1. 2. 4 3. 4. 1. 5 2. 3. 4. 5. 6 6. 7. 8. 7 9. 10. 11. 8 12. 9 10 11 12 Q-1 : OC Q-2 : OC Q-3 : 21 OC 28 OC 13 Q-4 : OC Q-5 : OC Q-6 : OC 14 Q-7 : Q-8 : OC Q-9 : OC Q-10 : OC Q-11 : OC 15 Q-12 :

More information

untitled

untitled 98 17 (2005) 81 () () E-mail : uesugi@mx4.ttcn.ne.jp 1) 1 2 3 QE 4 LSI 5 6L 18 7 8 9 10 11 12 2) 13 14() 15 1617 18 AN SN 19. 2 20 21 22 () 3) 23 SN 24() - 2 25 26 27(1) 28 (2) 4) 29 30QE 31() 32 () 33

More information

平成13年度日本分析センター年報

平成13年度日本分析センター年報 200 150 70 234 Bq m 3 1 148 Bq m -3 100 0 550 0 11/1 0:00 am 11/2 0:00 am 11/3 0:00 am 25 20 15 10 11/1 0:00 am 11/2 0:00 am 11/3 0:00 am 39.2 Bq m -3 11/4 0:00 am 30 990 19.3 Bq m -3 60 15.8 Bq m -3 14.1

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

2 3

2 3 Sample 2 3 4 5 6 7 8 9 3 18 24 32 34 40 45 55 63 70 77 82 96 118 121 123 131 143 149 158 167 173 187 192 204 217 224 231 17 285 290 292 1 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38

More information

Copyright c 2008 Zhenjiang Hu, All Right Reserved.

Copyright c 2008 Zhenjiang Hu, All Right Reserved. 2008 10 27 Copyright c 2008 Zhenjiang Hu, All Right Reserved. (Bool) True False data Bool = False True Remark: not :: Bool Bool not False = True not True = False (Pattern matching) (Rewriting rules) not

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

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 Stata SEM LightStone 4 SEM 4.. Alan C. Acock, Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press 3.

1 Stata SEM LightStone 4 SEM 4.. Alan C. Acock, Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press 3. 1 Stata SEM LightStone 4 SEM 4.. Alan C. Acock, 2013. Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press 3. 2 4, 2. 1 2 2 Depress Conservative. 3., 3,. SES66 Alien67 Alien71,

More information

(Nov/2009) 2 / = (,,, ) 1 4 3 3 2/8

(Nov/2009) 2 / = (,,, ) 1 4 3 3 2/8 (Nov/2009) 1 sun open-office calc 2 1 2 3 3 1 3 1 2 3 1 2 3 1/8 (Nov/2009) 2 / = (,,, ) 1 4 3 3 2/8 (Nov/2009) 1 (true) false 1 2 2 A1:A10 A 1 2 150 3 200 4 250 5 320 6 330 7 360 8 380 9 420 10 480 (1)

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

- 1-128 - 2 -

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

More information

I L01( Wed) : Time-stamp: Wed 07:38 JST hig e, ( ) L01 I(2017) 1 / 19

I L01( Wed) : Time-stamp: Wed 07:38 JST hig e,   ( ) L01 I(2017) 1 / 19 I L01(2017-09-20 Wed) : Time-stamp: 2017-09-20 Wed 07:38 JST hig e, http://hig3.net ( ) L01 I(2017) 1 / 19 ? 1? 2? ( ) L01 I(2017) 2 / 19 ?,,.,., 1..,. 1,2,.,.,. ( ) L01 I(2017) 3 / 19 ? I. M (3 ) II,

More information

Presentation Title Goes Here

Presentation  Title Goes Here SAS 9: (reprise) SAS Institute Japan Copyright 2004, SAS Institute Inc. All rights reserved. Greetings, SAS 9 SAS 9.1.3 Copyright 2004, SAS Institute Inc. All rights reserved. 2 Informations of SAS 9 SAS

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

Stata11 whitepapers mwp-037 regress - regress regress. regress mpg weight foreign Source SS df MS Number of obs = 74 F(

Stata11 whitepapers mwp-037 regress - regress regress. regress mpg weight foreign Source SS df MS Number of obs = 74 F( mwp-037 regress - regress 1. 1.1 1.2 1.3 2. 3. 4. 5. 1. regress. regress mpg weight foreign Source SS df MS Number of obs = 74 F( 2, 71) = 69.75 Model 1619.2877 2 809.643849 Prob > F = 0.0000 Residual

More information

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

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

More information

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

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

!!! 2!

!!! 2! 2016/5/17 (Tue) SPSS (mugiyama@l.u-tokyo.ac.jp)! !!! 2! 3! 4! !!! 5! (Population)! (Sample) 6! case, observation, individual! variable!!! 1 1 4 2 5 2 1 5 3 4 3 2 3 3 1 4 2 1 4 8 7! (1) (2) (3) (4) categorical

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

10 z c j = N 1 N t= j1 [ ( z t z ) ( )] z t j z q 2 1 2 r j /N j=1 1/ N J Q = N(N 2) 1 N j j=1 r j 2 2 χ J B d z t = z t d (1 B) 2 z t = (z t z t 1 ) (z t 1 z t 2 ) (1 B s )z t = z t z t s _ARIMA CONSUME

More information

CM1-GTX

CM1-GTX CM1-GTX000-2002 R R i R ii 1-1 1-2 1-3 Process Variables Process Variables Pressure Output Analog Output Sensor Temp. Lower Range Value (0%) Upper Range Value (100%) Pressure Pressure Chart Pressure

More information

卒業論文

卒業論文 Y = ax 1 b1 X 2 b2...x k bk e u InY = Ina + b 1 InX 1 + b 2 InX 2 +...+ b k InX k + u X 1 Y b = ab 1 X 1 1 b 1 X 2 2...X bk k e u = b 1 (ax b1 1 X b2 2...X bk k e u ) / X 1 = b 1 Y / X 1 X 1 X 1 q YX1

More information

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

こんにちは由美子です

こんにちは由美子です 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

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

z-tree 2005 4 1 1 4 1.1............................ 4 1.2.............................. 5 1.3......................................... 5 1.4............................................. 5 1.5................................

More information

BW BW

BW BW Induced Sorting BW 11T2042B 2015 3 23 1 1 1.1................................ 1 1.2................................... 1 2 BW 1 2.1..................................... 2 2.2 BW.................................

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

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

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

Emacs ML let start ::= exp (1) exp ::= (2) fn id exp (3) ::= (4) (5) ::= id (6) const (7) (exp) (8) let val id = exp in

Emacs ML let start ::= exp (1) exp ::= (2) fn id exp (3) ::= (4) (5) ::= id (6) const (7) (exp) (8) let val id = exp in Emacs, {l06050,sasano}@sic.shibaura-it.ac.jp Eclipse Visual Studio Standard ML Haskell Emacs 1 Eclipse Visual Studio variable not found LR(1) let Emacs Emacs Emacs Java Emacs JDEE [3] JDEE Emacs Java 2

More information

2 2 ( M2) ( )

2 2 ( M2) ( ) 2 2 ( M2) ( ) 2007 3 3 1 2 P. Gaudry and R. Harley, 2000 Schoof 63bit 2 8 P. Gaudry and É. Schost, 2004 80bit 1 / 2 16 2 10 2 p: F p 2 C : Y 2 =F (X), F F p [X] : monic, deg F = 5, J C (F p ) F F p p Frobenius

More information

Release Notes for JMP book

Release Notes for JMP book 8.0.2 JMP, A Business Unit of SAS SAS Campus Drive Cary, NC 27513 SAS Institute Inc. 2009.JMP 8.0.2, Cary, NC: SAS Institute Inc. JMP 8.0.2 Copyright 2009, SAS Institute Inc., Cary, NC, USA All rights

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

double float

double float 2015 3 13 1 2 2 3 2.1.......................... 3 2.2............................. 3 3 4 3.1............................... 4 3.2 double float......................... 5 3.3 main.......................

More information

2017 p vs. TDGL 4 Metropolis Monte Carlo equation of continuity s( r, t) t + J( r, t) = 0 (79) J s flux (67) J (79) J( r, t) = k δf δs s( r,

2017 p vs. TDGL 4 Metropolis Monte Carlo equation of continuity s( r, t) t + J( r, t) = 0 (79) J s flux (67) J (79) J( r, t) = k δf δs s( r, 27 p. 47 7 7. vs. TDGL 4 Metropolis Monte Carlo equation of continuity s( r, t) t + J( r, t) = (79) J s flux (67) J (79) J( r, t) = k δf δs s( r, t) t = k δf δs (59) TDGL (8) (8) k s t = [ T s s 3 + ξ

More information

Solution Report

Solution Report CGE 3 GAMS * Date: 2018/07/24, Version 1.1 1 2 2 GAMSIDE 3 2.1 GAMS................................. 3 2.2 GAMSIDE................................ 3 2.3 GAMSIDE............................. 7 3 GAMS 11

More information

統計的工程管理の再考 | 仁科 健教授(名古屋工業大学)

統計的工程管理の再考 | 仁科 健教授(名古屋工業大学) 2007.12.05 第 17 回 JUSE パッケージ活用事例シンポジウム 統計的工程管理の再考 名古屋工業大学 仁科健 講演要旨 統計的工程管理 (SPC) は品質管理の伝統的な管理体系の一つです. しかし, 生産技術や計測技術の進歩など生産ラインの環境は様変わりしています. また, 物理的加工と化学的加工とではSPCの考え方が違ってくるのかもしれません. これらを踏まえ,SPCを再考します.

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

bron.dvi

bron.dvi 1p 76p 12 2 4 80238 1 1 7 1.1... 8 1.1.1... 8 1.1.2... 8 1.1.3... 9 1.2... 10 1.3... 10 2 11 2.1... 12 2.2... 13 2.2.1 (SEM)... 13 2.2.2... 14 2.2.3... 17 2.2.4 SEM 3... 17 2.3... 19 2.3.1... 19 2.3.2...

More information

明解Javaによるアルゴリズムとデータ構造

明解Javaによるアルゴリズムとデータ構造 21 algorithm List 1-1 a, b, c max Scanner Column 1-1 List 1-1 // import java.util.scanner; class Max3 { public static void main(string[] args) { Scanner stdin = new Scanner(System.in); Chap01/Max3.java

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

新・明解Javaで学ぶアルゴリズムとデータ構造

新・明解Javaで学ぶアルゴリズムとデータ構造 第 1 章 基本的 1 n 21 1-1 三値 最大値 algorithm List 1-1 a, b, c max // import java.util.scanner; class Max3 { public static void main(string[] args) { Scanner stdin = new Scanner(System.in); List 1-1 System.out.println("");

More information