ORDERED MULTINOMIAL LOGISTIC REGRESSION ANALYSIS. Pooja Shivraj Southern Methodist University

Size: px
Start display at page:

Download "ORDERED MULTINOMIAL LOGISTIC REGRESSION ANALYSIS. Pooja Shivraj Southern Methodist University"

Transcription

1 ORDERED MULTINOMIAL LOGISTIC REGRESSION ANALYSIS Pooja Shivraj Southern Methodist University

2 KINDS OF REGRESSION ANALYSES Linear Regression Logistic Regression Dichotomous dependent variable (yes/no, died/ didn t die, at risk/not at risk, etc.) Predicts the probability of a person belonging in that category.

3 QUICK REVIEW: LOGISTIC REGRESSION Values calculated from linear regression are continuous need to be transformed on a 0-1 scale to represent probability since 0 p 1 Logistic regression probability calculated by: ^ e (B 1 x + B 0 ) p = 1 + e (B 1 x + B 0 )

4 CLASS EXAMPLE: LOGISTIC REGRESSION Probability of a person complying for a mammogram, based on whether or not they get a physician s recommendation

5 CLASS EXAMPLE: LOGISTIC REGRESSION ^ e (B 1 x + B 0 ) p = 1 + e (B 1 x + B 0 ) Probability of complying if NOT recommended by physician: (2.29(0) ) ^ e p = (2.29(0) ) 1 + e = 0.14 = 0.61 Probability of complying if recommended by physician: (2.29(1) ) ^ e p = (2.29(1) ) 1 + e

6 ORDERED MULTINOMIAL LOGISTIC REGRESSION ANALYSIS Type of logistic regression that allows more than two discrete outcomes Outcomes are ordinal: Yes, maybe, no First, second, third place Gold, silver, bronze medals Strongly agree, agree, neutral, disagree, strongly disagree

7 ASSUMPTION No perfect predictions one predictor variable value cannot solely correspond to one dependent variable value check using crosstabs.

8 ORDERED LOGISTIC REGRESSION Load libraries: library(arm) library(psych) EXAMPLE Load data: pooj<-read.csv(" stat/r/dae/ologit.csv")

9 ORDERED LOGISTIC REGRESSION Variables: EXAMPLE apply college juniors reported likelihood of applying to grad school (0 = unlikely, 1 = somewhat likely, 2 = very likely) pared indicating whether at least one parent has a graduate degree (0 = no, 1 = yes) public indicating whether the undergraduate institution is a public or private (0 = private, 1 = public) gpa college GPA

10 > str(pooj) 'data.frame': 400 obs. of 4 variables: $ apply : int $ pared : int $ public: int $ gpa : num > table(pooj$apply) > table(pooj$pared) > table(pooj$public)

11 CHECK ASSUMPTION CROSS-TABS > xtabs(~pooj$pared+pooj$apply) pooj$apply pooj$pared > xtabs(~pooj$public+pooj$apply) pooj$apply pooj$public Why is this important?

12 SINGLE PREDICTOR MODEL - GPA > library(arm) > summary(m1<-bayespolr(as.ordered(pooj$apply)~pooj$gpa)) Call: bayespolr(formula = as.ordered(pooj$apply) ~ pooj$gpa) Coefficients: Value Std. Error t value pooj$gpa Intercepts: Value Std. Error t value Residual Deviance: AIC:

13 CUMULATIVE DISTRIBUTION FUNCTION

14 LABELING COEFFICIENTS Coefficients: Value Std. Error t value pooj$gpa Intercepts: Value Std. Error t value Coefficient of the model coef<m1$coef Intercepts of the model intercept <- m1$zeta Let us look at the likelihood of students with an average GPA applying to graduate school. > x<-mean(pooj$gpa) [1]

15 TRANSFORMING OUTCOMES TO PROBABILITIES prob<-function(input){exp(input)/ (1+exp(input))} (p0<-prob(intercept[1]-coef*x)) (p1<-prob(intercept[2]-coef*x)-p0) (p2<-1-(p0+p1))

16 WHY NOT USE LINEAR REGRESSION? > summary(linreg<-lm(pooj$apply~pooj$gpa)) Call: lm(formula = pooj$apply ~ pooj$gpa) Residuals: Min 1Q Median 3Q Max Coefficients: Estimate Std. Error t value Pr(> t ) (Intercept) pooj$gpa ** --- Signif. codes: 0 *** ** 0.01 * Residual standard error: on 398 degrees of freedom Multiple R-squared: , Adjusted R-squared: F-statistic: on 1 and 398 DF, p-value:

17 AND OUR ASSUMPTIONS AREN T MET

18 LINEAR REGRESSION VERSUS ORDERED LOGISTIC REGRESSION The decision between linear regression and ordered multinomial regression is not always black and white. When you have a large number of categories that can be considered equally spaced simple linear regression is an optional alternative (Gelman & Hill, 2007). Moral of story: Always start by checking the assumptions of the model.

19 USING MULTIPLE PREDICTORS summary(m2 <- bayespolr(as.ordered(apply)~gpa + pared + public,pooj)) Call: bayespolr(formula = as.ordered(apply) ~ gpa + pared + public, pooj) Coefficients: Value Std. Error t value gpa pared public Intercepts: Value Std. Error t value Residual Deviance: AIC:

20 TRANSFORMING OUTCOMES TO PROBABILITIES (coef<- m2$coef) gpa pared public (intercept<-m2$zeta) (x1<-cbind(0:4, 0,.14)) [,1] [,2] [,3] [1,] [2,] [3,] [4,] [5,] (x2<-cbind(0:4, 1,.14)) [,1] [,2] [,3] [1,] [2,] [3,] [4,] [5,]

21 TRANSFORMING OUTCOMES TO PROBABILITIES prob<-function(var){exp(var)/(1+exp(var))} > (p1<-prob(intercept[1]-x1 %*% coef)) [,1] [1,] [2,] [3,] [4,] [5,] > (p2<-prob(intercept[2]-x1 %*% coef)-p1) [,1] [1,] [2,] [3,] [4,] [5,] > (p3<-1-(p1+p2)) [,1] [1,] [2,] [3,] [4,] [5,]

22 TRANSFORMING OUTCOMES TO PROBABILITIES > (p4<-prob(intercept[1]-x2 %*% coef)) [,1] [1,] [2,] [3,] [4,] [5,] > (p5<-prob(intercept[2]-x2 %*% coef)-p1) [,1] [1,] [2,] [3,] [4,] [5,] > (p6<-1-(p4+p5)) [,1] [1,] [2,] [3,] [4,] [5,]

23 PLOTTING THE RESULTS Undergrad.GPA <-0:4 plot(undergrad.gpa, p1, type="l", col=1, ylim=c(0,1)) lines(0:4, p2, col=2) lines(0:4, p3, col=3) lines(0:4, p4, col=1, lty = 2) lines(0:4, p5, col=2, lty = 2) lines(0:4, p6, col=3, lty = 2) legend(1.5, 1, legend=c("p(unlikely)", "P(somewhat likely)", "P(very likely)", "Line Type when Pared = 0", "Line Type when Pared = 1"), col=c(1:3,1,1), lty=c(1,1,1,1,2))

24 PRACTICE Read in the following table (Quinn, n.d.): practice <- read.table(" nes96r.dat", header=true) Task: Run a regression using the ordered multinomial logistic model to predict the variation in the dependent variable ClinLR using the independent variables PID and educ. ClinLR = Ordinal variable from 1-7 indicating ones view of Bill Clinton s political leanings, where 1 = extremely liberal, 2 = liberal, 3 = slightly liberal, 4 = moderate, 5= slightly conservative, 6 = conservative, 6 = extremely conservative. PID = Ordinal variable from 0-6 indicating ones own political identification, where 0 = Strong Democrat and 6 = Strong Republican educ = Ordinal variable from 1-7 indicating ones own level of education, where 1 = 8 grades or less and no diploma, 2 = 9-11 grades, no further schooling, 3 = High school diploma or equivalency test, 4 = More than 12 years of schooling, no higher degree, 5 = Junior or community college level degree (AA degrees), 6 = BA level degrees; 17+ years, no postgraduate degree, 7 = Advanced degree

25 REFERENCES Gelman, A. & Hill, J. (2007). Data analysis using regression and multilevel/hierarchical models. New York: Cambridge University Press. Quinn, K. (n.d.). Retrieved from data/nes96r.dat UCLA: Academic Technology Services. (n.d.). Retrieved from

Ordinal Multinomial Logistic Regression. Thom M. Suhy Southern Methodist University May14th, 2013

Ordinal Multinomial Logistic Regression. Thom M. Suhy Southern Methodist University May14th, 2013 Ordinal Multinomial Logistic Thom M. Suhy Southern Methodist University May14th, 2013 GLM Generalized Linear Model (GLM) Framework for statistical analysis (Gelman and Hill, 2007, p. 135) Linear Continuous

More information

Dummy Variables. 1. Example: Factors Affecting Monthly Earnings

Dummy Variables. 1. Example: Factors Affecting Monthly Earnings Dummy Variables A dummy variable or binary variable is a variable that takes on a value of 0 or 1 as an indicator that the observation has some kind of characteristic. Common examples: Sex (female): FEMALE=1

More information

Logistic Regression. Logistic Regression Theory

Logistic Regression. Logistic Regression Theory Logistic Regression Dr. J. Kyle Roberts Southern Methodist University Simmons School of Education and Human Development Department of Teaching and Learning Logistic Regression The linear probability model.

More information

Non-linearities in Simple Regression

Non-linearities in Simple Regression Non-linearities in Simple Regression 1. Eample: Monthly Earnings and Years of Education In this tutorial, we will focus on an eample that eplores the relationship between total monthly earnings and years

More information

Case Study: Applying Generalized Linear Models

Case Study: Applying Generalized Linear Models Case Study: Applying Generalized Linear Models Dr. Kempthorne May 12, 2016 Contents 1 Generalized Linear Models of Semi-Quantal Biological Assay Data 2 1.1 Coal miners Pneumoconiosis Data.................

More information

Multiple Regression and Logistic Regression II. Dajiang 525 Apr

Multiple Regression and Logistic Regression II. Dajiang 525 Apr Multiple Regression and Logistic Regression II Dajiang Liu @PHS 525 Apr-19-2016 Materials from Last Time Multiple regression model: Include multiple predictors in the model = + + + + How to interpret the

More information

Categorical Outcomes. Statistical Modelling in Stata: Categorical Outcomes. R by C Table: Example. Nominal Outcomes. Mark Lunt.

Categorical Outcomes. Statistical Modelling in Stata: Categorical Outcomes. R by C Table: Example. Nominal Outcomes. Mark Lunt. Categorical Outcomes Statistical Modelling in Stata: Categorical Outcomes Mark Lunt Arthritis Research UK Epidemiology Unit University of Manchester Nominal Ordinal 28/11/2017 R by C Table: Example Categorical,

More information

Let us assume that we are measuring the yield of a crop plant on 5 different plots at 4 different observation times.

Let us assume that we are measuring the yield of a crop plant on 5 different plots at 4 different observation times. Mixed-effects models An introduction by Christoph Scherber Up to now, we have been dealing with linear models of the form where ß0 and ß1 are parameters of fixed value. Example: Let us assume that we are

More information

Regression and Simulation

Regression and Simulation Regression and Simulation This is an introductory R session, so it may go slowly if you have never used R before. Do not be discouraged. A great way to learn a new language like this is to plunge right

More information

CREDIT RISK MODELING IN R. Logistic regression: introduction

CREDIT RISK MODELING IN R. Logistic regression: introduction CREDIT RISK MODELING IN R Logistic regression: introduction Final data structure > str(training_set) 'data.frame': 19394 obs. of 8 variables: $ loan_status : Factor w/ 2 levels "0","1": 1 1 1 1 1 1 1 1

More information

Generalized Linear Models

Generalized Linear Models Generalized Linear Models Scott Creel Wednesday, September 10, 2014 This exercise extends the prior material on using the lm() function to fit an OLS regression and test hypotheses about effects on a parameter.

More information

Addiction - Multinomial Model

Addiction - Multinomial Model Addiction - Multinomial Model February 8, 2012 First the addiction data are loaded and attached. > library(catdata) > data(addiction) > attach(addiction) For the multinomial logit model the function multinom

More information

Study 2: data analysis. Example analysis using R

Study 2: data analysis. Example analysis using R Study 2: data analysis Example analysis using R Steps for data analysis Install software on your computer or locate computer with software (e.g., R, systat, SPSS) Prepare data for analysis Subjects (rows)

More information

############################ ### toxo.r ### ############################

############################ ### toxo.r ### ############################ ############################ ### toxo.r ### ############################ toxo < read.table(file="n:\\courses\\stat8620\\fall 08\\toxo.dat",header=T) #toxo < read.table(file="c:\\documents and Settings\\dhall\\My

More information

What America Is Thinking On Energy Issues February 2016

What America Is Thinking On Energy Issues February 2016 What America Is Thinking On Energy Issues February 2016 South Carolina Presented by: Harris Poll Interviewing: January 22-31, 2016 Respondents: 600 Registered Voters Method: Telephone Weighting: Results

More information

What America Is Thinking About Energy Issues February 2016 Presented by: Harris Poll

What America Is Thinking About Energy Issues February 2016 Presented by: Harris Poll What America Is Thinking About Energy Issues February 2016 Virginia Presented by: Harris Poll Interviewing: January 22 February 1, 2016 Respondents: 630 Registered Voters Method: Telephone Weighting: Results

More information

6 Multiple Regression

6 Multiple Regression More than one X variable. 6 Multiple Regression Why? Might be interested in more than one marginal effect Omitted Variable Bias (OVB) 6.1 and 6.2 House prices and OVB Should I build a fireplace? The following

More information

boxcox() returns the values of α and their loglikelihoods,

boxcox() returns the values of α and their loglikelihoods, Solutions to Selected Computer Lab Problems and Exercises in Chapter 11 of Statistics and Data Analysis for Financial Engineering, 2nd ed. by David Ruppert and David S. Matteson c 2016 David Ruppert and

More information

Getting Started in Logit and Ordered Logit Regression (ver. 3.1 beta)

Getting Started in Logit and Ordered Logit Regression (ver. 3.1 beta) Getting Started in Logit and Ordered Logit Regression (ver. 3. beta Oscar Torres-Reyna Data Consultant otorres@princeton.edu http://dss.princeton.edu/training/ Logit model Use logit models whenever your

More information

An Empirical Study on Default Factors for US Sub-prime Residential Loans

An Empirical Study on Default Factors for US Sub-prime Residential Loans An Empirical Study on Default Factors for US Sub-prime Residential Loans Kai-Jiun Chang, Ph.D. Candidate, National Taiwan University, Taiwan ABSTRACT This research aims to identify the loan characteristics

More information

What America Is Thinking On Energy Issues January 2015

What America Is Thinking On Energy Issues January 2015 What America Is Thinking On Energy Issues January 2015 South Carolina Offshore Drilling Presented by: Harris Poll Interviewing: January 13-15, 2015 Respondents: 604 Registered Voters Method: Telephone

More information

Getting Started in Logit and Ordered Logit Regression (ver. 3.1 beta)

Getting Started in Logit and Ordered Logit Regression (ver. 3.1 beta) Getting Started in Logit and Ordered Logit Regression (ver. 3. beta Oscar Torres-Reyna Data Consultant otorres@princeton.edu http://dss.princeton.edu/training/ Logit model Use logit models whenever your

More information

Graduate School of Business, University of Chicago Business 41202, Spring Quarter 2007, Mr. Ruey S. Tsay. Midterm

Graduate School of Business, University of Chicago Business 41202, Spring Quarter 2007, Mr. Ruey S. Tsay. Midterm Graduate School of Business, University of Chicago Business 41202, Spring Quarter 2007, Mr. Ruey S. Tsay Midterm GSB Honor Code: I pledge my honor that I have not violated the Honor Code during this examination.

More information

Lecture Note: Analysis of Financial Time Series Spring 2017, Ruey S. Tsay

Lecture Note: Analysis of Financial Time Series Spring 2017, Ruey S. Tsay Lecture Note: Analysis of Financial Time Series Spring 2017, Ruey S. Tsay Seasonal Time Series: TS with periodic patterns and useful in predicting quarterly earnings pricing weather-related derivatives

More information

Random digital dial Results are weighted to be representative of registered voters Sampling Error: +/-4% at the 95% confidence level

Random digital dial Results are weighted to be representative of registered voters Sampling Error: +/-4% at the 95% confidence level South Carolina Created for: American Petroleum Institute Presented by: Harris Poll Interviewing: November 18 22, 2015 Respondents: 607 Registered Voters in South Carolina Method: Telephone Sample: Random

More information

Milestone2. Zillow House Price Prediciton. Group: Lingzi Hong and Pranali Shetty

Milestone2. Zillow House Price Prediciton. Group: Lingzi Hong and Pranali Shetty Milestone2 Zillow House Price Prediciton Group Lingzi Hong and Pranali Shetty MILESTONE 2 REPORT Data Collection The following additional features were added 1. Population, Number of College Graduates

More information

Predicting Charitable Contributions

Predicting Charitable Contributions Predicting Charitable Contributions By Lauren Meyer Executive Summary Charitable contributions depend on many factors from financial security to personal characteristics. This report will focus on demographic

More information

Step 1: Load the appropriate R package. Step 2: Fit a separate mixed model for each independence claim in the basis set.

Step 1: Load the appropriate R package. Step 2: Fit a separate mixed model for each independence claim in the basis set. Step 1: Load the appropriate R package. You will need two libraries: nlme and lme4. Step 2: Fit a separate mixed model for each independence claim in the basis set. For instance, in Table 2 the first basis

More information

NHY examples. Bernt Arne Ødegaard. 23 November Estimating dividend growth in Norsk Hydro 8

NHY examples. Bernt Arne Ødegaard. 23 November Estimating dividend growth in Norsk Hydro 8 NHY examples Bernt Arne Ødegaard 23 November 2017 Abstract Finance examples using equity data for Norsk Hydro (NHY) Contents 1 Calculating Beta 4 2 Cost of Capital 7 3 Estimating dividend growth in Norsk

More information

Graduate School of Business, University of Chicago Business 41202, Spring Quarter 2007, Mr. Ruey S. Tsay. Final Exam

Graduate School of Business, University of Chicago Business 41202, Spring Quarter 2007, Mr. Ruey S. Tsay. Final Exam Graduate School of Business, University of Chicago Business 41202, Spring Quarter 2007, Mr. Ruey S. Tsay Final Exam GSB Honor Code: I pledge my honor that I have not violated the Honor Code during this

More information

The Multivariate Regression Model

The Multivariate Regression Model The Multivariate Regression Model Example Determinants of College GPA Sample of 4 Freshman Collect data on College GPA (4.0 scale) Look at importance of ACT Consider the following model CGPA ACT i 0 i

More information

Random Effects ANOVA

Random Effects ANOVA Random Effects ANOVA Grant B. Morgan Baylor University This post contains code for conducting a random effects ANOVA. Make sure the following packages are installed: foreign, lme4, lsr, lattice. library(foreign)

More information

Homework Assignment Section 3

Homework Assignment Section 3 Homework Assignment Section 3 Tengyuan Liang Business Statistics Booth School of Business Problem 1 A company sets different prices for a particular stereo system in eight different regions of the country.

More information

Access and Infrastructure National April 2014

Access and Infrastructure National April 2014 Access and Infrastructure National April 2014 Created for: American Petroleum Institute Presented by: Nielsen Interviewing: April 3-9, 2014 Respondents: 1,003 Registered Voters Method: Telephone Sample:

More information

Production & Offshore Drilling July 2014

Production & Offshore Drilling July 2014 Production & Offshore Drilling July 2014 Created for: American Petroleum Institute Presented by: Nielsen Interviewing: July 10 July 13, 2014 Respondents: 1012 Registered Voters Method: Telephone Sample:

More information

Econ 371 Problem Set #4 Answer Sheet. 6.2 This question asks you to use the results from column (1) in the table on page 213.

Econ 371 Problem Set #4 Answer Sheet. 6.2 This question asks you to use the results from column (1) in the table on page 213. Econ 371 Problem Set #4 Answer Sheet 6.2 This question asks you to use the results from column (1) in the table on page 213. a. The first part of this question asks whether workers with college degrees

More information

An Examination of the Impact of the Texas Methodist Foundation Clergy Development Program. on the United Methodist Church in Texas

An Examination of the Impact of the Texas Methodist Foundation Clergy Development Program. on the United Methodist Church in Texas An Examination of the Impact of the Texas Methodist Foundation Clergy Development Program on the United Methodist Church in Texas The Texas Methodist Foundation completed its first, two-year Clergy Development

More information

The SAS System 11:03 Monday, November 11,

The SAS System 11:03 Monday, November 11, The SAS System 11:3 Monday, November 11, 213 1 The CONTENTS Procedure Data Set Name BIO.AUTO_PREMIUMS Observations 5 Member Type DATA Variables 3 Engine V9 Indexes Created Monday, November 11, 213 11:4:19

More information

Sociology Exam 3 Answer Key - DRAFT May 8, 2007

Sociology Exam 3 Answer Key - DRAFT May 8, 2007 Sociology 63993 Exam 3 Answer Key - DRAFT May 8, 2007 I. True-False. (20 points) Indicate whether the following statements are true or false. If false, briefly explain why. 1. The odds of an event occurring

More information

North Carolina Survey Results

North Carolina Survey Results North Carolina Survey Results Q1 Q2 Q3 Q4 Would you strongly support, somewhat support, somewhat oppose or strongly oppose efforts to reform North Carolina s bail system? 33%... 41%......... 8% 4%... 14%

More information

What America Is Thinking Access Virginia Fall 2013

What America Is Thinking Access Virginia Fall 2013 What America Is Thinking Access Virginia Fall 2013 Created for: American Petroleum Institute Presented by: Harris Interactive Interviewing: September 24 29, 2013 Respondents: 616 Virginia Registered Voters

More information

Final Exam - section 1. Thursday, December hours, 30 minutes

Final Exam - section 1. Thursday, December hours, 30 minutes Econometrics, ECON312 San Francisco State University Michael Bar Fall 2013 Final Exam - section 1 Thursday, December 19 1 hours, 30 minutes Name: Instructions 1. This is closed book, closed notes exam.

More information

Multiple regression - a brief introduction

Multiple regression - a brief introduction Multiple regression - a brief introduction Multiple regression is an extension to regular (simple) regression. Instead of one X, we now have several. Suppose, for example, that you are trying to predict

More information

sociology SO5032 Quantitative Research Methods Brendan Halpin, Sociology, University of Limerick Spring 2018 SO5032 Quantitative Research Methods

sociology SO5032 Quantitative Research Methods Brendan Halpin, Sociology, University of Limerick Spring 2018 SO5032 Quantitative Research Methods 1 SO5032 Quantitative Research Methods Brendan Halpin, Sociology, University of Limerick Spring 2018 Lecture 10: Multinomial regression baseline category extension of binary What if we have multiple possible

More information

COMPREHENSIVE WRITTEN EXAMINATION, PAPER III FRIDAY AUGUST 18, 2006, 9:00 A.M. 1:00 P.M. STATISTICS 174 QUESTIONS

COMPREHENSIVE WRITTEN EXAMINATION, PAPER III FRIDAY AUGUST 18, 2006, 9:00 A.M. 1:00 P.M. STATISTICS 174 QUESTIONS COMPREHENSIVE WRITTEN EXAMINATION, PAPER III FRIDAY AUGUST 18, 2006, 9:00 A.M. 1:00 P.M. STATISTICS 174 QUESTIONS Answer all parts. Closed book, calculators allowed. It is important to show all working,

More information

Lecture Note: Analysis of Financial Time Series Spring 2008, Ruey S. Tsay. Seasonal Time Series: TS with periodic patterns and useful in

Lecture Note: Analysis of Financial Time Series Spring 2008, Ruey S. Tsay. Seasonal Time Series: TS with periodic patterns and useful in Lecture Note: Analysis of Financial Time Series Spring 2008, Ruey S. Tsay Seasonal Time Series: TS with periodic patterns and useful in predicting quarterly earnings pricing weather-related derivatives

More information

The August 2018 AP-NORC Center Poll

The August 2018 AP-NORC Center Poll The August 2018 Center Poll Conducted by The Associated Press-NORC Center for Public Affairs Research With funding from The Associated Press and NORC at the University of Chicago Interviews: 1,055 adults

More information

Public Issues Survey Wave 12

Public Issues Survey Wave 12 PAGE 1 Table 1-1 QUESTION PTYPE: PHONE TYPE Landline 400 164 228 5 3 5 9 14 42 91 239 309 49 9 9 5 19 134 82 102 73 5 4 150 104 116 30 72 118 169 41 50% 46% 53% 36% 75% 11% 16% 24% 40% 51% 67% 51% 54%

More information

STA 4504/5503 Sample questions for exam True-False questions.

STA 4504/5503 Sample questions for exam True-False questions. STA 4504/5503 Sample questions for exam 2 1. True-False questions. (a) For General Social Survey data on Y = political ideology (categories liberal, moderate, conservative), X 1 = gender (1 = female, 0

More information

Stat 401XV Exam 3 Spring 2017

Stat 401XV Exam 3 Spring 2017 Stat 40XV Exam Spring 07 I have neither given nor received unauthorized assistance on this exam. Name Signed Date Name Printed ATTENTION! Incorrect numerical answers unaccompanied by supporting reasoning

More information

MODEL SELECTION CRITERIA IN R:

MODEL SELECTION CRITERIA IN R: 1. R 2 statistics We may use MODEL SELECTION CRITERIA IN R R 2 = SS R SS T = 1 SS Res SS T or R 2 Adj = 1 SS Res/(n p) SS T /(n 1) = 1 ( ) n 1 (1 R 2 ). n p where p is the total number of parameters. R

More information

Chapter 8 Exercises 1. Data Analysis & Graphics Using R Solutions to Exercises (May 1, 2010)

Chapter 8 Exercises 1. Data Analysis & Graphics Using R Solutions to Exercises (May 1, 2010) Chapter 8 Exercises 1 Data Analysis & Graphics Using R Solutions to Exercises (May 1, 2010) Preliminaries > library(daag) Exercise 1 The following table shows numbers of occasions when inhibition (i.e.,

More information

Ordinal and categorical variables

Ordinal and categorical variables Ordinal and categorical variables Ben Bolker October 29, 2018 Licensed under the Creative Commons attribution-noncommercial license (http: //creativecommons.org/licenses/by-nc/3.0/). Please share & remix

More information

How the Survey was Conducted Nature of the Sample: NBC News/WSJ/Marist New Hampshire Poll of 2,059 Adults

How the Survey was Conducted Nature of the Sample: NBC News/WSJ/Marist New Hampshire Poll of 2,059 Adults How the Survey was Conducted Nature of the Sample: NBC News/WSJ/Marist New Hampshire Poll of 2,059 Adults This survey of 2,059 adults was conducted January 2 nd through January 7 th, 2016 by The Marist

More information

Introduction to General and Generalized Linear Models

Introduction to General and Generalized Linear Models Introduction to General and Generalized Linear Models Generalized Linear Models - IIIb Henrik Madsen March 18, 2012 Henrik Madsen () Chapman & Hall March 18, 2012 1 / 32 Examples Overdispersion and Offset!

More information

Logistic Regression Analysis

Logistic Regression Analysis Revised July 2018 Logistic Regression Analysis This set of notes shows how to use Stata to estimate a logistic regression equation. It assumes that you have set Stata up on your computer (see the Getting

More information

Module 9: Single-level and Multilevel Models for Ordinal Responses. Stata Practical 1

Module 9: Single-level and Multilevel Models for Ordinal Responses. Stata Practical 1 Module 9: Single-level and Multilevel Models for Ordinal Responses Pre-requisites Modules 5, 6 and 7 Stata Practical 1 George Leckie, Tim Morris & Fiona Steele Centre for Multilevel Modelling If you find

More information

Final Exam Suggested Solutions

Final Exam Suggested Solutions University of Washington Fall 003 Department of Economics Eric Zivot Economics 483 Final Exam Suggested Solutions This is a closed book and closed note exam. However, you are allowed one page of handwritten

More information

Generalized Linear Models

Generalized Linear Models Generalized Linear Models Ordinal Logistic Regression Dr. Tackett 11.27.2018 1 / 26 Announcements HW 8 due Thursday, 11/29 Lab 10 due Sunday, 12/2 Exam II, Thursday 12/6 2 / 26 Packages library(knitr)

More information

Random digit dial Results are weighted to be representative of Maryland registered voters.

Random digit dial Results are weighted to be representative of Maryland registered voters. Access and Infrastructure Maryland April 2014 Created for: American Petroleum Institute Presented by: Nielsen Interviewing: April 9 16, 2014 Respondents: 602 registered voters Method: Telephone Sample:

More information

ECON Introductory Econometrics. Seminar 4. Stock and Watson Chapter 8

ECON Introductory Econometrics. Seminar 4. Stock and Watson Chapter 8 ECON4150 - Introductory Econometrics Seminar 4 Stock and Watson Chapter 8 empirical exercise E8.2: Data 2 In this exercise we use the data set CPS12.dta Each month the Bureau of Labor Statistics in the

More information

How the Survey was Conducted Nature of the Sample: NBC News/WSJ/Marist New Hampshire Poll of 1,108 Adults

How the Survey was Conducted Nature of the Sample: NBC News/WSJ/Marist New Hampshire Poll of 1,108 Adults How the Survey was Conducted Nature of the Sample: NBC News/WSJ/Marist New Hampshire Poll of 1,108 Adults This survey of 1,108 adults was conducted September 6 th through September 8 th, 2016 by The Marist

More information

ARIMA ANALYSIS WITH INTERVENTIONS / OUTLIERS

ARIMA ANALYSIS WITH INTERVENTIONS / OUTLIERS TASK Run intervention analysis on the price of stock M: model a function of the price as ARIMA with outliers and interventions. SOLUTION The document below is an abridged version of the solution provided

More information

Labor Market Returns to Two- and Four- Year Colleges. Paper by Kane and Rouse Replicated by Andreas Kraft

Labor Market Returns to Two- and Four- Year Colleges. Paper by Kane and Rouse Replicated by Andreas Kraft Labor Market Returns to Two- and Four- Year Colleges Paper by Kane and Rouse Replicated by Andreas Kraft Theory Estimating the return to two-year colleges Economic Return to credit hours or sheepskin effects

More information

STATISTICS 110/201, FALL 2017 Homework #5 Solutions Assigned Mon, November 6, Due Wed, November 15

STATISTICS 110/201, FALL 2017 Homework #5 Solutions Assigned Mon, November 6, Due Wed, November 15 STATISTICS 110/201, FALL 2017 Homework #5 Solutions Assigned Mon, November 6, Due Wed, November 15 For this assignment use the Diamonds dataset in the Stat2Data library. The dataset is used in examples

More information

The December 2017 AP-NORC Center Poll

The December 2017 AP-NORC Center Poll The December 2017 Center Poll Conducted by The Associated Press-NORC Center for Public Affairs Research With funding from The Associated Press and NORC at the University of Chicago Interviews: 1,020 adults

More information

CHAPTER 4 ESTIMATES OF RETIREMENT, SOCIAL SECURITY BENEFIT TAKE-UP, AND EARNINGS AFTER AGE 50

CHAPTER 4 ESTIMATES OF RETIREMENT, SOCIAL SECURITY BENEFIT TAKE-UP, AND EARNINGS AFTER AGE 50 CHAPTER 4 ESTIMATES OF RETIREMENT, SOCIAL SECURITY BENEFIT TAKE-UP, AND EARNINGS AFTER AGE 5 I. INTRODUCTION This chapter describes the models that MINT uses to simulate earnings from age 5 to death, retirement

More information

Negative Binomial Model for Count Data Log-linear Models for Contingency Tables - Introduction

Negative Binomial Model for Count Data Log-linear Models for Contingency Tables - Introduction Negative Binomial Model for Count Data Log-linear Models for Contingency Tables - Introduction Statistics 149 Spring 2006 Copyright 2006 by Mark E. Irwin Negative Binomial Family Example: Absenteeism from

More information

MCMC Package Example

MCMC Package Example MCMC Package Example Charles J. Geyer April 4, 2005 This is an example of using the mcmc package in R. The problem comes from a take-home question on a (take-home) PhD qualifying exam (School of Statistics,

More information

Data screening, transformations: MRC05

Data screening, transformations: MRC05 Dale Berger Data screening, transformations: MRC05 This is a demonstration of data screening and transformations for a regression analysis. Our interest is in predicting current salary from education level

More information

You created this PDF from an application that is not licensed to print to novapdf printer (http://www.novapdf.com)

You created this PDF from an application that is not licensed to print to novapdf printer (http://www.novapdf.com) Monday October 3 10:11:57 2011 Page 1 (R) / / / / / / / / / / / / Statistics/Data Analysis Education Box and save these files in a local folder. name:

More information

First Midterm Examination Econ 103, Statistics for Economists February 16th, 2016

First Midterm Examination Econ 103, Statistics for Economists February 16th, 2016 First Midterm Examination Econ 103, Statistics for Economists February 16th, 2016 You will have 70 minutes to complete this exam. Graphing calculators, notes, and textbooks are not permitted. I pledge

More information

Public Issues Survey Wave 5 PAGE 1

Public Issues Survey Wave 5 PAGE 1 Table 1-1 QUESTION PTYPE: Phone Type Public Issues Survey Wave 5 PAGE 1 Landline 368 134 233-1 6 9 14 27 85 227 68 300 99 40 158 22 27 22 93 85 88 100-2 255 79 17 3 6 8 46% 42% 49% - 100% 16% 12% 16% 23%

More information

The data definition file provided by the authors is reproduced below: Obs: 1500 home sales in Stockton, CA from Oct 1, 1996 to Nov 30, 1998

The data definition file provided by the authors is reproduced below: Obs: 1500 home sales in Stockton, CA from Oct 1, 1996 to Nov 30, 1998 Economics 312 Sample Project Report Jeffrey Parker Introduction This project is based on Exercise 2.12 on page 81 of the Hill, Griffiths, and Lim text. It examines how the sale price of houses in Stockton,

More information

book 2014/5/6 15:21 page 261 #285

book 2014/5/6 15:21 page 261 #285 book 2014/5/6 15:21 page 261 #285 Chapter 10 Simulation Simulations provide a powerful way to answer questions and explore properties of statistical estimators and procedures. In this chapter, we will

More information

> attach(grocery) > boxplot(sales~discount, ylab="sales",xlab="discount")

> attach(grocery) > boxplot(sales~discount, ylab=sales,xlab=discount) Example of More than 2 Categories, and Analysis of Covariance Example > attach(grocery) > boxplot(sales~discount, ylab="sales",xlab="discount") Sales 160 200 240 > tapply(sales,discount,mean) 10.00% 15.00%

More information

ASSOCIATED PRESS: SOCIAL SECURITY STUDY CONDUCTED BY IPSOS PUBLIC AFFAIRS RELEASE DATE: MAY 5, 2005 PROJECT #

ASSOCIATED PRESS: SOCIAL SECURITY STUDY CONDUCTED BY IPSOS PUBLIC AFFAIRS RELEASE DATE: MAY 5, 2005 PROJECT # 1101 Connecticut Avenue NW, Suite 200 Washington, DC 20036 (202) 463-7300 Interview dates: Interviews: 1,000 adults, 849 registered voters Margin of error: +3.1 for all adults, +3.4 for registered voters

More information

arxiv: v1 [q-fin.ec] 28 Apr 2014

arxiv: v1 [q-fin.ec] 28 Apr 2014 The Italian Crisis and Producer Households Debt: a Source of Stability? A Reproducible Research arxiv:1404.7377v1 [q-fin.ec] 28 Apr 2014 Accepted at the Risk, Banking and Finance Society, University of

More information

FOR ONLINE PUBLICATION ONLY. Supplemental Appendix for:

FOR ONLINE PUBLICATION ONLY. Supplemental Appendix for: FOR ONLINE PUBLICATION ONLY Supplemental Appendix for: Perceptions of Deservingness and the Politicization of Social Insurance: Evidence from Disability Insurance in the United States Albert H. Fang Yale

More information

Building and Checking Survival Models

Building and Checking Survival Models Building and Checking Survival Models David M. Rocke May 23, 2017 David M. Rocke Building and Checking Survival Models May 23, 2017 1 / 53 hodg Lymphoma Data Set from KMsurv This data set consists of information

More information

For release after 10:00AM/ET Monday, December 11, ALABAMA

For release after 10:00AM/ET Monday, December 11, ALABAMA For release after 10:00AM/ET Monday, December 11, 2017. ALABAMA The Fox News Poll is conducted under the joint direction of Anderson Robbins Research (D) and Shaw & Company Research (R). The poll was conducted

More information

Technical Documentation for Household Demographics Projection

Technical Documentation for Household Demographics Projection Technical Documentation for Household Demographics Projection REMI Household Forecast is a tool to complement the PI+ demographic model by providing comprehensive forecasts of a variety of household characteristics.

More information

Public Issues Survey Wave 7 PAGE 1

Public Issues Survey Wave 7 PAGE 1 Table 1-1 QUESTION CELL: Dummy question for Cell Landline. Public Issues Survey Wave 7 PAGE 1 Landline 119 59 59-1 4 1 13 28 53 20 46 36 31 6 15 47 47 10 28 30 37 23-1 94 17 3 1 2 2 15% 14% 16% - 20% 6%

More information

General Business 706 Midterm #3 November 25, 1997

General Business 706 Midterm #3 November 25, 1997 General Business 706 Midterm #3 November 25, 1997 There are 9 questions on this exam for a total of 40 points. Please be sure to put your name and ID in the spaces provided below. Now, if you feel any

More information

Public Issues Survey Wave 6 PAGE 1

Public Issues Survey Wave 6 PAGE 1 Table 1-1 QUESTION PTYPE: Phone Type Public Issues Survey Wave 6 PAGE 1 Landline 400 147 248 4 1 5 11 18 60 102 204 150 82 115 166 145 81 88 80 1 5 299 72 10 3 5 11 50% 41% 58% 67% 33% 12% 13% 17% 44%

More information

Random digit dial Results are weighted to be representative of registered voters.

Random digit dial Results are weighted to be representative of registered voters. Keystone XL Pipeline National April 2014 Created for: American Petroleum Institute Presented by: Nielsen Interviewing: April 16 20, 2014 Respondents: 1000 registered voters Method: Telephone Sample: Random

More information

PENSION POLL 2015 TOPLINE RESULTS

PENSION POLL 2015 TOPLINE RESULTS PENSION POLL 2015 TOPLINE RESULTS RELEASED: FEBRUARY 6, 2015 The Reason-Rupe Pension Poll interviewed 1,003 adults on both mobile (501) and landline (502) phones, including 290 respondents without landlines,

More information

Stat 328, Summer 2005

Stat 328, Summer 2005 Stat 328, Summer 2005 Exam #2, 6/18/05 Name (print) UnivID I have neither given nor received any unauthorized aid in completing this exam. Signed Answer each question completely showing your work where

More information

Florida CD 10 Survey Results

Florida CD 10 Survey Results Florida CD 10 Survey Results Q1 Q2 Q3 Q4 Q5 How likely you are to vote in the August 30th Democratic primary election for Congress and other important offices: will you definitely vote, probably vote,

More information

Cameron ECON 132 (Health Economics): FIRST MIDTERM EXAM (A) Fall 17

Cameron ECON 132 (Health Economics): FIRST MIDTERM EXAM (A) Fall 17 Cameron ECON 132 (Health Economics): FIRST MIDTERM EXAM (A) Fall 17 Answer all questions in the space provided on the exam. Total of 36 points (and worth 22.5% of final grade). Read each question carefully,

More information

Econometric Methods for Valuation Analysis

Econometric Methods for Valuation Analysis Econometric Methods for Valuation Analysis Margarita Genius Dept of Economics M. Genius (Univ. of Crete) Econometric Methods for Valuation Analysis Cagliari, 2017 1 / 26 Correlation Analysis Simple Regression

More information

Social Studies 201 January 28, 2005 Measures of Variation Overview

Social Studies 201 January 28, 2005 Measures of Variation Overview 1 Social Studies 201 January 28, 2005 Measures of Variation Overview Measures of variation (range, interquartile range, standard deviation, variance, and coefficient of relative variation) are presented

More information

How the Survey was Conducted Nature of the Sample: McClatchy-Marist Poll of 1,249 National Adults

How the Survey was Conducted Nature of the Sample: McClatchy-Marist Poll of 1,249 National Adults How the Survey was Conducted Nature of the Sample: McClatchy-Marist Poll of 1,249 This survey of 1,249 adults was conducted July 22 nd through July 28 th, 2015 by The Marist Poll sponsored and funded in

More information

Americans' Views on Healthcare Costs, Coverage and Policy

Americans' Views on Healthcare Costs, Coverage and Policy Americans' Views on Healthcare Costs, Coverage and Policy Conducted by at the University of Chicago with funding from The West Health Institute Interviews: 1,302 adults Margin of error: +/- 3.8 percentage

More information

DETERMINANTS OF SUCCESSFUL TECHNOLOGY TRANSFER

DETERMINANTS OF SUCCESSFUL TECHNOLOGY TRANSFER DETERMINANTS OF SUCCESSFUL TECHNOLOGY TRANSFER Stephanie Chastain Department of Economics Warrington College of Business Administration University of Florida April 2, 2014 Determinants of Successful Technology

More information

Statistical Models of Stocks and Bonds. Zachary D Easterling: Department of Economics. The University of Akron

Statistical Models of Stocks and Bonds. Zachary D Easterling: Department of Economics. The University of Akron Statistical Models of Stocks and Bonds Zachary D Easterling: Department of Economics The University of Akron Abstract One of the key ideas in monetary economics is that the prices of investments tend to

More information

Weighting: Results are weighted to be representative of 2012 election voters across the United States

Weighting: Results are weighted to be representative of 2012 election voters across the United States API Election Night Survey Interview Schedule November 7, 2012 Created for: American Petroleum Institute Presented by: Harris Interactive Interviewing: November 6, 2012 Respondents: 827 Voters Method: Telephone

More information

Monetary Economics Risk and Return, Part 2. Gerald P. Dwyer Fall 2015

Monetary Economics Risk and Return, Part 2. Gerald P. Dwyer Fall 2015 Monetary Economics Risk and Return, Part 2 Gerald P. Dwyer Fall 2015 Reading Malkiel, Part 2, Part 3 Malkiel, Part 3 Outline Returns and risk Overall market risk reduced over longer periods Individual

More information

Dummy variables 9/22/2015. Are wages different across union/nonunion jobs. Treatment Control Y X X i identifies treatment

Dummy variables 9/22/2015. Are wages different across union/nonunion jobs. Treatment Control Y X X i identifies treatment Dummy variables Treatment 22 1 1 Control 3 2 Y Y1 0 1 2 Y X X i identifies treatment 1 1 1 1 1 1 0 0 0 X i =1 if in treatment group X i =0 if in control H o : u n =u u Are wages different across union/nonunion

More information

Panel Data. November 15, The panel is balanced if all individuals have a complete set of observations, otherwise the panel is unbalanced.

Panel Data. November 15, The panel is balanced if all individuals have a complete set of observations, otherwise the panel is unbalanced. Panel Data November 15, 2018 1 Panel data Panel data are obsevations of the same individual on different dates. time Individ 1 Individ 2 Individ 3 individuals The panel is balanced if all individuals have

More information