Homework 3 - Solution

Size: px
Start display at page:

Download "Homework 3 - Solution"

Transcription

1 STAT Spring 2011 Homework 3 - Solution Olga Vitek Each part of the problems 5 points 1. KNNL (Note: you can choose either the restricted or the unrestricted version of the model. Please state clearly which model you use.) Here is the unrestricted model below, Y ijk = µ + α i + β j + (αβ) ij + ε ijk where α i is the fixed coats effect. i α i = 0, i = 1, 2, 3 β j is the random batch effect, β j N (0, σβ 2 ), j = 1, 2, 3, 4 (αβ) ij is the interaction effect, (αβ) ij N(0, σαβ 2 ) ε ijk N (0, σ 2 ), k = 1, 2, 3, 4 a = 3, b = 4,, n = 4 (a) Test interaction effect : Analysis of Variance Table Response: value Df Sum Sq Mean Sq F value Pr(>F) coatf e-05 *** batchf e-05 *** coatf:batchf Residuals Hypothesis: H 0 : σαβ 2 = 0 vs H a : σαβ 2 > 0, i = 1, 2, 3, j = 1, 2, 3, 4 - Decision rule: Reject H 0 if F > F 0.95,6,36 = Conclusion: Since F = MSAB/MSE = 0.064, we do not reject H 0 and conclude that there are no interaction effects with p = X <- read.table("ch25pr17.txt", sep="", as.is=true, header=false) colnames(x)<-c("value","coat","batch","replicate") # Factor X$coatF<-factor(X$coat) X$batchF<-factor(X$batch) #ANOVA table fit1<-aov(value~coatf*batchf, data=x) anova(fit1) qf(0.095,6,36) # F(0.95,6,36) 1-pf(0.064,6,36) # p-value 1

2 (b) Test main effects: i. Factor A (the number of coats) main effect - Hypothesis: H 0 : α i = 0 vs H a : at least one α i is not 0, i = 1, 2, 3 - Decision rule: Reject H 0 if F = MSA/MSAB > F 0.95,2,6 = Conclusion: Since F = /0.309 = , we reject H 0 and conclude that there is Factor A main effect for the number of coats with p 0 ii. Factor B (batch) main effect - Hypothesis: H 0 : σ 2 β = 0 vs H a : σ 2 β > 0 - Decision rule: Reject H 0 if F = MSB/MSAB > F 0.95,3,6 = Conclusion: Since F = /0.309 = , we reject H 0 and conclude that there is main effect for Gender with p 0 (c) Comparisons i. CI for ˆD 1 = Ȳ2 Ȳ1 : ˆD 1 = Ȳ2 Ȳ1 = = , s 2 { ˆD} = MSAB/bn c 2 i = 0.309/(4 4) (1 + 1) = , s{ ˆD 1 } = = t(1 0.05/2, 2 3) = t(0.975, 6) = Therefore, 95% Confidence interval for ˆD 1 is ± ( ) = (3.2066, ), which does not include zero. ii. CI for ˆD 2 = Ȳ3 Ȳ2 : ˆD 2 = Ȳ3 Ȳ2 = = , s 2 { ˆD} = MSAB/bn c 2 i = 0.309/(4 4) (1 + 1) = , s{ ˆD 1 } = = t(1 0.05/2, 2 3) = t(0.975, 6) = Therefore, 95% Confidence interval for ˆD 2 is ± ( ) = ( , ), which includes zero. iii. Conclusion : at 90% joint family confidence, there is a significant difference between the number of coats=6 (Factor A=1) and the number of coats=8 (Factor A=2). But, there is no significant difference between the number of coats=8 (Factor A=2) and the number of coats=10 (Factor A=3). (d) 95% confidence interval for µ 2 using Satterthwaite procedure : Y ijk = µ + α i + β j + (αβ) ij + ε ijk µ ˆ 2 = µ + α 2 = = and based on unrestricted mixed model, the standard error for the estimate for µ 2 is ˆµ 2 = j=1 k=1 y 2jk = µ + α β j j=1 (αβ) 2j j=1 j=1 k=1 ε ijk and therefore ˆµ 2 N(µ + α 2, 1 4 σ2 β σ2 αβ σ2 ) 2

3 s 2 (ˆµ 2 ) = ˆσ2 β b + ˆσ2 αβ + ˆσ2 b bn = anˆσ2 β + anˆσ2 αβ + aˆσ2 = ((a 1)nσ2 β + (a 1)σ2 ) + (σ 2 + anσβ 2 + nσ2 αβ ) abn abn = a 1 abn MSAB + 1 abn MSB 3 1 = (3 4 4) (0.309) + 1 (3 4 4) (50.951) = s(ˆµ 2 ) = and the degrees of freedom are t(1-0.05/2, 3)= , Therefore, 95% confidence interval for µ 2 is df = ( 2 48 MSAB MSB)2 ( 2 48 MSAB)2 6 + ( 1 48 MSB)2 3 = ± ( ) = ( , ) The average market value for a pearl with 8 coats is between and with 95% confidence interval. (e) 90% confidence interval for σβ 2 using MLS procedure : MLS procedure designed to estimate a linear combination of two expected mean squares for balanced studies of the form : Using the unrestricted model, L = c 1 E{MS1} + c 2 E{MS 2 }, c 1 > 0, c 2 < 0 ˆL = ˆσ β 2 = c 1 MS 1 + c 2 MS 2 = MSB MSAB an = MSB an MSAB an = = So, c 1 = 1 12, c 2 = 1 12, MS 1 = MSB, MS 2 = MSAB Using below (with formula in p. 1045), 90% confidence interval for σβ ) by R result, σβ 2 is not much different from σ2. is ( # 25.17(e) : MLS procedure alpha=0.1 dfab=6 dfb=3 c1=1/(3*4) c2=-1/(3*4) MSAB=0.309 MSA=

4 MSB= F1<-qf(1-alpha/2, dfb, Inf) F2<-qf(1-alpha/2, dfab, Inf) F3<-qf(1-alpha/2, Inf, dfb) F4<-qf(1-alpha/2, Inf, dfab) F5<-qf(1-alpha/2, dfb, dfab) F6<-qf(1-alpha/2, dfab, dfb) G1<-1.0-1/F1 G2<-1.0-1/F2 G3<-((F5-1)^2-(G1*F5)^2-(F4-1)^2)/F5 G4<-F6*(((F6-1)/F6)^2-((F3-1)/F6)^2-G2^2) HL<-sqrt((G1*c1*MSB)^2+((F4-1)*c2*MSAB)^2-(G3*c1*c2*MSB*MSAB)) HU<-sqrt(((F3-1)*c1*MSB)^2+(G2*c2*MSAB)^2-(G4*c1*c2*MSB*MSAB)) L=c1*MSB+c2*MSAB c(l-hl, L+HU) 2. KNNL (a) ML estimates of parameters : Here is the model fit by R below, Y ijk = µ 1 + α i + β j + (αβ) ij + ε ijk where α i is the fixed coats effect (the mean difference from the first level), α 1 = 0, i = 2, 3 β j is the random batch effect, β j N (0, σβ 2 ), j = 1, 2, 3, 4 (αβ) ij is the interaction effect, (αβ) ij N(0, σαβ 2 ) ε ijk N (0, σ 2 ), k = 1, 2, 3, 4 a = 3, b = 4,, n = 4 The estimates of the parameters of the fixed effects model fit in R are ˆµ 1 = , ˆα 1 = 0, ˆα 2 = , ˆα 3 = The corresponding parameters of the unrestricted model above are ˆµ = = , ˆα 1 = = , ˆα 2 = = , ˆα 3 = = (and therefore α i = 0) The estimates of variances are the same in both models ˆσ 2 β = , ˆσ2 αβ = 0, ˆσ2 = ˆσ αβ 2 = 0. If an estimated variance component is zero, this provides evidence that the true value of the parameter is on the boundary of the parameter space, and the likelihood ratio test should not be used. Linear mixed model fit by maximum likelihood Formula: value ~ 1 + coatf + (1 batchf) + (1 coatf:batchf) Data: X AIC BIC loglik deviance REMLdev Random effects: Groups Name Variance Std.Dev. 4

5 coatf:batchf (Intercept) e e-07 batchf (Intercept) e e+00 Residual e e+00 Number of obs: 46, groups: coatf:batchf, 12; batchf, 4 Fixed effects: Estimate Std. Error t value (Intercept) coatf coatf X<-X[-c(3,38),] fit2.25<- lmer(value ~ 1 + coatf + (1 batchf) + (1 coatf:batchf), data=x, REML=FALSE) summary(fit2.25) (b) additive model: no chang in the estimates after dropping the interaction term. Linear mixed model fit by maximum likelihood Formula: value ~ 1 + coatf + (1 batchf) Data: X AIC BIC loglik deviance REMLdev Random effects: Groups Name Variance Std.Dev. batchf (Intercept) Residual Number of obs: 46, groups: batchf, 4 Fixed effects: Estimate Std. Error t value (Intercept) coatf coatf fit2.25b<- lmer(value ~ 1 + coatf + (1 batchf), data=x, REML=FALSE) summary(fit2.25b) (c) Test factor B (batch) main effect by likelihood ratio test - Hypothesis: H 0 : σ 2 β = 0 vs H a : σ 2 β > 0 - Decision rule: Reject if G 2 > χ 2 (1 α,p q) = χ2 (0.95,1) = Conclusion: G 2 = , therefore reject H 0 and conclude that there is significant Factor B (batch) effect with p 0. fit2.25c.ha<- lmer(value ~ 1 + coatf + (1 batchf), data=x, REML=FALSE) fit2.25c.h0<- lm(value ~ 1 + coatf, data=x) 5

6 ## likelihood ratio test teststat <- as.numeric(2*( loglik(fit2.25c.ha) - loglik(fit2.25c.h0))) teststat pchisq(teststat, 1, lower=false) qchisq(1-0.05,1) (d) Test factor A (The number of coats) main effect by likelihood ratio test - Hypothesis: H 0 : α i = 0 vs H a : at least one α i is not 0, i = 1, 2, 3 - Decision rule: Reject if G 2 > χ 2 (1 α,p q) = χ2 (0.95,2) = Conclusion: G 2 = , therefore reject H 0 and conclude that there is significant Factor A (the number of coats) effect with p 0. fit2.25d.ha<- lmer(value ~ 1 + coatf + (1 batchf), data=x, REML=FALSE) fit2.25d.h0<- lmer(value ~ 1 + (1 batchf), data=x, REML=FALSE) ## likelihood ratio test teststat <- as.numeric(2*( loglik(fit2.25d.ha) - loglik(fit2.25d.h0))) teststat pchisq(teststat, 2, lower=false) qchisq(1-0.05,2) (e) Since distributional form of ML estimates are unknown, we used bootstrap. I got 95% confidence interval for σβ 2 is ( , ) getcoef.boot <- function(x) { select.id <- sample(1:nrow(x), nrow(x), replace=true) x.boot <- x[sort(select.id),] lmer.boot <-lmer(value ~ 1 + coatf + (1 batchf) + (1 coatf:batchf), data=x.boot, REML=FALSE) VarCorr(lmer.boot)$batch[1,1] } n <- 100 sigma2b.boot <- rep(na, n) for (i in 1:n) { cat("bootstrap iteration:", i, "\n") sigma2b.boot[i] <- getcoef.boot(x) } left <- VarCorr(fit2.25)$batch[1,1] - abs(quantile(sigma2b.boot, /2) - VarCorr(fit2.25)$batch[1,1] right <- VarCorr(fit2.25)$batch[1,1] + abs(quantile(sigma2b.boot,0.05/2) - VarCorr(fit2.25)$batch[1,1] ) c(left, right) 3. [Methods Qualifying Exam, January 2010: use paper and pencil.] A 3 x 4 factorial study was designed to investigate the effects of 3 fertilization methods (factor A) and 4 seeding rates (factor B) on the yield of sugar beets. To this end they conducted an experiment with the combinations of all levels of both factors. Each treatment combination was replicated in three plots. The two tables below show the mean yield values ȳ ij for each treatment combination, as well as some summaries. 6

7 Level of A Level of B ȳ i Source Mean Squares Fertilizer (A) Seeding rate (B) Interaction (AB) Error (a) i. State the ANOVA model, and the corresponding assumptions, that can be used to answer research questions in this experiments. The 2-way fixed effects ANOVA model is Y ijk = µ + α i + β j + (αβ) ij + ε ijk where µ is the overall mean α i is the deviation of fertilizer i from the overall mean, i α i = 0 β i is the deviation of seedling rate j from the overall mean, j β j = 0 (αβ) ij is the non-additive effect (i.e. the interaction) i (αβ) ij = j (αβ) ij = 0 ε ijk N (0, σ 2 ) is the random error ii. Test whether the change in yield due to the use of different fertilizers depends on the seedling rate. State the null and the alternative hypotheses, and the conclusions. Use the significance level of 5%. H 0 : (αβ) ij = 0 for all i and j. H a : at least one (αβ) ij 0 F = We fail to reject H 0. MS(AB) MS(Error) = = < F (1 0.05, 6, 24) = iii. Test whether their is a difference in yield between the fertilizers. State the null and the alternative hypotheses, and the conclusions. Use the significance level of 5%. H 0 : α i = 0 for all i. H a : at least one α i 0 We reject H 0. F = MS(A) MS(Error) = = < F (1 0.05, 2, 24) = (b) Test whether the use of fertilizers 1 and 2 results in a same mean yield. State the null and the alternative hypotheses, and the conclusions. Use the significance level of 5%. We test H 0 : µ 2 µ 1 = 0 against H a : µ 2 µ 1 0 The contrast estimated by ˆµ 2 ˆµ 1 = ȳ 2 ȳ 1 = =

8 and The test statistic s 2 {ˆµ 2 ˆµ 1 } = 2 MSE 12 = = Therefore we reject H = > Student 24 (1 0.05) = 1.71 (c) Suppose now that instead of focusing on 4 levels of seeding rate, the researchers were interested in variations in yield that can result from varying the seeding rate over the entire operational range. Therefore, the four seeding rates above are not the fixed levels of interest, but a random sample of all possible levels. i. Modify the model above to reflect the different experimental setting, and state the assumptions. The 2-way mixed effects ANOVA model is Y ijk = µ + α i + β j + (αβ) ij + ε ijk where µ is the overall mean α i is the deviation of fertilizer i from the overall mean, i α i = 0 β i is the deviation of seedling rate j from the overall mean, β i N (0, σ 2 β ) (αβ) ij is the joint non-additive effect (i.e. the interaction) (αβ) ij N (0, σ 2 αβ ) ε ijk N (0, σ 2 ) is the random error ii. Using the modified model, test whether the change in yield due to the use of different fertilizers depends on the seedling rate. State the null and the alternative hypotheses, and the conclusions. Use the significance level of 5%. H 0 : σ(αβ) 2 = 0. H a : σ(αβ) 2 0. Same test statistic and conclusion as in (a,ii). iii. Using the modified model, test whether their is a difference in yield between the fertilizers. State the null and the alternative hypotheses, and the conclusions. Use the significance level of 5%. Same H 0 and H a as in (a,iii). Test statistic We reject H 0. F = MS(A) MS(AB) = = > F (1 0.05, 2, 6) =

9 iv. Test whether the use of fertilizers 1 and 2 results in a same mean yield, given this new model specification. State the null and the alternative hypotheses, and the conclusions. Use the significance level of 5%. Compare with the results of (b). -Hypothesis: H 0 : L = µ 1 µ 2 = 0, H a : L 0 ˆL = Ȳ1 Ȳ2 = s(ˆl) = nσ2 αβ +σ2 nb We reject H 0 c 2 i = MSAB 12 2 = = ˆL s{ˆl} = > t (0.975,6) = [Methods Qualifying Exam, January 2005: use paper and pencil.] The school superintendent is concerned about the development of technology skills in middle school. Since there are 3 middle schools in his district, all of which go about this instruction differently, he decided to assess if there were any differences across schools. He first compiled a long list of tech skills and randomly selected 5 to be used in his study. He then randomly selected 20 students from each school and assigned each to one of the five tasks so that there were 4 students per task per school. Each student then performed the skill and a score between 0 and 100 was assigned. (a) If a two-way ANOVA is to be used for the analysis, should it be treated as a fixed effects, random effects, or mixed effects model? Explain. School should be treated as fixed effect since all must be chosen. Skill effect should be treated as random effect since skills were selected from a long list. (b) Complete the following ANOVA table and determine which effects are significant at the α =.05 level. State your conclusions, making sure to estimate all variances and describing any additional mean comparisons youd like to perform. In order to calculate the distribution of the F statistic, we consider the unrestricted model Y ijk = µ + α i + β j + (αβ) ij + ε ijk where µ is the overall mean α i is the deviation of school i from the overall mean, i = 1, 2, 3, i α i = 0 β i is the deviation of skill j from the overall mean, j = 1,, 5, β i N (0, σβ 2) (αβ) ij is the non-additive effect (i.e. the interaction), (αβ) ij N (0, σαβ 2 ) ε ijk N (0, σ 2 ) is the random error, k = 1, 2, 3, 4 a = 3, b = 5, n = 4 Source DF SS MS EMS F SSA School(fixed) a-1 = df = 220 A 2 = 110 σ 2 + bn P α 2 i /(a 1) + nσ2 MSA αβ MSAB = = 5 SSB Skill(random) b-1 = df = 96 B 4 = 24 σ2 + anσ 2 β + nσ2 MSB αβ MSAB = = 1.09 SSAB School Skill (a-1)(b-1)= df = 176 AB 8 = 22 σ 2 + nσ 2 MSAB αβ MSE = = 2.2 SSE Error ab(n-1)= dfe = = 10 σ2 9

10 i. school effect : - Hypothesis : H 0 : α 1 = α 2 = α 3 = 0 - Decision rule : Reject if F = MSA/MSAB > F (0.95,2,8) = Conclusion : F = MSA/MSAB = 110/22 = 5 > , Reject H 0 and conclude that there is school effect. ii. skill effect : - Hypothesis : H 0 : σ β = 0 - Decision rule : Reject if F = MSB/MSAB > F (0.95,4,8) = Conclusion : F = MSB/MSE = 24/22 = 1.09 < , Do not reject H 0 and conclude that there is no significant school effect. iii. interaction effect : - Hypothesis : H 0 : σ αβ = 0 - Decision rule : Reject if F = MSAB/MSE > F (0.95,8,45) = Conclusion : F = MSB/MSE = 22/10 = 2.2 > , Reject H 0 and conclude that there is significant school and skill interaction effect. To estimate those parameters we have ˆσ 2 = MSE = 10, ˆσ 2 αβ = MSAB MSE n ˆσ 2 β = MSB MSAB an = = = = 3, and (c) If the grand skill level of the middle schools (average over the three schools) is of interest, describe how one would construct a 95% confidence interval. Let µ be the overall mean. Then we can construct the 95% confidence interval based on t 45 distribution. The overall average is ˆµ = 1 60 indicating that 3 5 i=1 j=1 k=1 y ijk = µ j=1 β j i=1 j=1 5 (αβ) ij i=1 j=1 k=1 ˆµ N(µ, 1 5 σ2 β σ2 αβ σ2 ) s 2 {ˆµ} = = 0.6 Then, we can estimated accordingly and so a 95% confidence interval for µ is derived based on 4 degree of freedom. ε ijk 5. [Methods Qualifying Exam, January 2009: use paper and pencil.] The following dataset concerns an experiment where six pullets were placed into each of 12 pens. Four blocks were formed from groups of three pens based on location. Three treatments were applied. The number of eggs produced was recorded. treat block eggs 1 O O O O E E E E F F F F

11 An analysis on this dataset using lme in nlme package provides the output (Note: lme is an older implementation of mixed effects models in R, and has a slightly different model syntax. If the syntax presents challenges, you can refit the model with lmer using the data above.) > remlme1 <- lme(eggs~treat,random=~1 block,data=eggprod,method=reml) > summary(remlme1) Linear mixed-effects model fit by REML Data: eggprod AIC BIC loglik Random effects: Formula: ~1 block (Intercept) Residual StdDev: Fixed effects: eggs ~ treat Value Std.Error DF t-value p-value (Intercept) treatf treato (a) Describe the model used in the above analysis (in terms of Y = Xβ + Zγ + ε, where X includes all covariates with fixed effects and Z includes all covariates with random effects), and report the estimates of all parameters describing the model. Y = Xβ + Zγ + ε, where γ N(0, σ 2 D = I 3 σblock 2 ) and ε N(0, σ2 I) Y O Y O Y O Y O Y E γ 1 β E Y = Y E2 Y E3, X = , ˆβ = β F = Y E β O Y F Y F Y F Y F ˆσ = ,ˆσ block = β E : reference treatment, treate effect β F : the difference between treatf and treate β O : the difference between treato and treate ˆγ : random block effects vector , Z = , ˆγ = γ 2 γ 3 γ 4, (b) Give reason to use REML instead of ML to fit the model. REML produces less biased estimates for the variance components associated with the factors, especially for factors with smaller number of levels and in balanced case it coincides with ANOVA estimates. 11

12 (c) A new pen is added to the first block and treated with treatment F. Please predict the number of eggs for this pen along with an estimate of the variability in this prediction. What if this new pen is placed in a new location (i.e., a fifth block)? > fixed.effects(remlme1) (Intercept) treatf treato > random.effects(remlme1) (Intercept) Ŷ block1 = = , V ar(ŷfirstblock) = ˆσ 2 = = Ŷ block5 = = , V ar(ŷfifthblock) = ˆσ 2 + ˆσ 2 block = = (d) We also tried other methods and other models on this dataset, and got the log- likelihood function values: > remlme2 <- lme(eggs~1,random=~1 block,data=eggprod,method=reml) > loglik(remlme2) log Lik > mlme1 <- lme(eggs~treat,random=~1 block,data=eggprod,method=ml) > loglik(mlme1) log Lik > mlme2 <- lme(eggs~1,random=~1 block,data=eggprod,method=ml) > loglik(mlme2) log Lik Please determine the significance of the treatment using a likelihood ratio test (assuming χ 2 distribution). Should you improve the accuracy of this p-value? If yes, please state your approach. G 2 = 2{logL(R) logl(f )} = 2 { } = > χ 2 2 = , Therefore, there is a significant treatment effect. (e) Please propose an approach to testing whether there is a significant difference between the blocks, and state how you would like to calculate your test statistics and the p-value. - Hypothesis : H 0 : σ 2 = 0, H a : σ 2 > 0 - LR test is not appropriate because the standard derivation of the asymptotic χ 2 distribution for the likelihood ratio statistic depends on the null hypothesis lying in the interior of the parameter space and this assumption is broken when we test if a variance is zero. The null distribution in these circumstances is unknown in general and we must resort to numerical methods if we wish for precise testing. If you do use the χ 2 distribution with the usual degrees of freedom, then the test will tend to be conservative, p-values will tend to be larger. An alternative is to use bootstrap to estimate the sampling distribution and p-value. 12

Analysis of Variance and Design of Experiments-I

Analysis of Variance and Design of Experiments-I Analysis of Variance and Design of Experiments-I MODULE VIII LECTURE - 35 ANALYSIS OF VARIANCE IN RANDOM-EFFECTS MODEL AND MIXED-EFFECTS MODEL Dr. Shalabh Department of Mathematics and Statistics Indian

More information

Random and Mixed Effects Models - Part III

Random and Mixed Effects Models - Part III Random and Mixed Effects Models - Part III Statistics 149 Spring 2006 Copyright 2006 by Mark E. Irwin Quasi-F Tests When we get to more than two categorical factors, some times there are not nice F tests

More information

20. REML Estimation of Variance Components. Copyright c 2018 (Iowa State University) 20. Statistics / 36

20. REML Estimation of Variance Components. Copyright c 2018 (Iowa State University) 20. Statistics / 36 20. REML Estimation of Variance Components Copyright c 2018 (Iowa State University) 20. Statistics 510 1 / 36 Consider the General Linear Model y = Xβ + ɛ, where ɛ N(0, Σ) and Σ is an n n positive definite

More information

STAT 525 Fall Final exam. Tuesday December 14, 2010

STAT 525 Fall Final exam. Tuesday December 14, 2010 STAT 525 Fall 2010 Final exam Tuesday December 14, 2010 Time: 2 hours Name (please print): Show all your work and calculations. Partial credit will be given for work that is partially correct. Points will

More information

Outline Topic 21 - Two Factor ANOVA

Outline Topic 21 - Two Factor ANOVA Outline Topic 21 - Two Factor ANOVA Data Model Parameter Estimates - Fall 2013 Equal Sample Size One replicate per cell Unequal Sample size Topic 21 2 Overview Now have two factors (A and B) Suppose each

More information

Two-Way Analysis of Variance - no interaction

Two-Way Analysis of Variance - no interaction 1 Two-Way Analysis of Variance - no interaction Example: Tests were conducted to assess the effects of two factors, engine type, and propellant type, on propellant burn rate in fired missiles. Three engine

More information

MAT3378 ANOVA Summary

MAT3378 ANOVA Summary MAT3378 ANOVA Summary April 18, 2016 Before you do the analysis: How many factors? (one-factor/one-way ANOVA, two-factor ANOVA etc.) Fixed or Random or Mixed effects? Crossed-factors; nested factors or

More information

Topic 32: Two-Way Mixed Effects Model

Topic 32: Two-Way Mixed Effects Model Topic 3: Two-Way Mixed Effects Model Outline Two-way mixed models Three-way mixed models Data for two-way design Y is the response variable Factor A with levels i = 1 to a Factor B with levels j = 1 to

More information

Unit 7: Random Effects, Subsampling, Nested and Crossed Factor Designs

Unit 7: Random Effects, Subsampling, Nested and Crossed Factor Designs Unit 7: Random Effects, Subsampling, Nested and Crossed Factor Designs STA 643: Advanced Experimental Design Derek S. Young 1 Learning Objectives Understand how to interpret a random effect Know the different

More information

Factorial and Unbalanced Analysis of Variance

Factorial and Unbalanced Analysis of Variance Factorial and Unbalanced Analysis of Variance Nathaniel E. Helwig Assistant Professor of Psychology and Statistics University of Minnesota (Twin Cities) Updated 04-Jan-2017 Nathaniel E. Helwig (U of Minnesota)

More information

Lecture 6 Multiple Linear Regression, cont.

Lecture 6 Multiple Linear Regression, cont. Lecture 6 Multiple Linear Regression, cont. BIOST 515 January 22, 2004 BIOST 515, Lecture 6 Testing general linear hypotheses Suppose we are interested in testing linear combinations of the regression

More information

STAT 526 Spring Midterm 1. Wednesday February 2, 2011

STAT 526 Spring Midterm 1. Wednesday February 2, 2011 STAT 526 Spring 2011 Midterm 1 Wednesday February 2, 2011 Time: 2 hours Name (please print): Show all your work and calculations. Partial credit will be given for work that is partially correct. Points

More information

Random and Mixed Effects Models - Part II

Random and Mixed Effects Models - Part II Random and Mixed Effects Models - Part II Statistics 149 Spring 2006 Copyright 2006 by Mark E. Irwin Two-Factor Random Effects Model Example: Miles per Gallon (Neter, Kutner, Nachtsheim, & Wasserman, problem

More information

Allow the investigation of the effects of a number of variables on some response

Allow the investigation of the effects of a number of variables on some response Lecture 12 Topic 9: Factorial treatment structures (Part I) Factorial experiments Allow the investigation of the effects of a number of variables on some response in a highly efficient manner, and in a

More information

Statistics 512: Applied Linear Models. Topic 9

Statistics 512: Applied Linear Models. Topic 9 Topic Overview Statistics 51: Applied Linear Models Topic 9 This topic will cover Random vs. Fixed Effects Using E(MS) to obtain appropriate tests in a Random or Mixed Effects Model. Chapter 5: One-way

More information

STAT 705 Chapter 19: Two-way ANOVA

STAT 705 Chapter 19: Two-way ANOVA STAT 705 Chapter 19: Two-way ANOVA Timothy Hanson Department of Statistics, University of South Carolina Stat 705: Data Analysis II 1 / 38 Two-way ANOVA Material covered in Sections 19.2 19.4, but a bit

More information

Two-factor studies. STAT 525 Chapter 19 and 20. Professor Olga Vitek

Two-factor studies. STAT 525 Chapter 19 and 20. Professor Olga Vitek Two-factor studies STAT 525 Chapter 19 and 20 Professor Olga Vitek December 2, 2010 19 Overview Now have two factors (A and B) Suppose each factor has two levels Could analyze as one factor with 4 levels

More information

TWO OR MORE RANDOM EFFECTS. The two-way complete model for two random effects:

TWO OR MORE RANDOM EFFECTS. The two-way complete model for two random effects: TWO OR MORE RANDOM EFFECTS Example: The factors that influence the breaking strength of a synthetic fiber are being studied. Four production machines and three operators are randomly selected. A two-way

More information

3. Design Experiments and Variance Analysis

3. Design Experiments and Variance Analysis 3. Design Experiments and Variance Analysis Isabel M. Rodrigues 1 / 46 3.1. Completely randomized experiment. Experimentation allows an investigator to find out what happens to the output variables when

More information

Ch 2: Simple Linear Regression

Ch 2: Simple Linear Regression Ch 2: Simple Linear Regression 1. Simple Linear Regression Model A simple regression model with a single regressor x is y = β 0 + β 1 x + ɛ, where we assume that the error ɛ is independent random component

More information

Unbalanced Designs Mechanics. Estimate of σ 2 becomes weighted average of treatment combination sample variances.

Unbalanced Designs Mechanics. Estimate of σ 2 becomes weighted average of treatment combination sample variances. Unbalanced Designs Mechanics Estimate of σ 2 becomes weighted average of treatment combination sample variances. Types of SS Difference depends on what hypotheses are tested and how differing sample sizes

More information

Statistics For Economics & Business

Statistics For Economics & Business Statistics For Economics & Business Analysis of Variance In this chapter, you learn: Learning Objectives The basic concepts of experimental design How to use one-way analysis of variance to test for differences

More information

Ch 3: Multiple Linear Regression

Ch 3: Multiple Linear Regression Ch 3: Multiple Linear Regression 1. Multiple Linear Regression Model Multiple regression model has more than one regressor. For example, we have one response variable and two regressor variables: 1. delivery

More information

STAT 705 Chapter 19: Two-way ANOVA

STAT 705 Chapter 19: Two-way ANOVA STAT 705 Chapter 19: Two-way ANOVA Adapted from Timothy Hanson Department of Statistics, University of South Carolina Stat 705: Data Analysis II 1 / 41 Two-way ANOVA This material is covered in Sections

More information

If we have many sets of populations, we may compare the means of populations in each set with one experiment.

If we have many sets of populations, we may compare the means of populations in each set with one experiment. Statistical Methods in Business Lecture 3. Factorial Design: If we have many sets of populations we may compare the means of populations in each set with one experiment. Assume we have two factors with

More information

R Output for Linear Models using functions lm(), gls() & glm()

R Output for Linear Models using functions lm(), gls() & glm() LM 04 lm(), gls() &glm() 1 R Output for Linear Models using functions lm(), gls() & glm() Different kinds of output related to linear models can be obtained in R using function lm() {stats} in the base

More information

A brief introduction to mixed models

A brief introduction to mixed models A brief introduction to mixed models University of Gothenburg Gothenburg April 6, 2017 Outline An introduction to mixed models based on a few examples: Definition of standard mixed models. Parameter estimation.

More information

MATH 644: Regression Analysis Methods

MATH 644: Regression Analysis Methods MATH 644: Regression Analysis Methods FINAL EXAM Fall, 2012 INSTRUCTIONS TO STUDENTS: 1. This test contains SIX questions. It comprises ELEVEN printed pages. 2. Answer ALL questions for a total of 100

More information

Ch. 5 Two-way ANOVA: Fixed effect model Equal sample sizes

Ch. 5 Two-way ANOVA: Fixed effect model Equal sample sizes Ch. 5 Two-way ANOVA: Fixed effect model Equal sample sizes 1 Assumptions and models There are two factors, factors A and B, that are of interest. Factor A is studied at a levels, and factor B at b levels;

More information

Definitions of terms and examples. Experimental Design. Sampling versus experiments. For each experimental unit, measures of the variables of

Definitions of terms and examples. Experimental Design. Sampling versus experiments. For each experimental unit, measures of the variables of Experimental Design Sampling versus experiments similar to sampling and inventor design in that information about forest variables is gathered and analzed experiments presuppose intervention through appling

More information

Outline for today. Two-way analysis of variance with random effects

Outline for today. Two-way analysis of variance with random effects Outline for today Two-way analysis of variance with random effects Rasmus Waagepetersen Department of Mathematics Aalborg University Denmark Two-way ANOVA using orthogonal projections March 4, 2018 1 /

More information

Theorem A: Expectations of Sums of Squares Under the two-way ANOVA model, E(X i X) 2 = (µ i µ) 2 + n 1 n σ2

Theorem A: Expectations of Sums of Squares Under the two-way ANOVA model, E(X i X) 2 = (µ i µ) 2 + n 1 n σ2 identity Y ijk Ȳ = (Y ijk Ȳij ) + (Ȳi Ȳ ) + (Ȳ j Ȳ ) + (Ȳij Ȳi Ȳ j + Ȳ ) Theorem A: Expectations of Sums of Squares Under the two-way ANOVA model, (1) E(MSE) = E(SSE/[IJ(K 1)]) = (2) E(MSA) = E(SSA/(I

More information

Statistics 210 Part 3 Statistical Methods Hal S. Stern Department of Statistics University of California, Irvine

Statistics 210 Part 3 Statistical Methods Hal S. Stern Department of Statistics University of California, Irvine Thus far: Statistics 210 Part 3 Statistical Methods Hal S. Stern Department of Statistics University of California, Irvine sternh@uci.edu design of experiments two sample methods one factor ANOVA pairing/blocking

More information

Outline. Statistical inference for linear mixed models. One-way ANOVA in matrix-vector form

Outline. Statistical inference for linear mixed models. One-way ANOVA in matrix-vector form Outline Statistical inference for linear mixed models Rasmus Waagepetersen Department of Mathematics Aalborg University Denmark general form of linear mixed models examples of analyses using linear mixed

More information

Hierarchical Linear Models (HLM) Using R Package nlme. Interpretation. 2 = ( x 2) u 0j. e ij

Hierarchical Linear Models (HLM) Using R Package nlme. Interpretation. 2 = ( x 2) u 0j. e ij Hierarchical Linear Models (HLM) Using R Package nlme Interpretation I. The Null Model Level 1 (student level) model is mathach ij = β 0j + e ij Level 2 (school level) model is β 0j = γ 00 + u 0j Combined

More information

Chapter 8: Hypothesis Testing Lecture 9: Likelihood ratio tests

Chapter 8: Hypothesis Testing Lecture 9: Likelihood ratio tests Chapter 8: Hypothesis Testing Lecture 9: Likelihood ratio tests Throughout this chapter we consider a sample X taken from a population indexed by θ Θ R k. Instead of estimating the unknown parameter, we

More information

Factorial ANOVA. Psychology 3256

Factorial ANOVA. Psychology 3256 Factorial ANOVA Psychology 3256 Made up data.. Say you have collected data on the effects of Retention Interval 5 min 1 hr 24 hr on memory So, you do the ANOVA and conclude that RI affects memory % corr

More information

Topic 9: Factorial treatment structures. Introduction. Terminology. Example of a 2x2 factorial

Topic 9: Factorial treatment structures. Introduction. Terminology. Example of a 2x2 factorial Topic 9: Factorial treatment structures Introduction A common objective in research is to investigate the effect of each of a number of variables, or factors, on some response variable. In earlier times,

More information

Topic 17 - Single Factor Analysis of Variance. Outline. One-way ANOVA. The Data / Notation. One way ANOVA Cell means model Factor effects model

Topic 17 - Single Factor Analysis of Variance. Outline. One-way ANOVA. The Data / Notation. One way ANOVA Cell means model Factor effects model Topic 17 - Single Factor Analysis of Variance - Fall 2013 One way ANOVA Cell means model Factor effects model Outline Topic 17 2 One-way ANOVA Response variable Y is continuous Explanatory variable is

More information

Two or more categorical predictors. 2.1 Two fixed effects

Two or more categorical predictors. 2.1 Two fixed effects Two or more categorical predictors Here we extend the ANOVA methods to handle multiple categorical predictors. The statistician has to watch carefully to see whether the effects being considered are properly

More information

Two-Factor Full Factorial Design with Replications

Two-Factor Full Factorial Design with Replications Two-Factor Full Factorial Design with Replications Dr. John Mellor-Crummey Department of Computer Science Rice University johnmc@cs.rice.edu COMP 58 Lecture 17 March 005 Goals for Today Understand Two-factor

More information

ANOVA Randomized Block Design

ANOVA Randomized Block Design Biostatistics 301 ANOVA Randomized Block Design 1 ORIGIN 1 Data Structure: Let index i,j indicate the ith column (treatment class) and jth row (block). For each i,j combination, there are n replicates.

More information

Stat 579: Generalized Linear Models and Extensions

Stat 579: Generalized Linear Models and Extensions Stat 579: Generalized Linear Models and Extensions Mixed models Yan Lu March, 2018, week 8 1 / 32 Restricted Maximum Likelihood (REML) REML: uses a likelihood function calculated from the transformed set

More information

Homework 10 - Solution

Homework 10 - Solution STAT 526 - Spring 2011 Homework 10 - Solution Olga Vitek Each part of the problems 5 points 1. Faraway Ch. 4 problem 1 (page 93) : The dataset parstum contains cross-classified data on marijuana usage

More information

Unit 8: 2 k Factorial Designs, Single or Unequal Replications in Factorial Designs, and Incomplete Block Designs

Unit 8: 2 k Factorial Designs, Single or Unequal Replications in Factorial Designs, and Incomplete Block Designs Unit 8: 2 k Factorial Designs, Single or Unequal Replications in Factorial Designs, and Incomplete Block Designs STA 643: Advanced Experimental Design Derek S. Young 1 Learning Objectives Revisit your

More information

Workshop 9.3a: Randomized block designs

Workshop 9.3a: Randomized block designs -1- Workshop 93a: Randomized block designs Murray Logan November 23, 16 Table of contents 1 Randomized Block (RCB) designs 1 2 Worked Examples 12 1 Randomized Block (RCB) designs 11 RCB design Simple Randomized

More information

Lecture 4. Random Effects in Completely Randomized Design

Lecture 4. Random Effects in Completely Randomized Design Lecture 4. Random Effects in Completely Randomized Design Montgomery: 3.9, 13.1 and 13.7 1 Lecture 4 Page 1 Random Effects vs Fixed Effects Consider factor with numerous possible levels Want to draw inference

More information

SAS Commands. General Plan. Output. Construct scatterplot / interaction plot. Run full model

SAS Commands. General Plan. Output. Construct scatterplot / interaction plot. Run full model Topic 23 - Unequal Replication Data Model Outline - Fall 2013 Parameter Estimates Inference Topic 23 2 Example Page 954 Data for Two Factor ANOVA Y is the response variable Factor A has levels i = 1, 2,...,

More information

Topic 25 - One-Way Random Effects Models. Outline. Random Effects vs Fixed Effects. Data for One-way Random Effects Model. One-way Random effects

Topic 25 - One-Way Random Effects Models. Outline. Random Effects vs Fixed Effects. Data for One-way Random Effects Model. One-way Random effects Topic 5 - One-Way Random Effects Models One-way Random effects Outline Model Variance component estimation - Fall 013 Confidence intervals Topic 5 Random Effects vs Fixed Effects Consider factor with numerous

More information

STAT763: Applied Regression Analysis. Multiple linear regression. 4.4 Hypothesis testing

STAT763: Applied Regression Analysis. Multiple linear regression. 4.4 Hypothesis testing STAT763: Applied Regression Analysis Multiple linear regression 4.4 Hypothesis testing Chunsheng Ma E-mail: cma@math.wichita.edu 4.4.1 Significance of regression Null hypothesis (Test whether all β j =

More information

Lecture 10: Experiments with Random Effects

Lecture 10: Experiments with Random Effects Lecture 10: Experiments with Random Effects Montgomery, Chapter 13 1 Lecture 10 Page 1 Example 1 A textile company weaves a fabric on a large number of looms. It would like the looms to be homogeneous

More information

Factorial designs. Experiments

Factorial designs. Experiments Chapter 5: Factorial designs Petter Mostad mostad@chalmers.se Experiments Actively making changes and observing the result, to find causal relationships. Many types of experimental plans Measuring response

More information

Fractional Factorial Designs

Fractional Factorial Designs k-p Fractional Factorial Designs Fractional Factorial Designs If we have 7 factors, a 7 factorial design will require 8 experiments How much information can we obtain from fewer experiments, e.g. 7-4 =

More information

STAT 3A03 Applied Regression With SAS Fall 2017

STAT 3A03 Applied Regression With SAS Fall 2017 STAT 3A03 Applied Regression With SAS Fall 2017 Assignment 2 Solution Set Q. 1 I will add subscripts relating to the question part to the parameters and their estimates as well as the errors and residuals.

More information

Stat 217 Final Exam. Name: May 1, 2002

Stat 217 Final Exam. Name: May 1, 2002 Stat 217 Final Exam Name: May 1, 2002 Problem 1. Three brands of batteries are under study. It is suspected that the lives (in weeks) of the three brands are different. Five batteries of each brand are

More information

Lecture 15 - ANOVA cont.

Lecture 15 - ANOVA cont. Lecture 15 - ANOVA cont. Statistics 102 Colin Rundel March 18, 2013 One-way ANOVA Example - Alfalfa Example - Alfalfa (11.6.1) Researchers were interested in the effect that acid has on the growth rate

More information

Introduction and Background to Multilevel Analysis

Introduction and Background to Multilevel Analysis Introduction and Background to Multilevel Analysis Dr. J. Kyle Roberts Southern Methodist University Simmons School of Education and Human Development Department of Teaching and Learning Background and

More information

Simple Linear Regression

Simple Linear Regression Simple Linear Regression In simple linear regression we are concerned about the relationship between two variables, X and Y. There are two components to such a relationship. 1. The strength of the relationship.

More information

STAT 506: Randomized complete block designs

STAT 506: Randomized complete block designs STAT 506: Randomized complete block designs Timothy Hanson Department of Statistics, University of South Carolina STAT 506: Introduction to Experimental Design 1 / 10 Randomized complete block designs

More information

Nested 2-Way ANOVA as Linear Models - Unbalanced Example

Nested 2-Way ANOVA as Linear Models - Unbalanced Example Linear Models Nested -Way ANOVA ORIGIN As with other linear models, unbalanced data require use of the regression approach, in this case by contrast coding of independent variables using a scheme not described

More information

Example - Alfalfa (11.6.1) Lecture 14 - ANOVA cont. Alfalfa Hypotheses. Treatment Effect

Example - Alfalfa (11.6.1) Lecture 14 - ANOVA cont. Alfalfa Hypotheses. Treatment Effect (11.6.1) Lecture 14 - ANOVA cont. Sta102 / BME102 Colin Rundel March 19, 2014 Researchers were interested in the effect that acid has on the growth rate of alfalfa plants. They created three treatment

More information

Outline. Example and Model ANOVA table F tests Pairwise treatment comparisons with LSD Sample and subsample size determination

Outline. Example and Model ANOVA table F tests Pairwise treatment comparisons with LSD Sample and subsample size determination Outline 1 The traditional approach 2 The Mean Squares approach for the Completely randomized design (CRD) CRD and one-way ANOVA Variance components and the F test Inference about the intercept Sample vs.

More information

Residual Analysis for two-way ANOVA The twoway model with K replicates, including interaction,

Residual Analysis for two-way ANOVA The twoway model with K replicates, including interaction, Residual Analysis for two-way ANOVA The twoway model with K replicates, including interaction, is Y ijk = µ ij + ɛ ijk = µ + α i + β j + γ ij + ɛ ijk with i = 1,..., I, j = 1,..., J, k = 1,..., K. In carrying

More information

BIOSTATISTICAL METHODS

BIOSTATISTICAL METHODS BIOSTATISTICAL METHODS FOR TRANSLATIONAL & CLINICAL RESEARCH Cross-over Designs #: DESIGNING CLINICAL RESEARCH The subtraction of measurements from the same subject will mostly cancel or minimize effects

More information

Statistics 512: Applied Linear Models. Topic 7

Statistics 512: Applied Linear Models. Topic 7 Topic Overview This topic will cover Statistics 512: Applied Linear Models Topic 7 Two-way Analysis of Variance (ANOVA) Interactions Chapter 19: Two-way ANOVA The response variable Y is continuous. There

More information

Outline. Mixed models in R using the lme4 package Part 3: Longitudinal data. Sleep deprivation data. Simple longitudinal data

Outline. Mixed models in R using the lme4 package Part 3: Longitudinal data. Sleep deprivation data. Simple longitudinal data Outline Mixed models in R using the lme4 package Part 3: Longitudinal data Douglas Bates Longitudinal data: sleepstudy A model with random effects for intercept and slope University of Wisconsin - Madison

More information

STAT 510 Final Exam Spring 2015

STAT 510 Final Exam Spring 2015 STAT 510 Final Exam Spring 2015 Instructions: The is a closed-notes, closed-book exam No calculator or electronic device of any kind may be used Use nothing but a pen or pencil Please write your name and

More information

STAT Final Practice Problems

STAT Final Practice Problems STAT 48 -- Final Practice Problems.Out of 5 women who had uterine cancer, 0 claimed to have used estrogens. Out of 30 women without uterine cancer 5 claimed to have used estrogens. Exposure Outcome (Cancer)

More information

13. October p. 1

13. October p. 1 Lecture 8 STK3100/4100 Linear mixed models 13. October 2014 Plan for lecture: 1. The lme function in the nlme library 2. Induced correlation structure 3. Marginal models 4. Estimation - ML and REML 5.

More information

Lecture 10: Factorial Designs with Random Factors

Lecture 10: Factorial Designs with Random Factors Lecture 10: Factorial Designs with Random Factors Montgomery, Section 13.2 and 13.3 1 Lecture 10 Page 1 Factorial Experiments with Random Effects Lecture 9 has focused on fixed effects Always use MSE in

More information

" M A #M B. Standard deviation of the population (Greek lowercase letter sigma) σ 2

 M A #M B. Standard deviation of the population (Greek lowercase letter sigma) σ 2 Notation and Equations for Final Exam Symbol Definition X The variable we measure in a scientific study n The size of the sample N The size of the population M The mean of the sample µ The mean of the

More information

Mixed Model Theory, Part I

Mixed Model Theory, Part I enote 4 1 enote 4 Mixed Model Theory, Part I enote 4 INDHOLD 2 Indhold 4 Mixed Model Theory, Part I 1 4.1 Design matrix for a systematic linear model.................. 2 4.2 The mixed model.................................

More information

Coping with Additional Sources of Variation: ANCOVA and Random Effects

Coping with Additional Sources of Variation: ANCOVA and Random Effects Coping with Additional Sources of Variation: ANCOVA and Random Effects 1/49 More Noise in Experiments & Observations Your fixed coefficients are not always so fixed Continuous variation between samples

More information

STAT22200 Spring 2014 Chapter 8A

STAT22200 Spring 2014 Chapter 8A STAT22200 Spring 2014 Chapter 8A Yibi Huang May 13, 2014 81-86 Two-Way Factorial Designs Chapter 8A - 1 Problem 81 Sprouting Barley (p166 in Oehlert) Brewer s malt is produced from germinating barley,

More information

Problems. Suppose both models are fitted to the same data. Show that SS Res, A SS Res, B

Problems. Suppose both models are fitted to the same data. Show that SS Res, A SS Res, B Simple Linear Regression 35 Problems 1 Consider a set of data (x i, y i ), i =1, 2,,n, and the following two regression models: y i = β 0 + β 1 x i + ε, (i =1, 2,,n), Model A y i = γ 0 + γ 1 x i + γ 2

More information

Homework 2: Simple Linear Regression

Homework 2: Simple Linear Regression STAT 4385 Applied Regression Analysis Homework : Simple Linear Regression (Simple Linear Regression) Thirty (n = 30) College graduates who have recently entered the job market. For each student, the CGPA

More information

Two-Way Factorial Designs

Two-Way Factorial Designs 81-86 Two-Way Factorial Designs Yibi Huang 81-86 Two-Way Factorial Designs Chapter 8A - 1 Problem 81 Sprouting Barley (p166 in Oehlert) Brewer s malt is produced from germinating barley, so brewers like

More information

STAT 135 Lab 10 Two-Way ANOVA, Randomized Block Design and Friedman s Test

STAT 135 Lab 10 Two-Way ANOVA, Randomized Block Design and Friedman s Test STAT 135 Lab 10 Two-Way ANOVA, Randomized Block Design and Friedman s Test Rebecca Barter April 13, 2015 Let s now imagine a dataset for which our response variable, Y, may be influenced by two factors,

More information

Inference for Regression

Inference for Regression Inference for Regression Section 9.4 Cathy Poliak, Ph.D. cathy@math.uh.edu Office in Fleming 11c Department of Mathematics University of Houston Lecture 13b - 3339 Cathy Poliak, Ph.D. cathy@math.uh.edu

More information

2017 Financial Mathematics Orientation - Statistics

2017 Financial Mathematics Orientation - Statistics 2017 Financial Mathematics Orientation - Statistics Written by Long Wang Edited by Joshua Agterberg August 21, 2018 Contents 1 Preliminaries 5 1.1 Samples and Population............................. 5

More information

Multiple Linear Regression

Multiple Linear Regression Multiple Linear Regression Simple linear regression tries to fit a simple line between two variables Y and X. If X is linearly related to Y this explains some of the variability in Y. In most cases, there

More information

iron retention (log) high Fe2+ medium Fe2+ high Fe3+ medium Fe3+ low Fe2+ low Fe3+ 2 Two-way ANOVA

iron retention (log) high Fe2+ medium Fe2+ high Fe3+ medium Fe3+ low Fe2+ low Fe3+ 2 Two-way ANOVA iron retention (log) 0 1 2 3 high Fe2+ high Fe3+ low Fe2+ low Fe3+ medium Fe2+ medium Fe3+ 2 Two-way ANOVA In the one-way design there is only one factor. What if there are several factors? Often, we are

More information

Outline. Topic 19 - Inference. The Cell Means Model. Estimates. Inference for Means Differences in cell means Contrasts. STAT Fall 2013

Outline. Topic 19 - Inference. The Cell Means Model. Estimates. Inference for Means Differences in cell means Contrasts. STAT Fall 2013 Topic 19 - Inference - Fall 2013 Outline Inference for Means Differences in cell means Contrasts Multiplicity Topic 19 2 The Cell Means Model Expressed numerically Y ij = µ i + ε ij where µ i is the theoretical

More information

Summary of Chapter 7 (Sections ) and Chapter 8 (Section 8.1)

Summary of Chapter 7 (Sections ) and Chapter 8 (Section 8.1) Summary of Chapter 7 (Sections 7.2-7.5) and Chapter 8 (Section 8.1) Chapter 7. Tests of Statistical Hypotheses 7.2. Tests about One Mean (1) Test about One Mean Case 1: σ is known. Assume that X N(µ, σ

More information

3. (a) (8 points) There is more than one way to correctly express the null hypothesis in matrix form. One way to state the null hypothesis is

3. (a) (8 points) There is more than one way to correctly express the null hypothesis in matrix form. One way to state the null hypothesis is Stat 501 Solutions and Comments on Exam 1 Spring 005-4 0-4 1. (a) (5 points) Y ~ N, -1-4 34 (b) (5 points) X (X,X ) = (5,8) ~ N ( 11.5, 0.9375 ) 3 1 (c) (10 points, for each part) (i), (ii), and (v) are

More information

Lecture 22 Mixed Effects Models III Nested designs

Lecture 22 Mixed Effects Models III Nested designs Lecture 22 Mixed Effects Models III Nested designs 94 Introduction: Crossed Designs The two-factor designs considered so far involve every level of the first factor occurring with every level of the second

More information

Stat/F&W Ecol/Hort 572 Review Points Ané, Spring 2010

Stat/F&W Ecol/Hort 572 Review Points Ané, Spring 2010 1 Linear models Y = Xβ + ɛ with ɛ N (0, σ 2 e) or Y N (Xβ, σ 2 e) where the model matrix X contains the information on predictors and β includes all coefficients (intercept, slope(s) etc.). 1. Number of

More information

Example - Alfalfa (11.6.1) Lecture 16 - ANOVA cont. Alfalfa Hypotheses. Treatment Effect

Example - Alfalfa (11.6.1) Lecture 16 - ANOVA cont. Alfalfa Hypotheses. Treatment Effect (11.6.1) Lecture 16 - ANOVA cont. Sta102 / BME102 Colin Rundel October 28, 2015 Researchers were interested in the effect that acid has on the growth rate of alfalfa plants. They created three treatment

More information

22s:152 Applied Linear Regression. Take random samples from each of m populations.

22s:152 Applied Linear Regression. Take random samples from each of m populations. 22s:152 Applied Linear Regression Chapter 8: ANOVA NOTE: We will meet in the lab on Monday October 10. One-way ANOVA Focuses on testing for differences among group means. Take random samples from each

More information

Outline for today. Maximum likelihood estimation. Computation with multivariate normal distributions. Multivariate normal distribution

Outline for today. Maximum likelihood estimation. Computation with multivariate normal distributions. Multivariate normal distribution Outline for today Maximum likelihood estimation Rasmus Waageetersen Deartment of Mathematics Aalborg University Denmark October 30, 2007 the multivariate normal distribution linear and linear mixed models

More information

Chap The McGraw-Hill Companies, Inc. All rights reserved.

Chap The McGraw-Hill Companies, Inc. All rights reserved. 11 pter11 Chap Analysis of Variance Overview of ANOVA Multiple Comparisons Tests for Homogeneity of Variances Two-Factor ANOVA Without Replication General Linear Model Experimental Design: An Overview

More information

Figure 1: The fitted line using the shipment route-number of ampules data. STAT5044: Regression and ANOVA The Solution of Homework #2 Inyoung Kim

Figure 1: The fitted line using the shipment route-number of ampules data. STAT5044: Regression and ANOVA The Solution of Homework #2 Inyoung Kim 0.0 1.0 1.5 2.0 2.5 3.0 8 10 12 14 16 18 20 22 y x Figure 1: The fitted line using the shipment route-number of ampules data STAT5044: Regression and ANOVA The Solution of Homework #2 Inyoung Kim Problem#

More information

Chapter 12. Analysis of variance

Chapter 12. Analysis of variance Serik Sagitov, Chalmers and GU, January 9, 016 Chapter 1. Analysis of variance Chapter 11: I = samples independent samples paired samples Chapter 1: I 3 samples of equal size J one-way layout two-way layout

More information

Contents. TAMS38 - Lecture 6 Factorial design, Latin Square Design. Lecturer: Zhenxia Liu. Factorial design 3. Complete three factor design 4

Contents. TAMS38 - Lecture 6 Factorial design, Latin Square Design. Lecturer: Zhenxia Liu. Factorial design 3. Complete three factor design 4 Contents Factorial design TAMS38 - Lecture 6 Factorial design, Latin Square Design Lecturer: Zhenxia Liu Department of Mathematics - Mathematical Statistics 28 November, 2017 Complete three factor design

More information

22s:152 Applied Linear Regression. There are a couple commonly used models for a one-way ANOVA with m groups. Chapter 8: ANOVA

22s:152 Applied Linear Regression. There are a couple commonly used models for a one-way ANOVA with m groups. Chapter 8: ANOVA 22s:152 Applied Linear Regression Chapter 8: ANOVA NOTE: We will meet in the lab on Monday October 10. One-way ANOVA Focuses on testing for differences among group means. Take random samples from each

More information

Chapter 15: Analysis of Variance

Chapter 15: Analysis of Variance Chapter 5: Analysis of Variance 5. Introduction In this chapter, we introduced the analysis of variance technique, which deals with problems whose objective is to compare two or more populations of quantitative

More information

Inferences for Regression

Inferences for Regression Inferences for Regression An Example: Body Fat and Waist Size Looking at the relationship between % body fat and waist size (in inches). Here is a scatterplot of our data set: Remembering Regression In

More information

Stat 5303 (Oehlert): Balanced Incomplete Block Designs 1

Stat 5303 (Oehlert): Balanced Incomplete Block Designs 1 Stat 5303 (Oehlert): Balanced Incomplete Block Designs 1 > library(stat5303libs);library(cfcdae);library(lme4) > weardata

More information

Lecture 3: Inference in SLR

Lecture 3: Inference in SLR Lecture 3: Inference in SLR STAT 51 Spring 011 Background Reading KNNL:.1.6 3-1 Topic Overview This topic will cover: Review of hypothesis testing Inference about 1 Inference about 0 Confidence Intervals

More information

Master s Written Examination

Master s Written Examination Master s Written Examination Option: Statistics and Probability Spring 016 Full points may be obtained for correct answers to eight questions. Each numbered question which may have several parts is worth

More information