Homework 1 - Solutions. Problem 2

Size: px
Start display at page:

Download "Homework 1 - Solutions. Problem 2"

Transcription

1 Homework 1 - Solutions Problem 2 a) soma<-read.table("/users/basecamp/teaching/2101/bgsall.txt",he=t) attach(soma) soma.girls<-soma[sex==1,] names(soma.girls)=c("sex.g","wt2.g","ht2.g","wt9.g","ht9.g","lg9.g","st9.g", "WT18.g","HT18.g","LG18.g","ST18.g","Soma.g") attach(soma.girls) > library(stats) > round(cor(soma.girls[2:11]),3) WT2.g HT2.g WT9.g HT9.g LG9.g ST9.g WT18.g HT18.g LG18.g ST18.g WT2.g HT2.g WT9.g HT9.g LG9.g ST9.g WT18.g HT18.g LG18.g ST18.g > round(colmeans(soma.girls[2:11]),3) WT2.g HT2.g WT9.g HT9.g LG9.g ST9.g WT18.g HT18.g LG18.g ST18.g > t(lapply(soma.girls[,2:11],sd)) WT2.g HT2.g WT9.g HT9.g LG9.g ST9.g WT18.g HT18.g LG18.g ST18.g \begin{verbatim} soma.boys<-soma[sex==0,] names(soma.boys)=c("sex.b","wt2.b","ht2.b","wt9.b","ht9.b","lg9.b","st9.b", 1

2 "WT18.b","HT18.b","LG18.b","ST18.b","Soma.b") attach(soma.boys) fit1.g<-lm(soma.g~ht2.g+wt2.g+ht9.g+wt9.g+st9.g) summary(fit1.g) lm(formula = Soma.g ~ HT2.g + WT2.g + HT9.g + WT9.g + ST9.g) (Intercept) *** HT2.g * WT2.g HT9.g WT9.g e-08 *** ST9.g Signif. codes: 0 *** ** 0.01 * Residual standard error: on 6 degrees of freedom Multiple R-Squared: 0.211, F-statistic: on and 6 DF, p-value: 3.309e-09 postscript("soma-fig1.ps") plot(fit1.g) ˆσ = and R 2 = Confidence for any β i is constructed using the quantiles of the Student distribution t 6,0.02 = and t 6,0.97 = Therefore, CI j = [β j sd j, β j sd j ] for any 0 j. The diagnostic plots are shown in Figure 1. 2

3 Residuals vs Fitted Normal Q Q Residuals Theoretical Quantiles Scale Location Residuals vs Leverage Cook s distance Leverage Figure 1: Plots for fit1.g c) fit2.g<-lm(soma.g~ht9.g+wt9.g+st9.g) summary(fit2.g) lm(formula = Soma.g ~ HT9.g + WT9.g + ST9.g) (Intercept) ** HT9.g WT9.g e-09 *** ST9.g Signif. codes: 0 *** ** 0.01 * Residual standard error: 0.60 on 66 degrees of freedom 3

4 Residuals vs Fitted Normal Q Q Residuals Theoretical Quantiles Scale Location 32 Residuals vs Leverage Cook s distance Leverage Figure 2: Plots for fit2.g Multiple R-Squared: 0.601,Adjusted R-squared: 0.36 F-statistic: 18.7 on 3 and 66 DF, p-value: 6.61e-09 postscript("soma-fig2.ps") plot(fit2.g) postscript("soma-fig3.ps") plot(fit2.g$fitted,fit2.g$resid,pch=as.character(soma.g)) One can see that confidence intervals are slightly narrower for the second model (larger number of degrees of freedom). t 66,0.02 = and t 6,0.97 = Akaike Information Criterion favors the first model. However, notice that both model should not have an intercept (Why?). If we eliminate the intercept from both models we can immediately notice that the second model is more appropriate. fit.g<-lm(soma.g~ht2.g+wt2.g+ht9.g+wt9.g+st9.g-1)

5 fit2.g$resid fit2.g$fitted Figure 3: Residual Plot for fit2.g with residuals identified using response values. summary(fit.g) lm(formula = Soma.g ~ HT2.g + WT2.g + HT9.g + WT9.g + ST9.g - 1) HT2.g WT2.g HT9.g * WT9.g e-06 *** ST9.g * Signif. codes: 0 *** ** 0.01 * Residual standard error: on 6 degrees of freedom Multiple R-Squared: 0.981,Adjusted R-squared: F-statistic: 80.8 on and 6 DF, p-value: < 2.2e-16

6 fit3.g<-lm(soma.g~ht9.g+wt9.g+st9.g-1) summary(fit3.g) lm(formula = Soma.g ~ HT9.g + WT9.g + ST9.g - 1) HT9.g e-06 *** WT9.g e-07 *** ST9.g * Residual standard error: on 67 degrees of freedom Multiple R-Squared: ,Adjusted R-squared: F-statistic: 1318 on 3 and 67 DF, p-value: < 2.2e-16 postscript("soma-fig.ps") plot(fit3.g$fitted,fit3.g$resid,pch=as.character(soma.g)) d) fit1.b<-lm(soma.b~ht2.b+wt2.b+ht9.b+wt9.b+st9.b) summary(fit1.b) lm(formula = Soma.b ~ HT2.b + WT2.b + HT9.b + WT9.b + ST9.b)

7 fit3.g$resid fit3.g$fitted Figure : Residual Plot for fit3.g with residuals identified using response values. (Intercept) ** HT2.b WT2.b ** HT9.b WT9.b e-07 *** ST9.b ** Signif. codes: 0 *** ** 0.01 * Residual standard error: on 60 degrees of freedom Multiple R-Squared: ,Adjusted R-squared: 0.33 F-statistic: 7.6 on and 60 DF, p-value: 1.9e-0 postscript("soma-fig.ps") plot(fit1.b) fit2.b<-lm(log(soma.b)~ht2.b+wt2.b+ht9.b+wt9.b+st9.b) summary(fit2.b) 7

8 lm(formula = log(soma.b) ~ HT2.b + WT2.b + HT9.b + WT9.b + ST9.b) (Intercept) ** HT2.b WT2.b ** HT9.b WT9.b e-06 *** ST9.b ** Signif. codes: 0 *** ** 0.01 * Residual standard error: on 60 degrees of freedom Multiple R-Squared: ,Adjusted R-squared: F-statistic: on and 60 DF, p-value:.08e-0 postscript("soma-fig6.ps") plot(fit2.b) fit3.b<-lm(soma.b~ht9.b+wt9.b+st9.b) summary(fit3.b) lm(formula = Soma.b ~ HT9.b + WT9.b + ST9.b)

9 (Intercept) ** HT9.b * WT9.b e-0 *** ST9.b ** Signif. codes: 0 *** ** 0.01 * Residual standard error: 1.26 on 62 degrees of freedom Multiple R-Squared: 0.272,Adjusted R-squared: F-statistic: on 3 and 62 DF, p-value: postscript("soma-fig7.ps") plot(fit3.b) fit.b<-lm(soma.b~ht9.b+wt9.b+st9.b-1) summary(fit.b) lm(formula = Soma.b ~ HT9.b + WT9.b + ST9.b - 1) HT9.b * WT9.b ** ST9.b ** Signif. codes: 0 *** ** 0.01 * Residual standard error: on 63 degrees of freedom Multiple R-Squared: 0.8,Adjusted R-squared: 0.87 F-statistic: on 3 and 63 DF, p-value: < 2.2e-16 9

10 postscript("soma-fig8.ps") plot(fit.b) fit.b<-lm(log(soma.b)~ht9.b+wt9.b+st9.b-1) summary(fit.b) lm(formula = log(soma.b) ~ HT9.b + WT9.b + ST9.b - 1) HT9.b ** WT9.b ** ST9.b ** Signif. codes: 0 *** ** 0.01 * Residual standard error: 0.2 on 63 degrees of freedom Multiple R-Squared: 0.861,Adjusted R-squared: F-statistic: 11. on 3 and 63 DF, p-value: < 2.2e-16 postscript("soma-fig9.ps") plot(fit.b) e) fit.a<-lm(ht18~wt2) fit.b<-lm(wt9~wt2) postscript("soma-fig10.ps") 10

11 fit.a$resid fit.b$resid Figure : The added variable plot plot(fit.b$resid,fit.a$resid) The added variable plot shows no linear pattern. The lack of dependence is confirmed by the lack of statistical significance for the coefficient of WT9 in the model below. add.fit<-lm(fit.a$resid~fit.b$resid) summary(add.fit) lm(formula = fit.a$resid ~ fit.b$resid) (Intercept) 1.009e e e fit.b$resid 3.116e e

12 Residual standard error: 7.76 on 13 degrees of freedom Multiple R-Squared: ,Adjusted R-squared: F-statistic: on 1 and 13 DF, p-value: fit.c<-lm(ht18~wt2+wt9) summary(fit.c) lm(formula = HT18 ~ WT2 + WT9) (Intercept) < 2e-16 *** WT e-06 *** WT Signif. codes: 0 *** ** 0.01 * Residual standard error: 7.78 on 133 degrees of freedom Multiple R-Squared: ,Adjusted R-squared: F-statistic: on 2 and 133 DF, p-value: 1.83e-08 Problem 3 brake<-read.table("/users/basecamp/teaching/2101/stopping.txt",he=t) names(brake)=c("speed","distance") attach(brake) fit<-lm(distance~speed) summary(fit) lm(formula = Distance ~ Speed) 12

13 Residuals vs Fitted Normal Q Q Residuals Theoretical Quantiles Scale Location Residuals vs Leverage Cook s distance Leverage Figure 6: Plots for the model Distance = β 0 + β 1 Speed (Intercept) e-08 *** Speed < 2e-16 *** Signif. codes: 0 *** ** 0.01 * Residual standard error: on 60 degrees of freedom Multiple R-Squared: ,Adjusted R-squared: F-statistic: 30.6 on 1 and 60 DF, p-value: < 2.2e-16 postscript("speed-fig1.ps") plot(fit) The plots indicate that the assumptions about the noise structure are violated. b) We start looking to transform X using the method presented in class. 13

14 Speed2<-Speed*log(Speed) fit1<-lm(distance~speed2) summary(fit1) lm(formula = Distance ~ Speed2) (Intercept) ** Speed < 2e-16 *** Signif. codes: 0 *** ** 0.01 * Residual standard error: 10.8 on 60 degrees of freedom Multiple R-Squared: 0.897,Adjusted R-squared: F-statistic: 22.6 on 1 and 60 DF, p-value: < 2.2e-16 The suggested transformation is either X 2 or X 3/2. Since X 2 is used in d) we look at the second now. Speed3<-Speed^(3/2) fit2<-lm(distance~speed3-1) summary(fit2) lm(formula = Distance ~ Speed3-1) Speed <2e-16 *** Signif. codes: 0 *** ** 0.01 *

15 Residuals vs Fitted Normal Q Q Residuals Theoretical Quantiles Scale Location Residuals vs Leverage Cook s distance Leverage Figure 7: Plots for the model Distance = β 0 + β 1 Speed 3/2. Residual standard error: 10.3 on 61 degrees of freedom Multiple R-Squared: ,Adjusted R-squared: F-statistic: 172 on 1 and 61 DF, p-value: < 2.2e-16 postscript("speed-fig2.ps") plot(fit2) c) lambda<-seq(-2,2,0.11) n<-length(speed) a<-lambda for(i in 1:length(lambda)) { y.new<-((distance^lambda[i]-1)/lambda[i]) rss<-sum((lm(y.new~speed)$resid)^2) a[i]<-(-n/2)*log(rss) + (lambda[i]-1)*sum(log(distance)) } postscript("speed-fig3.ps") plot(lambda,a) 1

16 a lambda Figure 8: Plot for the Box-Cox Transformation. It suggests Distance ## Box-Cox suggest Distance.new<-sqrt(Distance) Distance.new<-sqrt(Distance) fit3<-lm(distance.new~speed-1) summary(fit3) lm(formula = Distance.new ~ Speed - 1) Speed <2e-16 *** Signif. codes: 0 *** ** 0.01 * Residual standard error: on 61 degrees of freedom Multiple R-Squared: 0.982,Adjusted R-squared:

17 Residuals vs Fitted Normal Q Q Residuals Theoretical Quantiles Scale Location Residuals vs Leverage Cook s distance Leverage Figure 9: Plots for the model Distance = β 1 Speed. F-statistic: 319 on 1 and 61 DF, p-value: < 2.2e-16 postscript("speed-fig.ps") plot(fit3) d) sq.speed<-speed^2 inv.sq.speed<-1/sq.speed fit<-lm(distance~speed+sq.speed-1,weights=inv.sq.speed) summary(fit) lm(formula = Distance ~ Speed + sq.speed - 1, weights = inv.sq.speed)

18 Residuals vs Fitted Normal Q Q Residuals Theoretical Quantiles Scale Location Residuals vs Leverage Cook s distance Leverage Figure 10: Plots for the model Distance = β 1 Speed + β 2 Speed 2. Speed e-06 *** sq.speed e-1 *** Signif. codes: 0 *** ** 0.01 * Residual standard error: 0.97 on 60 degrees of freedom Multiple R-Squared: 0.968,Adjusted R-squared: 0.91 F-statistic: 3.3 on 2 and 60 DF, p-value: < 2.2e-16 postscript("speed-fig.ps") plot(fit) Problem landrent<-read.table("/users/basecamp/teaching/2101/landrent.txt",he=t) attach(landrent) fit.full<-lm(y~x1+x2+x3+x) summary(fit.full) 18

19 lm(formula = Y ~ X1 + X2 + X3 + X) (Intercept) X < 2e-16 *** X *** X X Signif. codes: 0 *** ** 0.01 * Residual standard error: on 62 degrees of freedom Multiple R-Squared: 0.80,Adjusted R-squared: F-statistic: 81.6 on and 62 DF, p-value: < 2.2e-16 postscript("landrent-fig1.ps") plot(fit.full) #uneven variances ee<-fit.full$resid A<-model.matrix(fit.full) A[,1]<-ee pairs(a) n<-length(y) a<-lambda for(i in 1:length(lambda)) { 19

20 y.new<-((y^lambda[i]-1)/lambda[i]) rss<-sum((lm(y.new~x1+x2+x3+x)$resid)^2) a[i]<-(-n/2)*log(rss) + (lambda[i]-1)*sum(log(y)) } postscript("landrent-fig2.ps") plot(lambda,a) Y.new<-sqrt(Y) fit2<-lm(y.new~x1+x2+x3+x) summary(fit2) lm(formula = Y.new ~ X1 + X2 + X3 + X) (Intercept) e-09 *** X < 2e-16 *** X e-06 *** X X Signif. codes: 0 *** ** 0.01 * Residual standard error: on 62 degrees of freedom Multiple R-Squared: ,Adjusted R-squared:

21 F-statistic: 10. on and 62 DF, p-value: < 2.2e-16 postscript("landrent-fig3.ps") plot(fit2) ee<-fit2$resid A<-model.matrix(fit2) A[,1]<-ee pairs(a) fit3<-lm(y.new~x1+x2) summary(fit3) lm(formula = Y.new ~ X1 + X2) (Intercept) < 2e-16 *** X < 2e-16 *** X e-08 *** Signif. codes: 0 *** ** 0.01 * Residual standard error: 0.6 on 6 degrees of freedom Multiple R-Squared: 0.868,Adjusted R-squared: 0.86 F-statistic: 211. on 2 and 6 DF, p-value: < 2.2e-16 postscript("landrent-fig.ps") plot(fit3) Problem Define X, Y the original data and X, Ỹ the collapsed data (instead of replicates we consider their 21

22 average, instead of having each row repeated times in X we have only one in X. We define the matrix A such that AX = X and AY = Ỹ. library(mvtnorm) n<- 2 k<- no.replic<-100 e.k<-rep(1/k,k) A<-kronecker(diag(1,n),t(e.k)) sam.red<-matrix(0,nrow=no.replic,ncol=3) sam.unred<-matrix(0,nrow=no.replic,ncol=3) sigma.red<-c() sigma.unred<-c() beta.red<-matrix(0,nrow=no.replic,ncol=3) beta.unred<-matrix(0,nrow=no.replic,ncol=3) for(r in 1:no.replic) { #a<-matrix(rnorm(n,mean=0,sd=2),ncol=2) ; a<-cbind(rep(1,n*k),a) X1<-rep(1,n*k) X2<-rep(rnorm(n,mean=1),rep(k,n)) X3<-rep(rnorm(n, mean=0),rep(k,n)) #X<-rep(rnorm(n,mean=2),rep(k,n)) X<-cbind(X1,X2,X3) Y<-rmvnorm(1,mean=X%*%c(1,2,3),sigma=diag(1,n*k)) sam.red[r,]<-diag(solve(t(x)%*%t(a)%*%a%*%x))/k sam.unred[r,]<-diag(solve(t(x)%*%x)) sol.unred<-solve(t(x)%*%x)%*%t(x)%*%y[1,] beta.unred[r,]<-t(sol.unred[,1]) sigma.unred[r]<-sum((t(y)-x%*%t(t(beta.unred[r,])))^2)/(n*k-3) 22

23 sol.red<-solve(t(x)%*%t(a)%*%a%*%x)%*%t(x)%*%t(a)%*%a%*%y[1,] beta.red[r,]<-t( sol.red[,1]) sigma.red[r]<-sum((t(y)-x%*%t(t(beta.red[r,])))^2)/(n-3) } sd.red<-sqrt(sigma.red) sd.unred<-sqrt(sigma.unred) sqrt(var(sd.red)) sqrt(var(sd.unred))

wine 1 wine 2 wine 3 person person person person person

wine 1 wine 2 wine 3 person person person person person 1. A trendy wine bar set up an experiment to evaluate the quality of 3 different wines. Five fine connoisseurs of wine were asked to taste each of the wine and give it a rating between 0 and 10. The order

More information

STAT 5302 Applied Regression Analysis. Hawkins

STAT 5302 Applied Regression Analysis. Hawkins Homework 3 sample solution 1. MinnLand data STAT 5302 Applied Regression Analysis. Hawkins newdata

More information

PSYC 6140 November 16, 2005 ANOVA output in R

PSYC 6140 November 16, 2005 ANOVA output in R PSYC 6140 November 16, 2005 ANOVA output in R Type I, Type II and Type III Sums of Squares are displayed in ANOVA tables in a mumber of packages. The car library in R makes these available in R. This handout

More information

The R survey package used in these examples is version 3.22 and was run under R v2.7 on a PC.

The R survey package used in these examples is version 3.22 and was run under R v2.7 on a PC. CHAPTER 7 ANALYSIS EXAMPLES REPLICATION-R SURVEY PACKAGE 3.22 GENERAL NOTES ABOUT ANALYSIS EXAMPLES REPLICATION These examples are intended to provide guidance on how to use the commands/procedures for

More information

Comparing R print-outs from LM, GLM, LMM and GLMM

Comparing R print-outs from LM, GLM, LMM and GLMM 3. Inference: interpretation of results, plotting results, confidence intervals, hypothesis tests (Wald,LRT). 4. Asymptotic distribution of maximum likelihood estimators and tests. 5. Checking the adequacy

More information

To: Professor Roger Bohn & Hyeonsu Kang Subject: Big Data, Assignment April 13th. From: xxxx (anonymized) Date: 4/11/2016

To: Professor Roger Bohn & Hyeonsu Kang Subject: Big Data, Assignment April 13th. From: xxxx (anonymized) Date: 4/11/2016 To: Professor Roger Bohn & Hyeonsu Kang Subject: Big Data, Assignment April 13th. From: xxxx (anonymized) Date: 4/11/2016 Data Preparation: 1. Separate trany variable into Manual which takes value of 1

More information

Curtis Miller MATH 3080 Final Project pg. 1. The first question asks for an analysis on car data. The data was collected from the Kelly

Curtis Miller MATH 3080 Final Project pg. 1. The first question asks for an analysis on car data. The data was collected from the Kelly Curtis Miller MATH 3080 Final Project pg. 1 Curtis Miller 4/10/14 MATH 3080 Final Project Problem 1: Car Data The first question asks for an analysis on car data. The data was collected from the Kelly

More information

Gail E. Potter, Timo Smieszek, and Kerstin Sailer. April 24, 2015

Gail E. Potter, Timo Smieszek, and Kerstin Sailer. April 24, 2015 Supplementary Material to Modelling workplace contact networks: the effects of organizational structure, architecture, and reporting errors on epidemic predictions, published in Network Science Gail E.

More information

INSTITUTE AND FACULTY OF ACTUARIES CURRICULUM 2019 SPECIMEN SOLUTIONS. Subject CS1B Actuarial Statistics

INSTITUTE AND FACULTY OF ACTUARIES CURRICULUM 2019 SPECIMEN SOLUTIONS. Subject CS1B Actuarial Statistics INSTITUTE AND FACULTY OF ACTUARIES CURRICULUM 2019 SPECIMEN SOLUTIONS Subject CS1B Actuarial Statistics Question 1 (i) # Data entry before

More information

BORDEAUX WINE VINTAGE QUALITY AND THE WEATHER ECONOMETRIC ANALYSIS

BORDEAUX WINE VINTAGE QUALITY AND THE WEATHER ECONOMETRIC ANALYSIS BORDEAUX WINE VINTAGE QUALITY AND THE WEATHER ECONOMETRIC ANALYSIS WINE PRICES OVER VINTAGES DATA The data sheet contains market prices for a collection of 13 high quality Bordeaux wines (not including

More information

Missing Data Treatments

Missing Data Treatments Missing Data Treatments Lindsey Perry EDU7312: Spring 2012 Presentation Outline Types of Missing Data Listwise Deletion Pairwise Deletion Single Imputation Methods Mean Imputation Hot Deck Imputation Multiple

More information

Internet Appendix to. The Price of Street Friends: Social Networks, Informed Trading, and Shareholder Costs. Jie Cai Ralph A.

Internet Appendix to. The Price of Street Friends: Social Networks, Informed Trading, and Shareholder Costs. Jie Cai Ralph A. Internet Appendix to The Price of Street Friends: Social Networks, Informed Trading, and Shareholder Costs Jie Cai Ralph A. Walkling Ke Yang October 2014 1 A11. Controlling for s Logically Associated with

More information

Final Exam Financial Data Analysis (6 Credit points/imp Students) March 2, 2006

Final Exam Financial Data Analysis (6 Credit points/imp Students) March 2, 2006 Dr. Roland Füss Winter Term 2005/2006 Final Exam Financial Data Analysis (6 Credit points/imp Students) March 2, 2006 Note the following important information: 1. The total disposal time is 60 minutes.

More information

Appendix A. Table A.1: Logit Estimates for Elasticities

Appendix A. Table A.1: Logit Estimates for Elasticities Estimates from historical sales data Appendix A Table A.1. reports the estimates from the discrete choice model for the historical sales data. Table A.1: Logit Estimates for Elasticities Dependent Variable:

More information

Imputation of multivariate continuous data with non-ignorable missingness

Imputation of multivariate continuous data with non-ignorable missingness Imputation of multivariate continuous data with non-ignorable missingness Thais Paiva Jerry Reiter Department of Statistical Science Duke University NCRN Meeting Spring 2014 May 23, 2014 Thais Paiva, Jerry

More information

Effect of Inocucor on strawberry plants growth and production

Effect of Inocucor on strawberry plants growth and production Effect of Inocucor on strawberry plants growth and production Final report For Inocucor Technologies Inc. 20 Grove, Knowlton, Quebec, J0E 1V0 Jae Min Park, Dr. Soledad Saldías, Kristen Delaney and Dr.

More information

Business Statistics /82 Spring 2011 Booth School of Business The University of Chicago Final Exam

Business Statistics /82 Spring 2011 Booth School of Business The University of Chicago Final Exam Business Statistics 41000-81/82 Spring 2011 Booth School of Business The University of Chicago Final Exam Name You may use a calculator and two cheat sheets. You have 3 hours. I pledge my honor that I

More information

STA Module 6 The Normal Distribution

STA Module 6 The Normal Distribution STA 2023 Module 6 The Normal Distribution Learning Objectives 1. Explain what it means for a variable to be normally distributed or approximately normally distributed. 2. Explain the meaning of the parameters

More information

STA Module 6 The Normal Distribution. Learning Objectives. Examples of Normal Curves

STA Module 6 The Normal Distribution. Learning Objectives. Examples of Normal Curves STA 2023 Module 6 The Normal Distribution Learning Objectives 1. Explain what it means for a variable to be normally distributed or approximately normally distributed. 2. Explain the meaning of the parameters

More information

The multivariate piecewise linear growth model for ZHeight and zbmi can be expressed as:

The multivariate piecewise linear growth model for ZHeight and zbmi can be expressed as: Bi-directional relationships between body mass index and height from three to seven years of age: an analysis of children in the United Kingdom Millennium Cohort Study Supplementary material The multivariate

More information

Predicting Wine Quality

Predicting Wine Quality March 8, 2016 Ilker Karakasoglu Predicting Wine Quality Problem description: You have been retained as a statistical consultant for a wine co-operative, and have been asked to analyze these data. Each

More information

HW 5 SOLUTIONS Inference for Two Population Means

HW 5 SOLUTIONS Inference for Two Population Means HW 5 SOLUTIONS Inference for Two Population Means 1. The Type II Error rate, β = P{failing to reject H 0 H 0 is false}, for a hypothesis test was calculated to be β = 0.07. What is the power = P{rejecting

More information

The SAS System 09:38 Wednesday, December 2, The CANDISC Procedure

The SAS System 09:38 Wednesday, December 2, The CANDISC Procedure The SAS System 09:38 Wednesday, December 2, 2009 63 Observations 67 DF Total 66 Variables 43 DF Within Classes 65 Classes 2 DF Between Classes 1 Class Level Information Variable SPECIES Name Frequency

More information

Figure S2. Measurement locations for meteorological stations. (data made available by KMI: https://www.meteo.be).

Figure S2. Measurement locations for meteorological stations. (data made available by KMI: https://www.meteo.be). A High Resolution Spatiotemporal Model for In-Vehicle Black Carbon Exposure: Quantifying the In-Vehicle Exposure Reduction Due to the Euro 5 Particulate Matter Standard Legislation Supplementary data Spatial

More information

Problem Set #3 Key. Forecasting

Problem Set #3 Key. Forecasting Problem Set #3 Key Sonoma State University Business 581E Dr. Cuellar The data set bus581e_ps3.dta is a Stata data set containing annual sales (cases) and revenue from December 18, 2004 to April 2 2011.

More information

Analysis of Things (AoT)

Analysis of Things (AoT) Analysis of Things (AoT) Big Data & Machine Learning Applied to Brent Crude Executive Summary Data Selecting & Visualising Data We select historical, monthly, fundamental data We check for correlations

More information

Growth in early yyears: statistical and clinical insights

Growth in early yyears: statistical and clinical insights Growth in early yyears: statistical and clinical insights Tim Cole Population, Policy and Practice Programme UCL Great Ormond Street Institute of Child Health London WC1N 1EH UK Child growth Growth is

More information

Return to wine: A comparison of the hedonic, repeat sales, and hybrid approaches

Return to wine: A comparison of the hedonic, repeat sales, and hybrid approaches Return to wine: A comparison of the hedonic, repeat sales, and hybrid approaches James J. Fogarty a* and Callum Jones b a School of Agricultural and Resource Economics, The University of Western Australia,

More information

This appendix tabulates results summarized in Section IV of our paper, and also reports the results of additional tests.

This appendix tabulates results summarized in Section IV of our paper, and also reports the results of additional tests. Internet Appendix for Mutual Fund Trading Pressure: Firm-level Stock Price Impact and Timing of SEOs, by Mozaffar Khan, Leonid Kogan and George Serafeim. * This appendix tabulates results summarized in

More information

Acetic acid dissociates immediately in solution. Reaction A does not react further following the sample taken at the end of

Acetic acid dissociates immediately in solution. Reaction A does not react further following the sample taken at the end of SUPPLEMENTAL Table S1. Assumptions made during fitting of the reaction model in Dynochem. ID Assumption A1 Acetic acid dissociates immediately in solution. A2 Reaction A does not react further following

More information

Summary of Main Points

Summary of Main Points 1 Model Selection in Logistic Regression Summary of Main Points Recall that the two main objectives of regression modeling are: Estimate the effect of one or more covariates while adjusting for the possible

More information

Multiple Imputation for Missing Data in KLoSA

Multiple Imputation for Missing Data in KLoSA Multiple Imputation for Missing Data in KLoSA Juwon Song Korea University and UCLA Contents 1. Missing Data and Missing Data Mechanisms 2. Imputation 3. Missing Data and Multiple Imputation in Baseline

More information

Panel A: Treated firm matched to one control firm. t + 1 t + 2 t + 3 Total CFO Compensation 5.03% 0.84% 10.27% [0.384] [0.892] [0.

Panel A: Treated firm matched to one control firm. t + 1 t + 2 t + 3 Total CFO Compensation 5.03% 0.84% 10.27% [0.384] [0.892] [0. Online Appendix 1 Table O1: Determinants of CMO Compensation: Selection based on both number of other firms in industry that have CMOs and number of other firms in industry with MBA educated executives

More information

Decision making with incomplete information Some new developments. Rudolf Vetschera University of Vienna. Tamkang University May 15, 2017

Decision making with incomplete information Some new developments. Rudolf Vetschera University of Vienna. Tamkang University May 15, 2017 Decision making with incomplete information Some new developments Rudolf Vetschera University of Vienna Tamkang University May 15, 2017 Agenda Problem description Overview of methods Single parameter approaches

More information

Relation between Grape Wine Quality and Related Physicochemical Indexes

Relation between Grape Wine Quality and Related Physicochemical Indexes Research Journal of Applied Sciences, Engineering and Technology 5(4): 557-5577, 013 ISSN: 040-7459; e-issn: 040-7467 Maxwell Scientific Organization, 013 Submitted: October 1, 01 Accepted: December 03,

More information

Missing Data Methods (Part I): Multiple Imputation. Advanced Multivariate Statistical Methods Workshop

Missing Data Methods (Part I): Multiple Imputation. Advanced Multivariate Statistical Methods Workshop Missing Data Methods (Part I): Multiple Imputation Advanced Multivariate Statistical Methods Workshop University of Georgia: Institute for Interdisciplinary Research in Education and Human Development

More information

AJAE Appendix: Testing Household-Specific Explanations for the Inverse Productivity Relationship

AJAE Appendix: Testing Household-Specific Explanations for the Inverse Productivity Relationship AJAE Appendix: Testing Household-Specific Explanations for the Inverse Productivity Relationship Juliano Assunção Department of Economics PUC-Rio Luis H. B. Braido Graduate School of Economics Getulio

More information

From VOC to IPA: This Beer s For You!

From VOC to IPA: This Beer s For You! From VOC to IPA: This Beer s For You! Joel Smith Statistician Minitab Inc. jsmith@minitab.com 2013 Minitab, Inc. Image courtesy of amazon.com The Data Online beer reviews Evaluated overall and: Appearance

More information

Wine Rating Prediction

Wine Rating Prediction CS 229 FALL 2017 1 Wine Rating Prediction Ke Xu (kexu@), Xixi Wang(xixiwang@) Abstract In this project, we want to predict rating points of wines based on the historical reviews from experts. The wine

More information

COMMUNICATION II Moisture Determination of Cocoa Beans by Microwave Oven

COMMUNICATION II Moisture Determination of Cocoa Beans by Microwave Oven Pertanika 13(1), 67-72 (10) COMMUNICATION II Moisture Determination of Cocoa Beans by Microwave Oven ABSTRAK Analisa statistik telah dijalankan antara kaedah menggunakan ketuhar mikrogelumbang dan kaedah

More information

Internet Appendix for CEO Personal Risk-taking and Corporate Policies TABLE IA.1 Pilot CEOs and Firm Risk (Controlling for High Performance Pay)

Internet Appendix for CEO Personal Risk-taking and Corporate Policies TABLE IA.1 Pilot CEOs and Firm Risk (Controlling for High Performance Pay) TABLE IA.1 Pilot CEOs and Firm Risk (Controlling for High Performance Pay) OLS regressions with annualized standard deviation of firm-level monthly stock returns as the dependent variable. A constant is

More information

THE STATISTICAL SOMMELIER

THE STATISTICAL SOMMELIER THE STATISTICAL SOMMELIER An Introduction to Linear Regression 15.071 The Analytics Edge Bordeaux Wine Large differences in price and quality between years, although wine is produced in a similar way Meant

More information

Table 1: Number of patients by ICU hospital level and geographical locality.

Table 1: Number of patients by ICU hospital level and geographical locality. Web-based supporting materials for Evaluating the performance of Australian and New Zealand intensive care units in 2009 and 2010, by J. Kasza, J. L. Moran and P. J. Solomon Table 1: Number of patients

More information

By Rishi Sharma, Iago Mosqueira & Laurie Kell

By Rishi Sharma, Iago Mosqueira & Laurie Kell Methods employed to examine which interactions were important in the grid structure developed for ALB OM in the Indian Ocean & BFT in the Eastern Atlantic Ocean By Rishi Sharma, Iago Mosqueira & Laurie

More information

An application of cumulative prospect theory to travel time variability

An application of cumulative prospect theory to travel time variability Katrine Hjorth (DTU) Stefan Flügel, Farideh Ramjerdi (TØI) An application of cumulative prospect theory to travel time variability Sixth workshop on discrete choice models at EPFL August 19-21, 2010 Page

More information

COMPARISON OF CORE AND PEEL SAMPLING METHODS FOR DRY MATTER MEASUREMENT IN HASS AVOCADO FRUIT

COMPARISON OF CORE AND PEEL SAMPLING METHODS FOR DRY MATTER MEASUREMENT IN HASS AVOCADO FRUIT New Zealand Avocado Growers' Association Annual Research Report 2004. 4:36 46. COMPARISON OF CORE AND PEEL SAMPLING METHODS FOR DRY MATTER MEASUREMENT IN HASS AVOCADO FRUIT J. MANDEMAKER H. A. PAK T. A.

More information

Influence of Cultivar and Planting Date on Strawberry Growth and Development in the Low Desert

Influence of Cultivar and Planting Date on Strawberry Growth and Development in the Low Desert Influence of Cultivar and Planting Date on Strawberry Growth and Development in the Low Desert Michael A. Maurer and Kai Umeda Abstract A field study was designed to determine the effects of cultivar and

More information

Poisson GLM, Cox PH, & degrees of freedom

Poisson GLM, Cox PH, & degrees of freedom Poisson GLM, Cox PH, & degrees of freedom Michael C. Donohue Alzheimer s Therapeutic Research Institute Keck School of Medicine University of Southern California December 13, 2017 1 Introduction We discuss

More information

Wine-Tasting by Numbers: Using Binary Logistic Regression to Reveal the Preferences of Experts

Wine-Tasting by Numbers: Using Binary Logistic Regression to Reveal the Preferences of Experts Wine-Tasting by Numbers: Using Binary Logistic Regression to Reveal the Preferences of Experts When you need to understand situations that seem to defy data analysis, you may be able to use techniques

More information

Wooden modular wine rack plan

Wooden modular wine rack plan Project: Wooden modular wine rack Page 1 of 13 Wooden modular wine rack plan Admirers and connoisseurs of fine wines finds it very important to store their wine collection properly and to always have accessible

More information

STACKING CUPS STEM CATEGORY TOPIC OVERVIEW STEM LESSON FOCUS OBJECTIVES MATERIALS. Math. Linear Equations

STACKING CUPS STEM CATEGORY TOPIC OVERVIEW STEM LESSON FOCUS OBJECTIVES MATERIALS. Math. Linear Equations STACKING CUPS STEM CATEGORY Math TOPIC Linear Equations OVERVIEW Students will work in small groups to stack Solo cups vs. Styrofoam cups to see how many of each it takes for the two stacks to be equal.

More information

Relationships Among Wine Prices, Ratings, Advertising, and Production: Examining a Giffen Good

Relationships Among Wine Prices, Ratings, Advertising, and Production: Examining a Giffen Good Relationships Among Wine Prices, Ratings, Advertising, and Production: Examining a Giffen Good Carol Miu Massachusetts Institute of Technology Abstract It has become increasingly popular for statistics

More information

Flexible Imputation of Missing Data

Flexible Imputation of Missing Data Chapman & Hall/CRC Interdisciplinary Statistics Series Flexible Imputation of Missing Data Stef van Buuren TNO Leiden, The Netherlands University of Utrecht The Netherlands crc pness Taylor &l Francis

More information

Activity 2.3 Solubility test

Activity 2.3 Solubility test Activity 2.3 Solubility test Can you identify the unknown crystal by the amount that dissolves in water? In Demonstration 2a, students saw that more salt is left behind than sugar when both crystals are

More information

J. Best 1 A. Tepley 2

J. Best 1 A. Tepley 2 J. Best 1 2 1 Ecoinformatics Summer Institute, Clarkson University 2 Department of Geography Oregon State University Ecoinformatics Summer Institute Final Presentation Outline 1 Why are fires important?

More information

Preferred citation style

Preferred citation style Preferred citation style Axhausen, K.W. (2016) How many cars are too many? A second attempt, distinguished transport lecture at the University of Hong Kong, Hong Kong, October 2016.. How many cars are

More information

Online Appendix for. Inattention and Inertia in Household Finance: Evidence from the Danish Mortgage Market,

Online Appendix for. Inattention and Inertia in Household Finance: Evidence from the Danish Mortgage Market, Online Appendix for Inattention and Inertia in Household Finance: Evidence from the Danish Mortgage Market, Steffen Andersen, John Y. Campbell, Kasper Meisner Nielsen, and Tarun Ramadorai. 1 A. Institutional

More information

Optimization of Process Conditions for Alcoholic Wine Production from Pineapple Using RSM

Optimization of Process Conditions for Alcoholic Wine Production from Pineapple Using RSM INTERNATIONAL JOURNAL OF MULTIDISCIPLINARY SCIENCES AND ENGINEERING, VOL., NO. 3, MARCH Optimization of Process Conditions for Alcoholic Wine Production from Pineapple Using RSM Umeh, J.I., EJIKEME, P.C.N

More information

Sequential Separation of Lysozyme, Ovomucin, Ovotransferrin and Ovalbumin from Egg White

Sequential Separation of Lysozyme, Ovomucin, Ovotransferrin and Ovalbumin from Egg White AS 662 ASL R3104 2016 Sequential Separation of Lysozyme, Ovomucin, Ovotransferrin and Ovalbumin from Egg White Sandun Abeyrathne Iowa State University Hyunyong Lee Iowa State University, hdragon@iastate.edu

More information

Investment Wines. - Risk Analysis. Prepared by: Michael Shortell & Adiam Woldetensae Date: 06/09/2015

Investment Wines. - Risk Analysis. Prepared by: Michael Shortell & Adiam Woldetensae Date: 06/09/2015 Investment Wines - Risk Analysis Prepared by: Michael Shortell & Adiam Woldetensae Date: 06/09/2015 Purpose Look at investment wines & examine factors that affect wine prices over time We will identify

More information

Introduction Methods

Introduction Methods Introduction The Allium paradoxum, common name few flowered leek, is a wild garlic distributed in woodland areas largely in the East of Britain (Preston et al., 2002). In 1823 the A. paradoxum was brought

More information

> Y=degre=="deces" > table(y) Y FALSE TRUE

> Y=degre==deces > table(y) Y FALSE TRUE - PARTIE 0 - > preambule=read.table( + "http://freakonometrics.free.fr/preambule.csv",header=true,sep=";") > table(preambule$y) 0 1 2 3 4 5 6 45 133 160 101 51 8 2 > reg0=glm(y/n~1,family="binomial",weights=n,data=preambule)

More information

Managing many models. February Hadley Chief Scientist, RStudio

Managing many models. February Hadley Chief Scientist, RStudio Managing many models February 2016 Hadley Wickham @hadleywickham Chief Scientist, RStudio There are 7 key components of data science Import Visualise Communicate Tidy Transform Model Automate Understand

More information

Internet Appendix. For. Birds of a feather: Value implications of political alignment between top management and directors

Internet Appendix. For. Birds of a feather: Value implications of political alignment between top management and directors Internet Appendix For Birds of a feather: Value implications of political alignment between top management and directors Jongsub Lee *, Kwang J. Lee, and Nandu J. Nagarajan This Internet Appendix reports

More information

Online Appendix to Voluntary Disclosure and Information Asymmetry: Evidence from the 2005 Securities Offering Reform

Online Appendix to Voluntary Disclosure and Information Asymmetry: Evidence from the 2005 Securities Offering Reform Online Appendix to Voluntary Disclosure and Information Asymmetry: Evidence from the 2005 Securities Offering Reform This document contains several additional results that are untabulated but referenced

More information

February 26, The results below are generated from an R script.

February 26, The results below are generated from an R script. February 26, 2015 The results below are generated from an R script. weights = read.table("http://www.bio.ic.ac.uk/research/mjcraw/therbook/data/growth.txt", header = T) R functions: aov(y~a+b+a:b, data=mydata)

More information

Statistics & Agric.Economics Deptt., Tocklai Experimental Station, Tea Research Association, Jorhat , Assam. ABSTRACT

Statistics & Agric.Economics Deptt., Tocklai Experimental Station, Tea Research Association, Jorhat , Assam. ABSTRACT Two and a Bud 59(2):152-156, 2012 RESEARCH PAPER Global tea production and export trend with special reference to India Prasanna Kumar Bordoloi Statistics & Agric.Economics Deptt., Tocklai Experimental

More information

This is a repository copy of Poverty and Participation in Twenty-First Century Multicultural Britain.

This is a repository copy of Poverty and Participation in Twenty-First Century Multicultural Britain. This is a repository copy of Poverty and Participation in Twenty-First Century Multicultural Britain. White Rose Research Online URL for this paper: http://eprints.whiterose.ac.uk/105597/ Version: Supplemental

More information

A Comparison of Approximate Bayesian Bootstrap and Weighted Sequential Hot Deck for Multiple Imputation

A Comparison of Approximate Bayesian Bootstrap and Weighted Sequential Hot Deck for Multiple Imputation A Comparison of Approximate Bayesian Bootstrap and Weighted Sequential Hot Deck for Multiple Imputation Darryl V. Creel RTI International 1 RTI International is a trade name of Research Triangle Institute.

More information

Valuation in the Life Settlements Market

Valuation in the Life Settlements Market Valuation in the Life Settlements Market New Empirical Evidence Jiahua (Java) Xu 1 1 Institute of Insurance Economics University of St.Gallen Western Risk and Insurance Association 2018 Annual Meeting

More information

Flexible Working Arrangements, Collaboration, ICT and Innovation

Flexible Working Arrangements, Collaboration, ICT and Innovation Flexible Working Arrangements, Collaboration, ICT and Innovation A Panel Data Analysis Cristian Rotaru and Franklin Soriano Analytical Services Unit Economic Measurement Group (EMG) Workshop, Sydney 28-29

More information

How Product Category Shapes Preferences toward Global and Local Brands: A Schema Theory Perspective. Vasileios Davvetas and Adamantios Diamantopoulos

How Product Category Shapes Preferences toward Global and Local Brands: A Schema Theory Perspective. Vasileios Davvetas and Adamantios Diamantopoulos How Product Category Shapes Preferences toward Global and Local Brands: A Schema Theory Perspective Table 1: Sample descriptives across studies Vasileios Davvetas and Adamantios Diamantopoulos WEB APPENDIX

More information

Statistical Analysis of Yeast Nutrient in Hard Cider Brewing

Statistical Analysis of Yeast Nutrient in Hard Cider Brewing North Carolina Journal of Mathematics and Statistics Volume 1, Pages 35 45 (Accepted September 1, 2015, published October 1, 2015) ISSN 2380-7539 Statistical Analysis of Yeast Nutrient in Hard Cider Brewing

More information

*Corresponding Author:

*Corresponding Author: Discrimination of Civet and Non-civet Coffee by Linear Discriminant Analysis (LDA), Partial Least Squares (-DA), and Orthogonal Projection to Latent Structures (O-DA) Madelene R. Datinginoo 1, Christine

More information

Optimization of Saccharomyces cerevisiae immobilization in bacterial cellulose by adsorption- incubation method

Optimization of Saccharomyces cerevisiae immobilization in bacterial cellulose by adsorption- incubation method (009) Optimization of Saccharomyces cerevisiae immobilization in bacterial cellulose by adsorption- incubation method Nguyen, D. N., Ton, N. M. N. and * Le, V. V. M. Department of Food Technology, Ho Chi

More information

Napa Highway 29 Open Wineries

Napa Highway 29 Open Wineries 4 5 6 7 8 9 35 4 45 5 55 Sonoma State University Business 58-Business Intelligence Problem Set #6 Key Dr. Cuellar Trend Analysis-Analyzing Tasting Room Strategies 1. Graphical Analysis a. Show graphically

More information

Lesson 11: Comparing Ratios Using Ratio Tables

Lesson 11: Comparing Ratios Using Ratio Tables Student Outcomes Students solve problems by comparing different ratios using two or more ratio tables. Classwork Example 1 (10 minutes) Allow students time to complete the activity. If time permits, allow

More information

1. Title: Identification of High Yielding, Root Rot Tolerant Sweet Corn Hybrids

1. Title: Identification of High Yielding, Root Rot Tolerant Sweet Corn Hybrids Report to the Oregon Processed Vegetable Commission 2007 2008 1. Title: Identification of High Yielding, Root Rot Tolerant Sweet Corn Hybrids 2. Project Leaders: James R. Myers, Horticulture 3. Cooperators:

More information

Faculty of Science FINAL EXAMINATION MATH-523B Generalized Linear Models

Faculty of Science FINAL EXAMINATION MATH-523B Generalized Linear Models Faculty of Science FINAL EXAMINATION MATH-523B Generalized Linear Models Examiner: Professor K.J. Worsley Associate Examiner: Professor A. Vandal Date: Tuesday, April 20, 2004 Time: 14:00-17:00 hours INSTRUCTIONS:

More information

RELATIVE EFFICIENCY OF ESTIMATES BASED ON PERCENTAGES OF MISSINGNESS USING THREE IMPUTATION NUMBERS IN MULTIPLE IMPUTATION ANALYSIS ABSTRACT

RELATIVE EFFICIENCY OF ESTIMATES BASED ON PERCENTAGES OF MISSINGNESS USING THREE IMPUTATION NUMBERS IN MULTIPLE IMPUTATION ANALYSIS ABSTRACT RELATIVE EFFICIENCY OF ESTIMATES BASED ON PERCENTAGES OF MISSINGNESS USING THREE IMPUTATION NUMBERS IN MULTIPLE IMPUTATION ANALYSIS Nwakuya, M. T. (Ph.D) Department of Mathematics/Statistics University

More information

Weather Sensitive Adjustment Using the WSA Factor Method

Weather Sensitive Adjustment Using the WSA Factor Method Weather Sensitive Adjustment Using the WSA Factor Method Alternate CBLs can be requested within elrs to compensate for the temperature differences between the CBL basis days and the temperature of the

More information

Protest Campaigns and Movement Success: Desegregating the U.S. South in the Early 1960s

Protest Campaigns and Movement Success: Desegregating the U.S. South in the Early 1960s Michael Biggs and Kenneth T. Andrews Protest Campaigns and Movement Success: Desegregating the U.S. South in the Early 1960s American Sociological Review SUPPLEMENT This supplement describes the results

More information

Modulating controlled actuators AME 10, AME 20, AME 30 AME 13, AME 23, AME 33 - with EN certified safety function (spring down)

Modulating controlled actuators AME 10, AME 20, AME 30 AME 13, AME 23, AME 33 - with EN certified safety function (spring down) Modulating controlled actuators AME 10, AME 20, AME 30 AME 13, AME 23, AME 33 - with EN 14597 certified safety function (spring down) Description AME 10 AME 13 AME 20, AME 30 AME 23, AME 33 The actuators

More information

Statistics 5303 Final Exam December 20, 2010 Gary W. Oehlert NAME ID#

Statistics 5303 Final Exam December 20, 2010 Gary W. Oehlert NAME ID# Statistics 5303 Final Exam December 20, 2010 Gary W. Oehlert NAME ID# This exam is open book, open notes; you may use a calculator. Do your own work! Use the back if more space is needed. There are nine

More information

Change in the Distribution of Sale/Rental Prices: Comparison of Beijing and Tokyo

Change in the Distribution of Sale/Rental Prices: Comparison of Beijing and Tokyo Change in the Distribution of Sale/Rental Prices: Comparison of Beijing and Tokyo Yongheng Deng 1, Xiangyu Guo 2, Chihiro Shimizu 3 Abstract This paper examines the change in the distribution of sale and

More information

Emerging Local Food Systems in the Caribbean and Southern USA July 6, 2014

Emerging Local Food Systems in the Caribbean and Southern USA July 6, 2014 Consumers attitudes toward consumption of two different types of juice beverages based on country of origin (local vs. imported) Presented at Emerging Local Food Systems in the Caribbean and Southern USA

More information

Table A.1: Use of funds by frequency of ROSCA meetings in 9 research sites (Note multiple answers are allowed per respondent)

Table A.1: Use of funds by frequency of ROSCA meetings in 9 research sites (Note multiple answers are allowed per respondent) Appendix Table A.1: Use of funds by frequency of ROSCA meetings in 9 research sites (Note multiple answers are allowed per respondent) Daily Weekly Every 2 weeks Monthly Every 3 months Every 6 months Total

More information

Effects of Preharvest Sprays of Maleic Hydrazide on Sugar Beets

Effects of Preharvest Sprays of Maleic Hydrazide on Sugar Beets Effects of Preharvest Sprays of Maleic Hydrazide on Sugar Beets F. H. PETO 1 W. G. SMITH 2 AND F. R. LOW 3 A study of 20 years results from the Canadian Sugar Factories at Raymond, Alberta, (l) 4 shows

More information

Credit Supply and Monetary Policy: Identifying the Bank Balance-Sheet Channel with Loan Applications. Web Appendix

Credit Supply and Monetary Policy: Identifying the Bank Balance-Sheet Channel with Loan Applications. Web Appendix Credit Supply and Monetary Policy: Identifying the Bank Balance-Sheet Channel with Loan Applications By GABRIEL JIMÉNEZ, STEVEN ONGENA, JOSÉ-LUIS PEYDRÓ, AND JESÚS SAURINA Web Appendix APPENDIX A -- NUMBER

More information

Updated Statistical Models for the Florida APD's ibudget Algorithm

Updated Statistical Models for the Florida APD's ibudget Algorithm Updated Statistical Models for the Florida APD's ibudget Algorithm Xu-Feng Niu Ph.D Professor and Chair Department of Statistics Florida State University Tallahassee, FL 3236-433 Minjing Tao, Ph.D Assistant

More information

Lollapalooza Did Not Attend (n = 800) Attended (n = 438)

Lollapalooza Did Not Attend (n = 800) Attended (n = 438) D SDS H F 1, 16 ( ) Warm-ups (A) Which bands come to ACL Fest? Is it true that if a band plays at Lollapalooza, then it is more likely to play at Austin City Limits (ACL) that year? To be able to provide

More information

The R&D-patent relationship: An industry perspective

The R&D-patent relationship: An industry perspective Université Libre de Bruxelles (ULB) Solvay Brussels School of Economics and Management (SBS-EM) European Center for Advanced Research in Economics and Statistics (ECARES) The R&D-patent relationship: An

More information

The Sources of Risk Spillovers among REITs: Asset Similarities and Regional Proximity

The Sources of Risk Spillovers among REITs: Asset Similarities and Regional Proximity The Sources of Risk Spillovers among REITs: Asset Similarities and Regional Proximity Zeno Adams EBS Business School Roland Füss EBS Business School ZEW Mannheim Felix Schinder ZEW Mannheim Steinbeis University

More information

Table of Contents. Foundation and Preparation 2 Hearth Base Dimensions 2. Laying the Inner Hearth 3 Inner Hearth Dimensions 4

Table of Contents. Foundation and Preparation 2 Hearth Base Dimensions 2. Laying the Inner Hearth 3 Inner Hearth Dimensions 4 Table of Contents Foundation and Preparation 2 Hearth Base Dimensions 2 Laying the Inner Hearth 3 Inner Hearth Dimensions 4 Constructing the Firebox 5 Face Opening Dimensions 5 Setting the Rumford Throat

More information

Harvesting Soybean. Soybean Loss. John Nowatzki Extension Agricultural Machine Systems Specialist

Harvesting Soybean. Soybean Loss. John Nowatzki Extension Agricultural Machine Systems Specialist Harvesting Soybean John Nowatzki Extension Agricultural Machine Systems Specialist Field studies in soybean harvesting have shown that a 10 percent or higher harvest loss is not uncommon, but studies also

More information

Handling Missing Data. Ashley Parker EDU 7312

Handling Missing Data. Ashley Parker EDU 7312 Handling Missing Data Ashley Parker EDU 7312 Presentation Outline Types of Missing Data Treatments for Handling Missing Data Deletion Techniques Listwise Deletion Pairwise Deletion Single Imputation Techniques

More information

Cointegration Analysis of Commodity Prices: Much Ado about the Wrong Thing? Mindy L. Mallory and Sergio H. Lence September 17, 2010

Cointegration Analysis of Commodity Prices: Much Ado about the Wrong Thing? Mindy L. Mallory and Sergio H. Lence September 17, 2010 Cointegration Analysis of Commodity Prices: Much Ado about the Wrong Thing? Mindy L. Mallory and Sergio H. Lence September 17, 2010 Cointegration Analysis, Commodity Prices What is cointegration analysis?

More information

Regression Models for Saffron Yields in Iran

Regression Models for Saffron Yields in Iran Regression Models for Saffron ields in Iran Sanaeinejad, S.H., Hosseini, S.N 1 Faculty of Agriculture, Ferdowsi University of Mashhad, Iran sanaei_h@yahoo.co.uk, nasir_nbm@yahoo.com, Abstract: Saffron

More information

A latent class approach for estimating energy demands and efficiency in transport:

A latent class approach for estimating energy demands and efficiency in transport: Energy Policy Research Group Seminars A latent class approach for estimating energy demands and efficiency in transport: An application to Latin America and the Caribbean Manuel Llorca Oviedo Efficiency

More information