exp( β i z i ) survreg() R survival library(survival) require(survival) 3 survfit() t 1, t 2,... t 1 d 1 t 2 d 2 t 1, t 2,... n 1, n 2,... n i t i n 1

Size: px
Start display at page:

Download "exp( β i z i ) survreg() R survival library(survival) require(survival) 3 survfit() t 1, t 2,... t 1 d 1 t 2 d 2 t 1, t 2,... n 1, n 2,... n i t i n 1"

Transcription

1 (nminato@med.gunma-u.ac.jp) web (Survival Analysis Event History Analysis) Kaplan-Meier a x x (T x) x (l x) q x l x (1 q x /2) x x + 1 L x x x q x l x l x a population at risk (1995) 1

2 exp( β i z i ) survreg() R survival library(survival) require(survival) 3 survfit() t 1, t 2,... t 1 d 1 t 2 d 2 t 1, t 2,... n 1, n 2,... n i t i n t 1 1 t 2 3 d 1 = 1 d 2 = 2 n 1 = 5 n 2 = 3 Ŝ(t) Ŝ(t) = (1 d 1 /n 1 )(1 d 2 /n 2 )... = i<t(1 d i /n i ) var(ŝ) = Ŝ2 i<t d i n i (n i d i ) R library(survival) require(survival) Surv( ) survival Recommended Windows R R built-in base, datasets, grdevices, graphics, grid, methods, splines, stats, stats4, tcltk, tools, utils Recommended built-in survival KernSmooth, MASS, boot, class, cluster, foreign, lattice, mgcv, nlme, nnet, rpart, spatial search().packages(all.avail=t) detach(package:survival) 2

3 TRUE FALSE Surv( ) dat time <- c(81,22,29) time2 <- c(92,22,na) event <- c(3,1,0) dat <- Surv(time,time2,event,type="interval") dat res <- survfit(dat) plot(res) summary(res) difftime() ISOdate() x names dob dod difftime() 4 [x$names=="robert"] Robert alivedays as.date() ISOdate(,, ) 4 it r x <- data.frame( names = c("edward","shibasaburo","robert","hideyo"), dob = c(" "," "," "," "), dod = c(" "," "," "," ")) alivedays <- difftime(x$dod,x$dob)[x$names=="robert"] as.numeric(alivedays/365.24) as.numeric(difftime(isodate(2007,1,22),x$dob)/365.24) 4 3

4 1 (1995) p Gehan 42 6-MP R MASS 2 it r require(mass) require(survival) print(res<-survfit(surv(time,cens)~treat,data=gehan)) par(family="sans",las=1) plot(res,lty=c(1,2),main="gehan ") legend(30,0.2,lty=c(1,2),legend=levels(gehan$treat)) summary(res) % Call: survfit(formula = Surv(time, cens) ~ treat, data = gehan) n events median 0.95LCL 0.95UCL treat=6-mp Inf treat=control summary(res) 95% 4

5 Call: survfit(formula = Surv(time, cens) ~ treat, data = gehan) treat=6-mp time n.risk n.event survival std.err lower 95% CI upper 95% CI treat=control time n.risk n.event survival std.err lower 95% CI upper 95% CI NA NA NA 2 survival aml (acute myelogenous leukemia) a time status 0 1 x Maintained Nonmaintained a : Miller RG: Survival Analysis. John Wiley and Sons, Embury SH, Elias L, Heller PH, Hood CE, Greenberg PL, Schrier SL: Remission maintenance therapy in acute myelogenous leukaemia. Western Journal of Medicine, 126, , Gehan it r require(survival) print(res <- survfit(surv(time,status)~x, data=aml)) summary(res) par(family="sans",las=1) plot(res,lty=c(1,2),main=" ") legend(100,0.8,lty=c(1,2),legend=c(" "," ")) 5

6 2 n events median 0.95LCL 0.95UCL x=maintained Inf x=nonmaintained Inf % % 3 1 survdiff() A 2 B 1 4,6,8,9 2 5,7,12, i j e ij i d i i j n ij i n i e ij = d i n ij /n i 5 e 11 = 1 n 11 /n 1 = 4/8 = 0.5 i j d ij w i i j u ij u ij = w i (d ij e ij ) 1 5 6

7 u 1 = i (d i1 e i1 ) u 1 = (1 4/8) + (0 3/7) + (1 3/6) + (0 2/5) + (1 2/4) + (1 1/3) + (0 0/2) + (0 0/1) V = V jj = i (n i n ij )n ij d i (n i d i ) n i2 (n i 1) V = (8 4) 4 (7 3) 3 (6 3) 3 (5 2) 2 (4 2) 2 (3 1) *4/64+4*3/49+3*3/36+3*2/25+2*2/16+2*1/ χ 2 = /1.457 = % % R time event group survdiff(surv(time,event)~group) survdiff(surv(time,event)~group,rho=1) it r require(survival) time <- c(4,6,8,9,5,7,12,14) event <- c(1,1,1,1,1,1,1,1) group <- c(1,1,1,1,2,2,2,2) survdiff(surv(time,event)~group) χ 2 = p = % % survdiff(surv(time,status)~x,data=aml) % R coxph() z i = (z i1, z i2,..., z ip ) i t h(z i, t) 7

8 h(z i, t) = h 0 (t) exp(β 1 z i1 + β 2 z i β p z ip ) h 0 (t) t β 1, β 2,..., β p exp(β x z ix ) Cox z i 1 2 t h 0 (t) exp(β 1 z 11 + β 2 z β p z 1p ) exp(β 1 z 21 + β 2 z β p z 2p ) T S(t) T t S(0) = 1 h(t) t Pr(t T < t + t T t) S(t) S(t + t) h(t) = lim = lim t 0 t t 0 ts(t) = ds(t) dt 1 S(t) = d(log(s(t)) dt H(t) = t h(u)du = log S(t) S(t) = exp( H(t)) 0 z S(z, t) H(z, H(z, t) = t 0 h(z, u)du = t 0 h 0 (u) exp(βz)du = exp(βz)h 0 (t) S(z, t) = exp( H(z, t)) = exp{ exp(βz)h 0 (t)} log( log S(z, t)) = βz + log H 0 (t) βz 8

9 β t i t 1 t i i L L β L Cox 6 R coxph(surv(time,cens)~grp+covar,data=dat) 4 2 it r require(survival) summary(res <- coxph(surv(time,status)~x,data=aml)) loglogplot <- function(x) { S <- X$surv T <- X$time G <- X$ntimes.strata GG <- names(x$strata) GX <- rep(gg,g) xr <- c(0,max(t)*1.5) mas <- ifelse(max(s)==1,0.99,max(s)) mis <- ifelse(min(s)==0,0.01,min(s)) yr <- c(log(-log(mas)),log(-log(mis))) plot(t[gx==gg[1]],log(-log(s[gx==gg[1]])),type="l",lty=1,xlim=xr,ylim=yr, xlab="time",ylab="log(-log(s))",main=" ") for (i in 2:length(GG)) { lines(t[gx==gg[i]],log(-log(s[gx==gg[i]])),lty=i) } legend(max(t),-2,legend=gg,lty=1:length(gg)) } KM <- survfit(surv(time,status)~x,data=aml) par(family="sans",las=1,mfrow=c(1,2)) plot(km,main="aml ") loglogplot(km) 2 6 Exact Breslow Efron Exact Breslow R coxph() Efron Breslow Efron Exact 9

10 Call: coxph(formula = Surv(time, status) ~ x, data = aml) n= 23 coef exp(coef) se(coef) z p xnonmaintained exp(coef) exp(-coef) lower.95 upper.95 xnonmaintained Rsquare= (max possible= ) Likelihood ratio test= 3.38 on 1 df, p= Wald test = 3.2 on 1 df, p= Score (logrank) test = 3.42 on 1 df, p= % 7 exp(coef) % 1 5% Gehan 6-MP it r require(mass) require(survival) res <- coxph(surv(time,cens)~treat,data=gehan) summary(res) plot(survfit(res)) summary(res) plot(survfit(res)) 95% 7 Score (logrank) test Rao Score survdiff() % plot(survfit(coxph(surv(time,cens)~treat+pair,data=gehan))) plot(survfit(surv(time,cens),data=gehan)) 2 coxph() subset=(treat=="6-mp") 2 par(new=t) 10

11 Call: coxph(formula = Surv(time, cens) ~ treat, data = gehan) n= 42 coef exp(coef) se(coef) z p treatcontrol exp(coef) exp(-coef) lower.95 upper.95 treatcontrol Rsquare= (max possible= ) Likelihood ratio test= 16.4 on 1 df, p=5.26e-05 Wald test = 14.5 on 1 df, p= Score (logrank) test = 17.3 on 1 df, p=3.28e-05 5% 6-MP exp(coef) MP % [2.15, 10.8] 6-MP R coxph() strata() time event treat stage coxph(surv(time,event)~treat+strata(stage)) 2 AIC 11

12 6 survival colon 1 Levamisole 5-FU 1 2 id study rx id 1 3 Obs Lev Levamisole Lev+5FU sex 1 0 age obstruct 1 0 perfor 1 0 adhere 1 0 nodes status 1 0 differ extent surg 0 1 node time etype 1 2 Levamisole 5-FU colon2 colon2 <- subset(colon,etype==2) loglogplot() it r colon2$sex <- factor(colon2$sex) KM <- survfit(surv(time,status)~rx,data=colon2) layout(1:2) plot(km) loglogplot(km) res <- coxph(surv(time,status)~rx+age+sex,data=colon2) summary(res) Levamisole 5-FU % [0.545,0.869] R 2 = χ 2 = 12.5 d.f. = 4, p = %

13 attach(colon2) xls <- c(0,max(time)) plot(survfit(coxph(surv(time,status)~age+sex,subset=(rx=="obs"))),col=1,xlim=xls) par(new=t) plot(survfit(coxph(surv(time,status)~age+sex,subset=(rx=="lev"))),col=2,xlim=xls) par(new=t) plot(survfit(coxph(surv(time,status)~age+sex,subset=(rx=="lev+5fu"))),col=3,xlim=xls) detach(colon2) 7 (1995) A R p SAS R coxph() pcancer.r dat <- read.delim(" dat$censor <- 1-dat$CENSOR dat$sex <- factor(dat$sex, labels=c(" "," ")) dat$treat <- factor(dat$treat, labels=c(" "," ")) dat$ch <- ordered(dat$ch,labels=c("ch0","ch1","ch2","ch3")) dat$stage <- ordered(dat$stage,labels=c("iii","iv")) dat$ps <- ordered(dat$ps,labels=c("0,1","2","3","4")) # data from (1995) SAS A.3 # Nishimura et al # # Minato Nakazawa 20/1/2007 R 1 CENSOR # *** *** # CASENO # TIME # CENSOR 1 0 R 1 # AGE # SEX 0 1 # TREAT 0 1 # BUI 0 1 # CH 1 CH0 2:CH1 3:CH2 4:CH3 # P 0 1 # STAGE TNM 3:III 4:IV # PS Performance Status 1:0,1 2:2 3:3 4:4 pcancer.r 10 SAS Breslow method="breslow" Efron Exact 10 source(" 13

14 it r require(survival) summary(coxph(surv(time,censor)~age+sex+treat, data=dat, method="breslow")) summary(coxph(surv(time,censor)~age+sex+treat, data=dat, method="efron")) summary(coxph(surv(time,censor)~age+sex+treat, data=dat, method="exact")) res <- step(coxph(surv(time,censor)~age+sex+treat+bui+ch+p+stage+ps, data=dat, method="breslow")) summary(res) Breslow SAS SAS TREAT BUI STAGE STAGE (1995) SAS. survival ovarian 2 Eastern Cooperative Oncology Group futime fustat age resid.ds 1 2 rx ecog.ps ECOG A4 web 14

2 H23 BioS (i) data d1; input group patno t sex censor; cards;

2 H23 BioS (i) data d1; input group patno t sex censor; cards; H BioS (i) data d1; input group patno t sex censor; cards; 0 1 0 0 0 0 1 0 1 1 0 4 4 0 1 0 5 5 1 1 0 6 5 1 1 0 7 10 1 0 0 8 15 0 1 0 9 15 0 1 0 10 4 1 0 0 11 4 1 0 1 1 5 1 0 1 1 7 0 1 1 14 8 1 0 1 15 8

More information

PowerPoint プレゼンテーション

PowerPoint プレゼンテーション 27//26 第 4 回 医学統計勉強会 東北大学病院循環器内科 東北大学病院臨床研究推進センター 共催 東北大学大学院医学系研究科 EBM 開発学寄附講座 宮田 敏 生存時間解析生存曲線,Cox 比例ハザードモデル 生存時間解析 (survival time analysis) では, 基準となるある時点から, 目的となるイベントの発生までの時間を解析する. 例えば, ある疾患の登録研究において,

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

201711grade1ouyou.pdf

201711grade1ouyou.pdf 2017 11 26 1 2 52 3 12 13 22 23 32 33 42 3 5 3 4 90 5 6 A 1 2 Web Web 3 4 1 2... 5 6 7 7 44 8 9 1 2 3 1 p p >2 2 A 1 2 0.6 0.4 0.52... (a) 0.6 0.4...... B 1 2 0.8-0.2 0.52..... (b) 0.6 0.52.... 1 A B 2

More information

Kaplan-Meierプロットに付加情報を追加するマクロの作成

Kaplan-Meierプロットに付加情報を追加するマクロの作成 Kaplan-Meier 1, 2,3 1 2 3 A SAS macro for extended Kaplan-Meier plots Kengo Nagashima 1, Yasunori Sato 2,3 1 Department of Parmaceutical Technochemistry, Josai University 2 School of Medicine, Chiba University

More information

「産業上利用することができる発明」の審査の運用指針(案)

「産業上利用することができる発明」の審査の運用指針(案) 1 1.... 2 1.1... 2 2.... 4 2.1... 4 3.... 6 4.... 6 1 1 29 1 29 1 1 1. 2 1 1.1 (1) (2) (3) 1 (4) 2 4 1 2 2 3 4 31 12 5 7 2.2 (5) ( a ) ( b ) 1 3 2 ( c ) (6) 2. 2.1 2.1 (1) 4 ( i ) ( ii ) ( iii ) ( iv)

More information

Rを用いた生物統計解析入門

Rを用いた生物統計解析入門 R を用いた生物統計解析入門 2006 年 5 月 26 日日本計量生物学会チュートリアルセミナー ( 於 国立保健医療科学院 ) 群馬大学大学院医学系研究科社会環境医療学講座生態情報学中澤港 May 26, 2006 / Slide 1 本日の目的 聴衆としては, SAS ユーザを想定 既に SAS で統計処理をする方法や, 統計の理論はわかっている方が対象 したがって, 統計の詳しい説明はしない

More information

Mantel-Haenszelの方法

Mantel-Haenszelの方法 Mantel-Haenszel 2008 6 12 ) 2008 6 12 1 / 39 Mantel & Haenzel 1959) Mantel N, Haenszel W. Statistical aspects of the analysis of data from retrospective studies of disease. J. Nat. Cancer Inst. 1959; 224):

More information

*1 * Wilcoxon 2 2 t t t t d t M t N t M t n t N t n t N t d t N t t at ri

*1 * Wilcoxon 2 2 t t t t d t M t N t M t n t N t n t N t d t N t t at ri Wilcoxon H23 BioS 1 Wilcoxon 2 2.1 1 2 1 0 1 1 5 0 1 2 7 0 1 3 8 1 1 4 12 0 2 5 2 0 2 6 3 1 2 7 4 1 2 8 10 0 Wilcoxon 2.2 S 1 t S 2 t Wilcoxon H 0 H 1 H 0 : S 1 t S 2 t H 1 : S 1 t S 2 t 1 *1 *2 2.3 2.3.1

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

untitled

untitled 18 1 2,000,000 2,000,000 2007 2 2 2008 3 31 (1) 6 JCOSSAR 2007pp.57-642007.6. LCC (1) (2) 2 10mm 1020 14 12 10 8 6 4 40,50,60 2 0 1998 27.5 1995 1960 40 1) 2) 3) LCC LCC LCC 1 1) Vol.42No.5pp.29-322004.5.

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

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

食道がん化学放射線療法後のsalvage手術

食道がん化学放射線療法後のsalvage手術 2006 2 17 52 Daly JM, et al. J Am Coll Surg 2000;190:562-573 Esophageal Cancer: Results of an American College of Surgeons Patient Care Evaluation Study Daly JM, et al. J Am Coll Surg 2000;190:562-573

More information

1 I

1 I 1 I 3 1 1.1 R x, y R x + y R x y R x, y, z, a, b R (1.1) (x + y) + z = x + (y + z) (1.2) x + y = y + x (1.3) 0 R : 0 + x = x x R (1.4) x R, 1 ( x) R : x + ( x) = 0 (1.5) (x y) z = x (y z) (1.6) x y =

More information

1 Tokyo Daily Rainfall (mm) Days (mm)

1 Tokyo Daily Rainfall (mm) Days (mm) ( ) r-taka@maritime.kobe-u.ac.jp 1 Tokyo Daily Rainfall (mm) 0 100 200 300 0 10000 20000 30000 40000 50000 Days (mm) 1876 1 1 2013 12 31 Tokyo, 1876 Daily Rainfall (mm) 0 50 100 150 0 100 200 300 Tokyo,

More information

untitled

untitled 19 11 13 300 18 3 31 1300mg 4 6 C 15 H 22 FN 3 O 6 359.35 + -1-5--β-D--5--1,2--2- -4- 19 11 13 300 18 3 31 A B B A 30 1 2 21 7 1 1 1.31m 2 900mg 1.31m 2 1.64m 2 1,200mg 1.64m 2 1,500mg B 30 1 2 14 7 1

More information

日本製薬工業協会シンポジウム 生存時間解析の評価指標に関する最近の展開ー RMST (restricted mean survival time) を理解するー 2. RMST の定義と統計的推測 2018 年 6 月 13 日医薬品評価委員会データサイエンス部会タスクフォース 4 生存時間解析チー

日本製薬工業協会シンポジウム 生存時間解析の評価指標に関する最近の展開ー RMST (restricted mean survival time) を理解するー 2. RMST の定義と統計的推測 2018 年 6 月 13 日医薬品評価委員会データサイエンス部会タスクフォース 4 生存時間解析チー 日本製薬工業協会シンポジウム 生存時間解析の評価指標に関する最近の展開ー RMST (restricted mean survival time) を理解するー 2. RMST の定義と統計的推測 2018 年 6 月 13 日医薬品評価委員会データサイエンス部会タスクフォース 4 生存時間解析チーム 日本新薬 ( 株 ) 田中慎一 留意点 本発表は, 先日公開された 生存時間型応答の評価指標 -RMST(restricted

More information

ii

ii ii iii 1 1 1.1..................................... 1 1.2................................... 3 1.3........................... 4 2 9 2.1.................................. 9 2.2...............................

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

一般化線形 (混合) モデル (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

I 12 1 26 4 23 42 1 12 2 12 3 12 4 13 5 13 6 13 7 13 8 14 9 14 10 14 11 14 2 26 3 26 10 27 28 11 28 12 28 13 28 VI 29 1 29 1 29 34 5 35 6 35 7 35 8 35 9 36 10 36 11 36 12 36 1 42 2 42 24 43 25 43 26 43

More information

S I. dy fx x fx y fx + C 3 C vt dy fx 4 x, y dy yt gt + Ct + C dt v e kt xt v e kt + C k x v k + C C xt v k 3 r r + dr e kt S Sr πr dt d v } dt k e kt

S I. dy fx x fx y fx + C 3 C vt dy fx 4 x, y dy yt gt + Ct + C dt v e kt xt v e kt + C k x v k + C C xt v k 3 r r + dr e kt S Sr πr dt d v } dt k e kt S I. x yx y y, y,. F x, y, y, y,, y n http://ayapin.film.s.dendai.ac.jp/~matuda n /TeX/lecture.html PDF PS yx.................................... 3.3.................... 9.4................5..............

More information

Microsoft PowerPoint - SAS2012_ZHANG_0629.ppt [互換モード]

Microsoft PowerPoint - SAS2012_ZHANG_0629.ppt [互換モード] SAS による生存時間解析の実務 張方紅グラクソ スミスクライン ( 株 バイオメディカルデータサイエンス部 Practice of Survival Analysis sing SAS Fanghong Zhang Biomedical Data Science Department, GlaxoSmithKline K.K. 要旨 : SASによる生存時間解析の実務経験を共有する. データの要約

More information

S I. dy fx x fx y fx + C 3 C dy fx 4 x, y dy v C xt y C v e kt k > xt yt gt [ v dt dt v e kt xt v e kt + C k x v + C C k xt v k 3 r r + dr e kt S dt d

S I. dy fx x fx y fx + C 3 C dy fx 4 x, y dy v C xt y C v e kt k > xt yt gt [ v dt dt v e kt xt v e kt + C k x v + C C k xt v k 3 r r + dr e kt S dt d S I.. http://ayapin.film.s.dendai.ac.jp/~matuda /TeX/lecture.html PDF PS.................................... 3.3.................... 9.4................5.............. 3 5. Laplace................. 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

I, II 1, A = A 4 : 6 = max{ A, } A A 10 10%

I, II 1, A = A 4 : 6 = max{ A, } A A 10 10% 1 2006.4.17. A 3-312 tel: 092-726-4774, e-mail: hara@math.kyushu-u.ac.jp, http://www.math.kyushu-u.ac.jp/ hara/lectures/lectures-j.html Office hours: B A I ɛ-δ ɛ-δ 1. 2. A 1. 1. 2. 3. 4. 5. 2. ɛ-δ 1. ɛ-n

More information

win.metafile() emf Microsoft PowerPoint OpenOffice.org Draw 2 R CRAN R (2004) [ ](2004) (2005) The R Tips R The R Tips R 6

win.metafile() emf Microsoft PowerPoint OpenOffice.org Draw 2 R CRAN R (2004) [ ](2004) (2005) The R Tips R The R Tips R 6 R 2006 7 18-19 E-mail: nminato@med.gunma-u.ac.jp 1 R R GNU General Public License Version 2 1 GIS 2 R Fisher iris Gehan MASS Windows gehan Windows Macintosh Linux FreeBSD R CDC EPIINFO EPIINFO Windows

More information

% 10%, 35%( 1029 ) p (a) 1 p 95% (b) 1 Std. Err. (c) p 40% 5% (d) p 1: STATA (1). prtesti One-sample test of pr

% 10%, 35%( 1029 ) p (a) 1 p 95% (b) 1 Std. Err. (c) p 40% 5% (d) p 1: STATA (1). prtesti One-sample test of pr 1 1. 2014 6 2014 6 10 10% 10%, 35%( 1029 ) p (a) 1 p 95% (b) 1 Std. Err. (c) p 40% 5% (d) p 1: STATA (1). prtesti 1029 0.35 0.40 One-sample test of proportion x: Number of obs = 1029 Variable Mean Std.

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

untitled

untitled II(c) 1 October. 21, 2009 1 CS53 yamamoto@cs.kobe-u.ac.jp 3 1 7 1.1 : : : : : : : : : : : : : : : : : : : : : : 7 1.2 : : : : : : : : : : : : : : : : 8 1.2.1 : : : : : : : : : : : : : : : : : : : 8 1.2.2

More information

「スウェーデン企業におけるワーク・ライフ・バランス調査 」報告書

「スウェーデン企業におけるワーク・ライフ・バランス調査 」報告書 1 2004 12 2005 4 5 100 25 3 1 76 2 Demoskop 2 2004 11 24 30 7 2 10 1 2005 1 31 2 4 5 2 3-1-1 3-1-1 Micromediabanken 2005 1 507 1000 55.0 2 77 50 50 /CEO 36.3 37.4 18.1 3-2-1 43.0 34.4 / 17.6 3-2-2 78 79.4

More information

π, R { 2, 0, 3} , ( R),. R, [ 1, 1] = {x R 1 x 1} 1 0 1, [ 1, 1],, 1 0 1,, ( 1, 1) = {x R 1 < x < 1} [ 1, 1] 1 1, ( 1, 1), 1, 1, R A 1

π, R { 2, 0, 3} , ( R),. R, [ 1, 1] = {x R 1 x 1} 1 0 1, [ 1, 1],, 1 0 1,, ( 1, 1) = {x R 1 < x < 1} [ 1, 1] 1 1, ( 1, 1), 1, 1, R A 1 sup inf (ε-δ 4) 2018 1 9 ε-δ,,,, sup inf,,,,,, 1 1 2 3 3 4 4 6 5 7 6 10 6.1............................................. 11 6.2............................... 13 1 R R 5 4 3 2 1 0 1 2 3 4 5 π( R) 2 1 0

More information

statistics_complex_project_book.ps

statistics_complex_project_book.ps IBM SPSS Complex Samples 23 59 IBM SPSS Statistics 23 0 0 IBM SPSS Complex Samples 23 1........... 1.... 1 2............. 2................ 3 2............. 5.......... 5 :...... 5............ 6 :.......

More information

表1票4.qx4

表1票4.qx4 iii iv v 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 22 23 10 11 24 25 26 27 10 56 28 11 29 30 12 13 14 15 16 17 18 19 2010 2111 22 23 2412 2513 14 31 17 32 18 33 19 34 20 35 21 36 24 37 25 38 2614

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

(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

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

2 2 L 5 2. L L L L k.....

2 2 L 5 2. L L L L k..... L 528 206 2 9 2 2 L 5 2. L........................... 5 2.2 L................................... 7 2............................... 9. L..................2 L k........................ 2 4 I 5 4. I...................................

More information

II K116 : January 14, ,. A = (a ij ) ij m n. ( ). B m n, C n l. A = max{ a ij }. ij A + B A + B, AC n A C (1) 1. m n (A k ) k=1,... m n A, A k k

II K116 : January 14, ,. A = (a ij ) ij m n. ( ). B m n, C n l. A = max{ a ij }. ij A + B A + B, AC n A C (1) 1. m n (A k ) k=1,... m n A, A k k : January 14, 28..,. A = (a ij ) ij m n. ( ). B m n, C n l. A = max{ a ij }. ij A + B A + B, AC n A C (1) 1. m n (A k ) k=1,... m n A, A k k, A. lim k A k = A. A k = (a (k) ij ) ij, A k = (a ij ) ij, i,

More information

iii iv v vi 21 A B A B C C 1 1 2 3 4 5 6 1 2 3 4 5 6 7 8 9 10 11 19 22 30 39 43 48 54 60 65 74 77 84 87 89 95 101 12 20 23 31 40 44 49 55 61 66 75 78 85 88 90 96 102 13 21 24 32 41 45 50 56 62 67 76 79

More information

text.dvi

text.dvi Abstract JP Morgan CreditMetrics (1) () (3) (4) 1 3 3 4 4 5 10 6 16 1 1 BIS 1 3 1 BIS 1 BIS 1 3 ALM (1) Value at Risk () (3) RAROC (Risk Ajusted Return On Capital) (4) 3 5 6 31 99% (= p ) ~x X Prf~x Xg

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

連載 第 5 回 医学データの統計解析の基本 生存時間データの解析 Fundamentals of statistical analysis in biomedical research:analysis of survival data 朝倉こう子 * * 濱﨑俊光 1 生物学や医学分野において

連載 第 5 回 医学データの統計解析の基本 生存時間データの解析 Fundamentals of statistical analysis in biomedical research:analysis of survival data 朝倉こう子 * * 濱﨑俊光 1 生物学や医学分野において 連載 第 5 回 医学データの統計解析の基本 生存時間データの解析 Fundamentals of statistical analysis in biomedical research:analysis of survival data 朝倉こう子 * * 濱﨑俊光 1 生物学や医学分野において 個体 ( 例えば 培養細胞 動物あるいは被験者 患者 ) に対して化合物や医薬品といった処理を与えることにより惹き起こされる反応は

More information

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

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

More information

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

,,,,., = (),, (1) (4) :,,,, (1),. (2),, =. (3),,. (4),,,,.. (1) (3), (4).,,., () : = , ( ) : = F 1 + F 2 + F 3 + ( ) : = i Fj j=1 2

,,,,., = (),, (1) (4) :,,,, (1),. (2),, =. (3),,. (4),,,,.. (1) (3), (4).,,., () : = , ( ) : = F 1 + F 2 + F 3 + ( ) : = i Fj j=1 2 6 2 6.1 2 2, 2 5.2 R 2, 2 (R 2, B, µ)., R 2,,., 1, 2, 3,., 1, 2, 3,,. () : = 1 + 2 + 3 + (6.1.1).,,, 1 ,,,,., = (),, (1) (4) :,,,, (1),. (2),, =. (3),,. (4),,,,.. (1) (3), (4).,,., () : = 1 + 2 + 3 +,

More information

2 1,2, , 2 ( ) (1) (2) (3) (4) Cameron and Trivedi(1998) , (1987) (1982) Agresti(2003)

2 1,2, , 2 ( ) (1) (2) (3) (4) Cameron and Trivedi(1998) , (1987) (1982) Agresti(2003) 3 1 1 1 2 1 2 1,2,3 1 0 50 3000, 2 ( ) 1 3 1 0 4 3 (1) (2) (3) (4) 1 1 1 2 3 Cameron and Trivedi(1998) 4 1974, (1987) (1982) Agresti(2003) 3 (1)-(4) AAA, AA+,A (1) (2) (3) (4) (5) (1)-(5) 1 2 5 3 5 (DI)

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

1 Stata SEM LightStone 3 2 SEM. 2., 2,. Alan C. Acock, Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press.

1 Stata SEM LightStone 3 2 SEM. 2., 2,. Alan C. Acock, Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press. 1 Stata SEM LightStone 3 2 SEM. 2., 2,. Alan C. Acock, 2013. Discovering Structural Equation Modeling Using Stata, Revised Edition, Stata Press. 2 3 2 Conservative Depress. 3.1 2. SEM. 1. x SEM. Depress.

More information

SAS Enterprise Guideによるデータ解析入門

SAS Enterprise Guideによるデータ解析入門 ........ 1 / 70.... SAS Enterprise Guide Kengo NAGASHIMA Laboratory of Biostatistics, Department of Parmaceutical Technochemistry, Josai University 2010 11 16 ........ 2 / 70 (SAS / SAS Enterprise Guide

More information

1 No.1 5 C 1 I III F 1 F 2 F 1 F 2 2 Φ 2 (t) = Φ 1 (t) Φ 1 (t t). = Φ 1(t) t = ( 1.5e 0.5t 2.4e 4t 2e 10t ) τ < 0 t > τ Φ 2 (t) < 0 lim t Φ 2 (t) = 0

1 No.1 5 C 1 I III F 1 F 2 F 1 F 2 2 Φ 2 (t) = Φ 1 (t) Φ 1 (t t). = Φ 1(t) t = ( 1.5e 0.5t 2.4e 4t 2e 10t ) τ < 0 t > τ Φ 2 (t) < 0 lim t Φ 2 (t) = 0 1 No.1 5 C 1 I III F 1 F 2 F 1 F 2 2 Φ 2 (t) = Φ 1 (t) Φ 1 (t t). = Φ 1(t) t = ( 1.5e 0.5t 2.4e 4t 2e 10t ) τ < 0 t > τ Φ 2 (t) < 0 lim t Φ 2 (t) = 0 0 < t < τ I II 0 No.2 2 C x y x y > 0 x 0 x > b a dx

More information

4.9 Hausman Test Time Fixed Effects Model vs Time Random Effects Model Two-way Fixed Effects Model

4.9 Hausman Test Time Fixed Effects Model vs Time Random Effects Model Two-way Fixed Effects Model 1 EViews 5 2007 7 11 2010 5 17 1 ( ) 3 1.1........................................... 4 1.2................................... 9 2 11 3 14 3.1 Pooled OLS.............................................. 14

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

1

1 1 100 50/60Hz 100 50/60Hz 2 3 4 Windows 4.0SP3 Windows98 4.0SP3 800600 256 1024768 SETUP.EXE 5 [ ] 6 [ OK] [ ] 7 [ OK] [ ] 8 [ OK] [ ] 9 [ ] [ ] [ ] Enter Enter Windows Alt MP-60 10 [ ] F4 [ ] [ ] [ ]

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

untitled

untitled 19 CSPOR CRC/2009.8.8-9 2009 8 8 ( ) - CSPOR CRC SEMINAR- twatanab@oncoloplan.com http://www.oncoloplan.com - Toru Watanabe MD - 2 Phase I: Dose Finding trial Phase II : Efficacy and Safety trial Phase

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

28

28 y i = Z i δ i +ε i ε i δ X y i = X Z i δ i + X ε i [ ] 1 δ ˆ i = Z i X( X X) 1 X Z i [ ] 1 σ ˆ 2 Z i X( X X) 1 X Z i Z i X( X X) 1 X y i σ ˆ 2 ˆ σ 2 = [ ] y i Z ˆ [ i δ i ] 1 y N p i Z i δ ˆ i i RSTAT

More information

こんにちは由美子です

こんにちは由美子です Prevalence (proportion) 1. 1991 23.8 2. 1960 52 85 2477 310 cross sectional study prevalence Time referent: prevalence 1985 40 45 prevalence 0.5 80 85 43 Time referent 1985 time referent Risk and Cumulative

More information

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

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

More information

DP

DP KEIO UNIVERSITY MARKET QUALITY RESEARCH PROJECT (A 21 st Century Center of Excellence Project) DP2004-13 * ** * ** Graduate School of Economics and Graduate School of Business and Commerce, Keio University

More information

(ii) (iii) z a = z a =2 z a =6 sin z z a dz. cosh z z a dz. e z dz. (, a b > 6.) (z a)(z b) 52.. (a) dz, ( a = /6.), (b) z =6 az (c) z a =2 53. f n (z

(ii) (iii) z a = z a =2 z a =6 sin z z a dz. cosh z z a dz. e z dz. (, a b > 6.) (z a)(z b) 52.. (a) dz, ( a = /6.), (b) z =6 az (c) z a =2 53. f n (z B 4 24 7 9 ( ) :,..,,.,. 4 4. f(z): D C: D a C, 2πi C f(z) dz = f(a). z a a C, ( ). (ii), a D, a U a,r D f. f(z) = A n (z a) n, z U a,r, n= A n := 2πi C f(ζ) dζ, n =,,..., (ζ a) n+, C a D. (iii) U a,r

More information

211 kotaro@math.titech.ac.jp 1 R *1 n n R n *2 R n = {(x 1,..., x n ) x 1,..., x n R}. R R 2 R 3 R n R n R n D D R n *3 ) (x 1,..., x n ) f(x 1,..., x n ) f D *4 n 2 n = 1 ( ) 1 f D R n f : D R 1.1. (x,

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

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

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

More information

Japanese Journal of Family Sociology, 29(1): (2017)

Japanese Journal of Family Sociology, 29(1): (2017) 29 1 2017.4 要 約 47 1 2 3 4 2017291: 19 33 Relation of Social Stratum to Parental Education Strategies in Small Cities in Modern China: A Case Study of Shadow Education in Cixi City, Zhejiang Province,

More information

0 = m 2p 1 p = 1/2 p y = 1 m = 1 2 d ( + 1)2 d ( + 1) 2 = d d ( + 1)2 = = 2( + 1) 2 g() 2 f() f() = [g()] 2 = g()g() f f () = [g()g()]

0 = m 2p 1 p = 1/2 p y = 1 m = 1 2 d ( + 1)2 d ( + 1) 2 = d d ( + 1)2 = = 2( + 1) 2 g() 2 f() f() = [g()] 2 = g()g() f f () = [g()g()] 8. 2 1 2 1 2 ma,y u(, y) s.t. p + p y y = m u y y p p y y m u(, y) = y p + p y y = m y ( ) 1 y = (m p ) p y = m p y p p y 2 0 m/p U U() = m p y p p y 2 2 du() d = m p y 2p p y 1 0 = m 2p 1 p = 1/2 p y

More information

k2 ( :35 ) ( k2) (GLM) web web 1 :

k2 ( :35 ) ( k2) (GLM) web   web   1 : 2012 11 01 k2 (2012-10-26 16:35 ) 1 6 2 (2012 11 01 k2) (GLM) kubo@ees.hokudai.ac.jp web http://goo.gl/wijx2 web http://goo.gl/ufq2 1 : 2 2 4 3 7 4 9 5 : 11 5.1................... 13 6 14 6.1......................

More information

untitled

untitled Data cleaning Original datan=8479 NCC/ptkgN=7958 NCC10x10E628 8139 NCC/kgPage 1-2) Covariate cleaningcovariate Page Page5-8 Kaplan-Meier method, Log-rank, Cox hazard model Overall survival Cumulative incidence

More information

z f(z) f(z) x, y, u, v, r, θ r > 0 z = x + iy, f = u + iv C γ D f(z) f(z) D f(z) f(z) z, Rm z, z 1.1 z = x + iy = re iθ = r (cos θ + i sin θ) z = x iy

z f(z) f(z) x, y, u, v, r, θ r > 0 z = x + iy, f = u + iv C γ D f(z) f(z) D f(z) f(z) z, Rm z, z 1.1 z = x + iy = re iθ = r (cos θ + i sin θ) z = x iy f f x, y, u, v, r, θ r > = x + iy, f = u + iv C γ D f f D f f, Rm,. = x + iy = re iθ = r cos θ + i sin θ = x iy = re iθ = r cos θ i sin θ x = + = Re, y = = Im i r = = = x + y θ = arg = arctan y x e i =

More information

Microsoft Word - 01マニュアル・入稿原稿p1-112.doc

Microsoft Word - 01マニュアル・入稿原稿p1-112.doc 4 54 55 56 ( ( 1994 1st stage 2nd stage 2012 57 / 58 365 46.6 120 365 40.4 120 13.0 59 60 61 62 63 64 65 66 67 68 69 70 71 72 73 74 75 76 77 78 79 4 80 81 82 83 84 85 86 87 88 89 90 91 92 93 94 95 96 97

More information

ECCS. ECCS,. ( 2. Mac Do-file Editor. Mac Do-file Editor Windows Do-file Editor Top Do-file e

ECCS. ECCS,. (  2. Mac Do-file Editor. Mac Do-file Editor Windows Do-file Editor Top Do-file e 1 1 2015 4 6 1. ECCS. ECCS,. (https://ras.ecc.u-tokyo.ac.jp/guacamole/) 2. Mac Do-file Editor. Mac Do-file Editor Windows Do-file Editor Top Do-file editor, Do View Do-file Editor Execute(do). 3. Mac System

More information

SURF 200000300104 Sendai Urban Research Forum 1 1 1 4 5 5 5 5 6 8 8 13 17 18 20 20 23 29 35 35 35 35 36 36 37 37 39 40 44 44 45 45 49 51 52 54 60 52 63 69 69 70 71 72 73 70 70 70 71 71 72 74 78 86 102

More information

総合薬学講座 生物統計の基礎

総合薬学講座 生物統計の基礎 2013 10 22 ( ) 2013 10 22 1 / 40 p.682 1. 2. 3 2 t Mann Whitney U ). 4 χ 2. 5. 6 Dunnett Tukey. 7. 8 Kaplan Meier.. U. ( ) 2013 10 22 2 / 40 1 93 ( 20 ) 230. a t b c χ 2 d 1.0 +1.0 e, b ( ) e ( ) ( ) 2013

More information

r 1 m A r/m i) t ii) m i) t B(t; m) ( B(t; m) = A 1 + r ) mt m ii) B(t; m) ( B(t; m) = A 1 + r ) mt m { ( = A 1 + r ) m } rt r m n = m r m n B

r 1 m A r/m i) t ii) m i) t B(t; m) ( B(t; m) = A 1 + r ) mt m ii) B(t; m) ( B(t; m) = A 1 + r ) mt m { ( = A 1 + r ) m } rt r m n = m r m n B 1 1.1 1 r 1 m A r/m i) t ii) m i) t Bt; m) Bt; m) = A 1 + r ) mt m ii) Bt; m) Bt; m) = A 1 + r ) mt m { = A 1 + r ) m } rt r m n = m r m n Bt; m) Aert e lim 1 + 1 n 1.1) n!1 n) e a 1, a 2, a 3,... {a n

More information

雇用と年金の接続 在職老齢年金の就業抑制効果と老齢厚生年金受給資格者の基礎年金繰上げ受給要因に関する分析 The Labour Market Behaviour of Older People: Analysing the Impact of the Reformed "Earning Test"

雇用と年金の接続 在職老齢年金の就業抑制効果と老齢厚生年金受給資格者の基礎年金繰上げ受給要因に関する分析 The Labour Market Behaviour of Older People: Analysing the Impact of the Reformed Earning Test Powered by TCPDF (www.tcpdf.org) Title 雇用と年金の接続 : 在職老齢年金の就業抑制効果と老齢厚生年金受給資格者の基礎年金繰上げ受給要因に関する分析 Sub Title The labour market behaviour of older people: analysing the impact of the reformed "Earning test"

More information

Microsoft PowerPoint - R-stat-intro_13.ppt [互換モード]

Microsoft PowerPoint - R-stat-intro_13.ppt [互換モード] R で統計解析入門 (13) 生存時間解析 後篇 本日のメニュー 1. 競合リスクに関する解析 2. 再発事象の解析 2 復習 カプランマイヤー推定量 5 人のがん患者さんに薬物療法を行い, ガンの再発 をイベントと してカプランマイヤー推定量によりイベント発生割合を計算する 何らかの理由でイベントを発生せずに観察を終了した場合は打ち切り 時間リスクイベントイベントイベント打ち切り ( 日 ) 集合無発生割合累積発生割合

More information

…X…p†[…X’³‚¥›»‡¨‡æ‡Ñ…}…‰…`…J†[…l…‰−w‘K‡Ì‡½‡ß‡Ì“ÅfiK›»…A…‰…S…−…Y…•‡ÆCV†EPR‡Ö‡Ì›žŠp

…X…p†[…X’³‚¥›»‡¨‡æ‡Ñ…}…‰…`…J†[…l…‰−w‘K‡Ì‡½‡ß‡Ì“ÅfiK›»…A…‰…S…−…Y…•‡ÆCV†EPR‡Ö‡Ì›žŠp CV PR 1, 1, 2 1 2 2009-08-31 @ PRMU/CVIM http://www.ibis.t.u-tokyo.ac.jp/ryotat/prmu09/ UT / Tokyo Tech DAL PRMU/CVIM 1 / 58 Outline 1-2 Dual Augmented Lagrangian Proximal minimization Legendre 3 4 UT

More information

活用ガイド (ソフトウェア編)

活用ガイド (ソフトウェア編) (Windows 95 ) ii iii iv NEC Corporation 1999 v P A R T 1 vi P A R T 2 vii P A R T 3 P A R T 4 viii P A R T 5 ix x P A R T 1 2 3 1 1 2 4 1 2 3 4 5 1 1 2 3 4 6 5 6 7 7 1 1 2 8 1 9 1 1 2 3 4 5 6 1 2 3 4

More information

untitled

untitled twatanab@oncoloplan.com http://www.oncoloplan.com I II - III IV Fig 3. Survival curves overall and according to response Bruzzi, P. et al. J Clin Oncol; 23:5117-5125 25 Copyright merican Society of Clinical

More information

( 28 ) ( ) ( ) 0 This note is c 2016, 2017 by Setsuo Taniguchi. It may be used for personal or classroom purposes, but not for commercial purp

( 28 ) ( ) ( ) 0 This note is c 2016, 2017 by Setsuo Taniguchi. It may be used for personal or classroom purposes, but not for commercial purp ( 28) ( ) ( 28 9 22 ) 0 This ote is c 2016, 2017 by Setsuo Taiguchi. It may be used for persoal or classroom purposes, but ot for commercial purposes. i (http://www.stat.go.jp/teacher/c2epi1.htm ) = statistics

More information

1 1.1 [ ]., D R m, f : D R n C -. f p D (df) p : (df) p : R m R n f(p + vt) f(p) : v lim. t 0 t, (df) p., R m {x 1,..., x m }, (df) p (x i ) =

1 1.1 [ ]., D R m, f : D R n C -. f p D (df) p : (df) p : R m R n f(p + vt) f(p) : v lim. t 0 t, (df) p., R m {x 1,..., x m }, (df) p (x i ) = 2004 / D : 0,.,., :,.,.,,.,,,.,.,,.. :,,,,,,,., web page.,,. C-613 e-mail tamaru math.sci.hiroshima-u.ac.jp url http://www.math.sci.hiroshima-u.ac.jp/ tamaru/index-j.html 2004 D - 1 - 1 1.1 [ ].,. 1.1.1

More information

数学概論I

数学概論I {a n } M >0 s.t. a n 5 M for n =1, 2,... lim n a n = α ε =1 N s.t. a n α < 1 for n > N. n > N a n 5 a n α + α < 1+ α. M := max{ a 1,..., a N, 1+ α } a n 5 M ( n) 1 α α 1+ α t a 1 a N+1 a N+2 a 2 1 a n

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

九州大学学術情報リポジトリ Kyushu University Institutional Repository 高齢心疾患患者における運動機能と身体的フレイル評価の意義 内藤, 紘一九州大学大学院人間環境学府 京都橘大学健康科学部 熊谷, 秋三九州大学大学院人間環境学府 九州大学基幹教育院 九州大

九州大学学術情報リポジトリ Kyushu University Institutional Repository 高齢心疾患患者における運動機能と身体的フレイル評価の意義 内藤, 紘一九州大学大学院人間環境学府 京都橘大学健康科学部 熊谷, 秋三九州大学大学院人間環境学府 九州大学基幹教育院 九州大 九州大学学術情報リポジトリ Kyushu University Institutional Repository 高齢心疾患患者における運動機能と身体的フレイル評価の意義 内藤, 紘一九州大学大学院人間環境学府 京都橘大学健康科学部 熊谷, 秋三九州大学大学院人間環境学府 九州大学基幹教育院 九州大学キャンパスライフ 健康支援センター https://doi.org/10.15017/1800856

More information

ISTC 3

ISTC 3 B- I n t e r n a t i o n a l S t a n d a r s f o r Tu b e r c u l o s i s C a r (ÏS r c ) E d is i k e - 3 ) a =1 / < ' 3 I n t e r n a t i o n a l s t a n d a r d s f o r T B C a r e e «l i s i k e 3

More information

H22 BioS t (i) treat1 treat2 data d1; input patno treat1 treat2; cards; ; run; 1 (i) treat = 1 treat =

H22 BioS t (i) treat1 treat2 data d1; input patno treat1 treat2; cards; ; run; 1 (i) treat = 1 treat = H BioS t (i) treat treat data d; input patno treat treat; cards; 3 8 7 4 8 8 5 5 6 3 ; run; (i) treat treat data d; input group patno period treat y; label group patno period ; cards; 3 8 3 7 4 8 4 8 5

More information

2009 Aida et al. Caries Res 2006;40 2000 100 % 78.7 88.0 96.6 98.8 98.8 98.8 100.0 100.0 100 75 69.4 50 75.3 74.8 73.3 73.1 73.0 72.4 71.8 71.7 51.7 40.2 69.4 68.8 73.6 25 22.3 32.8 21.9 22.9 22.1

More information

(iii) x, x N(µ, ) z = x µ () N(0, ) () 0 (y,, y 0 ) (σ = 6) *3 0 y y 2 y 3 y 4 y 5 y 6 y 7 y 8 y 9 y ( ) *4 H 0 : µ

(iii) x, x N(µ, ) z = x µ () N(0, ) () 0 (y,, y 0 ) (σ = 6) *3 0 y y 2 y 3 y 4 y 5 y 6 y 7 y 8 y 9 y ( ) *4 H 0 : µ t 2 Armitage t t t χ 2 F χ 2 F 2 µ, N(µ, ) f(x µ, ) = ( ) exp (x µ)2 2πσ 2 2 0, N(0, ) (00 α) z(α) t * 2. t (i)x N(µ, ) x µ σ N(0, ) 2 (ii)x,, x N(µ, ) x = x + +x ( N µ, σ2 ) (iii) (i),(ii) x,, x N(µ,

More information

DE-resume

DE-resume - 2011, http://c-faculty.chuo-u.ac.jp/ nishioka/ 2 11 21131 : 4 1 x y(x, y (x,y (x,,y (n, (1.1 F (x, y, y,y,,y (n =0. (1.1 n. (1.1 y(x. y(x (1.1. 1 1 1 1.1... 2 1.2... 9 1.3 1... 26 2 2 34 2.1,... 35 2.2

More information

chap9.dvi

chap9.dvi 9 AR (i) (ii) MA (iii) (iv) (v) 9.1 2 1 AR 1 9.1.1 S S y j = (α i + β i j) D ij + η j, η j = ρ S η j S + ε j (j =1,,T) (1) i=1 {ε j } i.i.d(,σ 2 ) η j (j ) D ij j i S 1 S =1 D ij =1 S>1 S =4 (1) y j =

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

NLMIXED プロシジャを用いた生存時間解析 伊藤要二アストラゼネカ株式会社臨床統計 プログラミング グループグルプ Survival analysis using PROC NLMIXED Yohji Itoh Clinical Statistics & Programming Group, A

NLMIXED プロシジャを用いた生存時間解析 伊藤要二アストラゼネカ株式会社臨床統計 プログラミング グループグルプ Survival analysis using PROC NLMIXED Yohji Itoh Clinical Statistics & Programming Group, A NLMIXED プロシジャを用いた生存時間解析 伊藤要二アストラゼネカ株式会社臨床統計 プログラミング グループグルプ Survival analysis using PROC NLMIXED Yohji Itoh Clinical Statistics & Programming Group, AstraZeneca KK 要旨 : NLMIXEDプロシジャの最尤推定の機能を用いて 指数分布 Weibull

More information

Chapter 1 Epidemiological Terminology

Chapter 1 Epidemiological Terminology Appendix Real examples of statistical analysis 検定 偶然を超えた差なら有意差という P

More information