Power Curves for t-test. Shoe Wear. α =.05, X 1,..., X n N(µ,1) > t.test(rnorm(20,mean=2,sd=2)) One-Sample t-test

Size: px
Start display at page:

Download "Power Curves for t-test. Shoe Wear. α =.05, X 1,..., X n N(µ,1) > t.test(rnorm(20,mean=2,sd=2)) One-Sample t-test"

Transcription

1 One-Samle -Tes Poer Crves for -es α =.05, X 1,..., X n N(µ,1) n=20.es(rnorm(20,mean=2,sd=2)) One Samle -es daa: rnorm(20, mean = 2, sd = 2) = 2.384, df = 19, -vale = alernaive hyohesis: re mean is no eqal o mean of x es(rnorm(20,mean=0,sd=2)) One Samle -es daa: rnorm(20, mean = 0, sd = 2) = , df = 19, -vale = alernaive hyohesis: re mean is no eqal o mean of x n=10 n= Shoe Wear library(mass) shoes $A [1] $B [1] layo(rbind(c(1,2),c(1,3))) boxlo(lis(a=shoes$a, B=shoes$B), noch=t, horizonal=t, boxex=.5) qqnorm(shoes$a); qqline(shoes$a) qqnorm(shoes$b); qqline(shoes$b) A B Paired -Tes.es(shoes$A, shoes$b, aired=t) Paired -es = , df = 9, -vale = mean of he differences es(shoes$A-shoes$B) One Samle -es daa: shoes$a - shoes$b = , df = 9, -vale = alernaive hyohesis: re mean is no eqal o mean of x

2 Paired vs. Unaired.es(shoes$A, shoes$b, aired=t) Paired -es = , df = 9, -vale = mean of he differences Non-normaliy of Traffic Daa library(mass) aach(traffic) qqnorm(y[limi=="yes"]); qqline(y[limi=="yes"]) qqnorm(y[limi=="no"]); qqline(y[limi=="no"]) shairo.es(y[limi=="yes"]) daa: y[limi == "yes"] W = , -vale = shairo.es(y[limi=="no"]) daa: y[limi == "no"] W = , -vale = es(shoes$A, shoes$b) # bad idea: sing aired=f Welch To Samle -es = , df = , -vale = Normaliy (?) of Log Traffic Daa qqnorm(log(y[limi=="yes"])) qqnorm(log(y[limi=="no"])) shairo.es(log(y[limi=="yes"])) daa: log(y[limi == "yes"]) W = , -vale = shairo.es(log(y[limi=="no"])) daa: log(y[limi == "no"]) W = , -vale = To-Samle -Tes ly.yes <- log(y[limi=="yes"]) ly.no <- log(y[limi=="no"]).es(ly.yes, ly.no) Welch To Samle -es daa: ly.yes and ly.no = , df = , -vale = var.es(ly.yes, ly.no) F es o comare o variances daa: ly.yes and ly.no F = , nm df = 68, denom df = 114, -vale = alernaive hyohesis: re raio of variances is no eqal o raio of variances es(ly.yes, ly.no, var.eqal=t) To Samle -es daa: ly.yes and ly.no = , df = 182, -vale =

3 Aroximae Z-Tess in R Insead of log-ransforming raffic daa, le s do an aroximae Z-es on he nransformed daa: Same saisic, so se same es fncion:.es(y[limi=="yes"],y[limi=="no"]) Welch To Samle -es daa: y[limi == "yes"] and y[limi == "no"] = , df = , -vale = alernaive hyohesis: re difference in means is no eqal o If yo an o be icky, se -vale based on Z insead of ( ): 2*( ,df= ,loer.ail=T) [1] *norm( ,loer.ail=T) [1] b his is all so aroximae anyay, hy no ake he more conservaive -based -vale? Recall ha exac -vale for log-ransformed daa assming normaliy and eqal variances as = Wilcoxon Signed-Rank Tes For one samle: x <- c(8.5,8.6,6.4,12.1,8.2,7.4,7.8,8.3,10.3,8.4) ilcox.es(x, =10, conf.in=t) Wilcoxon signed rank es daa: x V = 8, -vale = alernaive hyohesis: re is no eqal o (sedo)median 8.35 For aired daa: ilcox.es(shoes$a, shoes$b, aired=t) Wilcoxon signed rank es ih coniniy correcion V = 3, -vale = alernaive hyohesis: re is no eqal o 0 Warning message: Canno come exac -vale ih ies in: ilcox.es.defal(shoes$a, shoes$b, aired = T) ilcox.es(shoes$a-shoes$b) Wilcoxon signed rank es ih coniniy correcion daa: shoes$a - shoes$b V = 3, -vale = alernaive hyohesis: re is no eqal o 0 Warning message: Canno come exac -vale ih ies in: ilcox.es.defal(shoes$a - shoes$b) 39 Why I Love he Wilcoxon Tes Why I Love I Even More n=10 n=9 n=8 Normal Samle, sd=1, n=20 es (heoreical nder normaliy) es (silaed) Wilcoxon (silaed) n=7 n=6 n=5 Dis Samle, df=2, n= n=4 n=3 n=2 Mixre of 90% N(,sd=1) and 10% N(,sd=15), n=

4 To-Samle Wilcoxon Tes ilcox.es(y.yes,y.no) Wilcoxon rank sm es ih coniniy correcion daa: y.yes and y.no W = 2878, -vale = alernaive hyohesis: re is no eqal o 0 ilcox.es(log(y.yes),log(y.no)) Wilcoxon rank sm es ih coniniy correcion daa: log(y.yes) and log(y.no) W = 2878, -vale = alernaive hyohesis: re is no eqal o 0 Poer of Shairo Tes rejecs <- 0 for (i in 1:10000) { + x <- rnorm(30, mean=45, sd=20) + if (shairo.es(x)$.vale < 0.05) rejecs <- rejecs } rejecs [1] 530 rejecs <- 0 for (i in 1:10000) { + x <- rgamma(30, shae=2, rae=20) + if (shairo.es(x)$.vale < 0.05) rejecs <- rejecs } rejecs [1] 7513 rejecs <- 0 for (i in 1:10000) { + x < *r(30, df=4) + if (shairo.es(x)$.vale < 0.05) rejecs <- rejecs } rejecs [1] Poer of Shairo Tes Mligro Locaion Tess Normal Samle (Shairo =0.24) names(plangroh) [1] "eigh" "gro" levels(plangroh$gro) [1] "crl" "r1" "r2" oneay.es(eigh ~ gro, daa=plangroh) One-ay analysis of means (no assming eqal variances) daa: eigh and gro F = 5.181, nm df = 2.000, denom df = , -vale = Gamma Samle (Shairo = ) oneay.es(eigh ~ gro, daa=plangroh, var.eqal=t) Samle (Shairo =0.097) One-ay analysis of means daa: eigh and gro F = , nm df = 2, denom df = 27, -vale = smmary(aov(eigh ~ gro, daa=plangroh)) Df Sm Sq Mean Sq F vale Pr(F) gro * Residals Signif. codes: 0 *** ** 0.01 * krskal.es(eigh ~ gro, daa=plangroh) Krskal-Wallis rank sm es daa: eigh by gro Krskal-Wallis chi-sqared = , df = 2, -vale =

5 Tesing To-Way Coningencies able(r,sa404) sa404 r - n y chisq.es(able(r,sa404)) Pearson s Chi-sqared es daa: able(r, sa404) X-sqared = , df = 6, -vale = Warning message: Chi-sqared aroximaion may be incorrec in: chisq.es(able(r, sa404)) fisher.es(able(r,sa404)) Fisher s Exac Tes for Con Daa daa: able(r, sa404) -vale = alernaive hyohesis: o.sided Tesing To-Way Coningencies able(malab,sa404) sa404 malab - n y chisq.es(able(malab,sa404)) Pearson s Chi-sqared es daa: able(malab, sa404) X-sqared = , df = 6, -vale = Warning message: Chi-sqared aroximaion may be incorrec in: chisq.es(able(malab, sa404)) fisher.es(able(malab,sa404)) Fisher s Exac Tes for Con Daa daa: able(malab, sa404) -vale = alernaive hyohesis: o.sided Bigger Examle library(mass) names(melanoma) [1] "ime" "sas" "sex" "age" "year" [6] "hickness" "lcer" aach(melanoma) able(sex,lcer) lcer sex chisq.es(able(sex,lcer)) For Unaired (Indeenden) Indeenden, iid samles: A α = 0.05, Samles X 1,..., X 20 N(µ X,1) Y 1,..., Y 20 N(µ Y,1) Pearson s Chi-sqared es ih Yaes coniniy correcion daa: able(sex, lcer) X-sqared = , df = 1, -vale = fisher.es(able(sex,lcer)) Fisher s Exac Tes for Con Daa daa: able(sex, lcer) -vale = alernaive hyohesis: re odds raio is no eqal o odds raio Silaed Poer for Unaired Samles (n=20) difference in means aired (rong!) naired (okay) Welch (okay) 48 49

6 For Paired Daa (X 1, Y 1 ),...,(X 20, Y 20 ) iid bivariae normal. A α = 0.05, Posiive correlaion (sal) ρ = Silaed Poer for Paired Daa (n=20) difference in means Negaive correlaion (nsal) ρ = Silaed Poer for Paired Daa (n=20) aired (okay) naired (rong!) Welch (rong!) difference in means aired (okay) naired (rong!) Welch (rong!) 50 Locaion ess: Smmary of Tess.es: -ess for one samle, aired, o-samle (eqal variance and Welch s aroximaion). Can also be sed for aroximae Z-ess. ilcox.es: Wilcoxon signed-rank es for one samle or aired daa, Wilcoxon/Mann-Whiney rank-sm es for o samles. oneay.es: F-es for difference in means of o or more samles (eqal variance and Welch s aroximaion). krskal.es: Krskal-Wallis rank-sm es for difference in means of o or more samles. Caegorical daa ess: chisq.es: χ 2 -es for one-ay and ineracion in o-ay coningency ables. fisher.es: Fisher s exac es for ineracion in o-ay coningency ables. Oher ess: shairo.es: Shairo-Wilk es for H 0 : samle is normal. var.es: F-es for H 0 : samles have eqal variances. 51

Chapter 5. Two-Variable Regression: Interval Estimation and Hypothesis Testing

Chapter 5. Two-Variable Regression: Interval Estimation and Hypothesis Testing Chaper 5. Two-Variable Regression: Inerval Esimaion and Hypohesis Tesing Inerval Esimaion: Some Basic Ideas ( ) δ + δ where 0 < Pr < Lower Confidence Upper Confidence Confidence Level Significance Level

More information

Key Formulas. From Larson/Farber Elementary Statistics: Picturing the World, Fifth Edition 2012 Prentice Hall. Standard Score: CHAPTER 3.

Key Formulas. From Larson/Farber Elementary Statistics: Picturing the World, Fifth Edition 2012 Prentice Hall. Standard Score: CHAPTER 3. Key Formulas From Larson/Farber Elemenary Saisics: Picuring he World, Fifh Ediion 01 Prenice Hall CHAPTER Class Widh = Range of daa Number of classes 1round up o nex convenien number 1Lower class limi

More information

The Theory of the Consumer. Correction from Last Week. Consumer Preferences. Preference Orderings Example. Axioms of Consumer Preference

The Theory of the Consumer. Correction from Last Week. Consumer Preferences. Preference Orderings Example. Axioms of Consumer Preference Professor Jay Bhattacharya Sring 00 Correction from Last Week The algebraic reresentation of the bdget constraint for stams is: 0 hose = I hose + hose hose = I 0 if < 0 if The Theory of the Consmer Model

More information

Financial Markets And Empirical Regularities An Introduction to Financial Econometrics

Financial Markets And Empirical Regularities An Introduction to Financial Econometrics Financial Markes And Empirical Regulariies An Inroducion o Financial Economerics SAMSI Workshop 11/18/05 Mike Aguilar UNC a Chapel Hill www.unc.edu/~maguilar 1 Ouline I. Hisorical Perspecive on Asse Prices

More information

Data Mining Anomaly Detection. Lecture Notes for Chapter 10. Introduction to Data Mining

Data Mining Anomaly Detection. Lecture Notes for Chapter 10. Introduction to Data Mining Daa Mining Anomaly Deecion Lecure Noes for Chaper 10 Inroducion o Daa Mining by Tan, Seinbach, Kumar Tan,Seinbach, Kumar Inroducion o Daa Mining 4/18/2004 1 Anomaly/Oulier Deecion Wha are anomalies/ouliers?

More information

Data Mining Anomaly Detection. Lecture Notes for Chapter 10. Introduction to Data Mining

Data Mining Anomaly Detection. Lecture Notes for Chapter 10. Introduction to Data Mining Daa Mining Anomaly Deecion Lecure Noes for Chaper 10 Inroducion o Daa Mining by Tan, Seinbach, Kumar Tan,Seinbach, Kumar Inroducion o Daa Mining 4/18/2004 1 Anomaly/Oulier Deecion Wha are anomalies/ouliers?

More information

The Relationship between Money Demand and Interest Rates: An Empirical Investigation in Sri Lanka

The Relationship between Money Demand and Interest Rates: An Empirical Investigation in Sri Lanka The Relaionship beween Money Demand and Ineres Raes: An Empirical Invesigaion in Sri Lanka R. C. P. Padmasiri 1 and O. G. Dayarana Banda 2 1 Economic Research Uni, Deparmen of Expor Agriculure 2 Deparmen

More information

Finance Solutions to Problem Set #6: Demand Estimation and Forecasting

Finance Solutions to Problem Set #6: Demand Estimation and Forecasting Finance 30210 Soluions o Problem Se #6: Demand Esimaion and Forecasing 1) Consider he following regression for Ice Cream sales (in housands) as a funcion of price in dollars per pin. My daa is aken from

More information

A Vector Autoregression Framework for the Modeling of Commodity Spreads

A Vector Autoregression Framework for the Modeling of Commodity Spreads A Vecor Auoregression Framework for he Modeling of Commodiy Sreads Ted Kury The Energy Auhoriy ICDSA 007 June, 007 Rule # of Pricing Models Pricing models can offer valuable insigh ino he behavior of simle

More information

Forecasting with Judgment

Forecasting with Judgment Forecasing wih Judgmen Simone Manganelli DG-Research European Cenral Bank Frankfur am Main, German) Disclaimer: he views expressed in his paper are our own and do no necessaril reflec he views of he ECB

More information

Non-Stationary Processes: Part IV. ARCH(m) (Autoregressive Conditional Heteroskedasticity) Models

Non-Stationary Processes: Part IV. ARCH(m) (Autoregressive Conditional Heteroskedasticity) Models Alber-Ludwigs Universiy Freiburg Deparmen of Economics Time Series Analysis, Summer 29 Dr. Sevap Kesel Non-Saionary Processes: Par IV ARCH(m) (Auoregressive Condiional Heeroskedasiciy) Models Saionary

More information

χ 2 distributions and confidence intervals for population variance

χ 2 distributions and confidence intervals for population variance χ 2 distributions and confidence intervals for population variance Let Z be a standard Normal random variable, i.e., Z N(0, 1). Define Y = Z 2. Y is a non-negative random variable. Its distribution is

More information

R e. Y R, X R, u e, and. Use the attached excel spreadsheets to

R e. Y R, X R, u e, and. Use the attached excel spreadsheets to HW # Saisical Financial Modeling ( P Theodossiou) 1 The following are annual reurns for US finance socks (F) and he S&P500 socks index (M) Year Reurn Finance Socks Reurn S&P500 Year Reurn Finance Socks

More information

Two Way ANOVA in R Solutions

Two Way ANOVA in R Solutions Two Way ANOVA in R Solutions Solutions to exercises found here # Exercise 1 # #Read in the moth experiment data setwd("h:/datasets") moth.experiment = read.csv("moth trap experiment.csv", header = TRUE)

More information

Computer Lab 6. Minitab Project Report. Time Series Plot of x. Year

Computer Lab 6. Minitab Project Report. Time Series Plot of x. Year Compuer Lab Problem. Lengh of Growing Season in England Miniab Projec Repor Time Series Plo of x x 77 8 8 889 Year 98 97 The ime series plo indicaes a consan rend up o abou 9, hen he lengh of growing season

More information

Money Demand Function for Pakistan

Money Demand Function for Pakistan Money Demand Funcion for Pakisan Nisar Ahmad, Amber Naz, Amjad Naveed and Abdul Jalil 1 Absrac The main objecive of his sudy is o empirically esimae he long run money demand funcion for Pakisan using ime

More information

Process of convergence dr Joanna Wolszczak-Derlacz. Lecture 4 and 5 Solow growth model (a)

Process of convergence dr Joanna Wolszczak-Derlacz. Lecture 4 and 5 Solow growth model (a) Process of convergence dr Joanna Wolszczak-Derlacz ecure 4 and 5 Solow growh model a Solow growh model Rober Solow "A Conribuion o he Theory of Economic Growh." Quarerly Journal of Economics 70 February

More information

VaR and Low Interest Rates

VaR and Low Interest Rates VaR and Low Ineres Raes Presened a he Sevenh Monreal Indusrial Problem Solving Workshop By Louis Doray (U de M) Frédéric Edoukou (U de M) Rim Labdi (HEC Monréal) Zichun Ye (UBC) 20 May 2016 P r e s e n

More information

Testing Rationality of Forecast Revision Made by IMF and OECD

Testing Rationality of Forecast Revision Made by IMF and OECD Tesing Raionaliy o Forecas Revision Made by IMF and OECD Masahiro ASHIYA * February 2005 JEL Classiicaion Codes: E37; C53; E17. Keywords: raional expecaion; orecas; orecas revision. * Faculy o Economics,

More information

Causality between Money and Prices:Evidence from Pakistan

Causality between Money and Prices:Evidence from Pakistan MPRA Munich Personal RePEc Archive Causaliy beween Money and Prices:Evidence from Pakisan Fazal Husain and Tariq Mahmood Pakisan Insiue of Develomen Economics 1998 Online a h://mra.ub.uni-muenchen.de/2720/

More information

Lecture 5: Fundamentals of Statistical Analysis and Distributions Derived from Normal Distributions

Lecture 5: Fundamentals of Statistical Analysis and Distributions Derived from Normal Distributions Lecture 5: Fundamentals of Statistical Analysis and Distributions Derived from Normal Distributions ELE 525: Random Processes in Information Systems Hisashi Kobayashi Department of Electrical Engineering

More information

ACE 564 Spring Lecture 9. Violations of Basic Assumptions II: Heteroskedasticity. by Professor Scott H. Irwin

ACE 564 Spring Lecture 9. Violations of Basic Assumptions II: Heteroskedasticity. by Professor Scott H. Irwin ACE 564 Spring 006 Lecure 9 Violaions of Basic Assumpions II: Heeroskedasiciy by Professor Sco H. Irwin Readings: Griffihs, Hill and Judge. "Heeroskedasic Errors, Chaper 5 in Learning and Pracicing Economerics

More information

The FREQ Procedure. Table of Sex by Gym Sex(Sex) Gym(Gym) No Yes Total Male Female Total

The FREQ Procedure. Table of Sex by Gym Sex(Sex) Gym(Gym) No Yes Total Male Female Total Jenn Selensky gathered data from students in an introduction to psychology course. The data are weights, sex/gender, and whether or not the student worked-out in the gym. Here is the output from a 2 x

More information

Modelling Multivariate Skewness in Financial Returns: a SGARCH Approach

Modelling Multivariate Skewness in Financial Returns: a SGARCH Approach Modelling Mulivariae Skewness in Financial Reurns: a SGARCH Approach Nicola Loperfido nicola.loperfido@uniurb.i Universià degli Sudi di Urbino Carlo Bo Via Saffi 42, 6029 Urbino (PU), ITALY (join work

More information

Economic Interferences

Economic Interferences Economic Inerferences Zélia Serrasqueiro Managemen and Economics Deparmen, Beira Inerior Universiy, Covilhã, Porugal and CEFAGE Research Cener Évora Universiy, Porugal E-mail: zelia@ubi.p Absrac In his

More information

Undergraduate Research Opportunity Programme in Science. Value at Risk. Dai Bo. Supervisor: Dr. Arie Harel. Department of Mathematics

Undergraduate Research Opportunity Programme in Science. Value at Risk. Dai Bo. Supervisor: Dr. Arie Harel. Department of Mathematics Undergraduae Research Ooruniy Programme in Science Value a Risk Dai Bo Suervisor: Dr. Arie Harel Dearmen of Mahemaics Naional Universiy of Singaore Academic year (/) I Summary Value a Risk (VaR) is one

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

IMPACTS OF FINANCIAL DERIVATIVES MARKET ON OIL PRICE VOLATILITY. Istemi Berk Department of Economics Izmir University of Economics

IMPACTS OF FINANCIAL DERIVATIVES MARKET ON OIL PRICE VOLATILITY. Istemi Berk Department of Economics Izmir University of Economics IMPACTS OF FINANCIAL DERIVATIVES MARKET ON OIL PRICE VOLATILITY Isemi Berk Deparmen of Economics Izmir Universiy of Economics OUTLINE MOTIVATION CRUDE OIL MARKET FUNDAMENTALS LITERATURE & CONTRIBUTION

More information

The Size of Informal Economy in Pakistan

The Size of Informal Economy in Pakistan The Size of Informal Economy in Pakisan by Muhammad Farooq Arby Muhammad Jahanzeb Malik Muhammad Nadim Hanif June 2010 Moivaion of he Sudy Various Approaches o Esimae Informal Economy Direc Mehods Indirec

More information

Lecture 21: Logit Models for Multinomial Responses Continued

Lecture 21: Logit Models for Multinomial Responses Continued Lecture 21: Logit Models for Multinomial Responses Continued Dipankar Bandyopadhyay, Ph.D. BMTRY 711: Analysis of Categorical Data Spring 2011 Division of Biostatistics and Epidemiology Medical University

More information

Actuarial Research on the Effectiveness of Collision Avoidance Systems FCW & LDW. A translation from Hebrew to English of a research paper prepared by

Actuarial Research on the Effectiveness of Collision Avoidance Systems FCW & LDW. A translation from Hebrew to English of a research paper prepared by Actuarial Research on the Effectiveness of Collision Avoidance Systems FCW & LDW A translation from Hebrew to English of a research paper prepared by Ron Actuarial Intelligence LTD Contact Details: Shachar

More information

MAFS Quantitative Modeling of Derivative Securities

MAFS Quantitative Modeling of Derivative Securities MAFS 5030 - Quaniaive Modeling of Derivaive Securiies Soluion o Homework Three 1 a For > s, consider E[W W s F s = E [ W W s + W s W W s Fs We hen have = E [ W W s F s + Ws E [W W s F s = s, E[W F s =

More information

Can Stocks Hedge against Inflation in the Long Run? Evidence from Ghana Stock Market

Can Stocks Hedge against Inflation in the Long Run? Evidence from Ghana Stock Market Inernaional Journal of Business and Managemen www.ccsene.org/ijbm Can Socks Hedge agains Inflaion in he Long Run? Evidence from Ghana Sock Marke Anokye Mohammed Adam School of Business, Universiy of Cape

More information

Macroeconomics II A dynamic approach to short run economic fluctuations. The DAD/DAS model.

Macroeconomics II A dynamic approach to short run economic fluctuations. The DAD/DAS model. Macroeconomics II A dynamic approach o shor run economic flucuaions. The DAD/DAS model. Par 2. The demand side of he model he dynamic aggregae demand (DAD) Inflaion and dynamics in he shor run So far,

More information

A Note on Missing Data Effects on the Hausman (1978) Simultaneity Test:

A Note on Missing Data Effects on the Hausman (1978) Simultaneity Test: A Noe on Missing Daa Effecs on he Hausman (978) Simulaneiy Tes: Some Mone Carlo Resuls. Dikaios Tserkezos and Konsaninos P. Tsagarakis Deparmen of Economics, Universiy of Cree, Universiy Campus, 7400,

More information

Advanced Forecasting Techniques and Models: Time-Series Forecasts

Advanced Forecasting Techniques and Models: Time-Series Forecasts Advanced Forecasing Techniques and Models: Time-Series Forecass Shor Examples Series using Risk Simulaor For more informaion please visi: www.realopionsvaluaion.com or conac us a: admin@realopionsvaluaion.com

More information

Experimental Design and Statistics - AGA47A

Experimental Design and Statistics - AGA47A Experimental Design and Statistics - AGA47A Czech University of Life Sciences in Prague Department of Genetics and Breeding Fall/Winter 2014/2015 Matúš Maciak (@ A 211) Office Hours: M 14:00 15:30 W 15:30

More information

Financial Econometrics Jeffrey R. Russell Midterm Winter 2011

Financial Econometrics Jeffrey R. Russell Midterm Winter 2011 Name Financial Economerics Jeffrey R. Russell Miderm Winer 2011 You have 2 hours o complee he exam. Use can use a calculaor. Try o fi all your work in he space provided. If you find you need more space

More information

State of the Art Unit Root Tests and Purchasing Power Parity

State of the Art Unit Root Tests and Purchasing Power Parity Sae of he Ar Uni Roo Tess and Purchasing Power Pariy Claude Lopez a Chrisian J. Murray b David H. Papell b a Universiy of Cincinnai, b Universiy of Houson April 2004 Absrac Alhough he uesion of wheher

More information

An Alternative Test of Purchasing Power Parity

An Alternative Test of Purchasing Power Parity An Alernaive Tes of Purchasing Power Pariy Frederic H. Wallace* Deparmen of Managemen and Mareing Prairie View A&M Universiy Prairie View, Texas 77446 and Gary L. Shelley Deparmen of Economics, Finance,

More information

Testing for Long-Run Relation between Economic Growth and Export Earnings of Cocoa in Ghana using Co-Integration Techniques*

Testing for Long-Run Relation between Economic Growth and Export Earnings of Cocoa in Ghana using Co-Integration Techniques* Tesing for Long-Run Relaion beween Economic Growh and Expor Earnings of Cocoa in Ghana using Co-Inegraion Techniques* S. Twumasi-Ankrah and E. N. Wiah Twumasi-Ankrah, S. and Wiah, E. N., (216), Tesing

More information

TWO μs OR MEDIANS: COMPARISONS. Business Statistics

TWO μs OR MEDIANS: COMPARISONS. Business Statistics TWO μs OR MEDIANS: COMPARISONS Business Statistics CONTENTS Comparing two samples Comparing two unrelated samples Comparing the means of two unrelated samples Comparing the medians of two unrelated samples

More information

Table of Contents. New to the Second Edition... Chapter 1: Introduction : Social Research...

Table of Contents. New to the Second Edition... Chapter 1: Introduction : Social Research... iii Table of Contents Preface... xiii Purpose... xiii Outline of Chapters... xiv New to the Second Edition... xvii Acknowledgements... xviii Chapter 1: Introduction... 1 1.1: Social Research... 1 Introduction...

More information

Confidence Intervals Introduction

Confidence Intervals Introduction Confidence Intervals Introduction A point estimate provides no information about the precision and reliability of estimation. For example, the sample mean X is a point estimate of the population mean μ

More information

)] = q * So using this equation together with consumer 1 s best response function, we can solve for Consumer 1 s best response becomes:

)] = q * So using this equation together with consumer 1 s best response function, we can solve for Consumer 1 s best response becomes: Econ8: Introdction to Game Theory ASWERS T PRBLEM SET a If yo decide to bring q i coins to the market, yor payoff is determined as: i P qi 60 qi [8 0.5q q q 5 ]q i 60 q i If firm i sbscript confses yo,

More information

> budworm$samplogit < log((budworm$y+0.5)/(budworm$m budworm$y+0.5))

> budworm$samplogit < log((budworm$y+0.5)/(budworm$m budworm$y+0.5)) budworm < read.table(file="n:\\courses\\stat8620\\fall 08\\budworm.dat",header=T) #budworm < read.table(file="c:\\documents and Settings\\dhall\\My Documents\\Dan's Work Stuff\\courses\\STAT8620\\Fall

More information

2 of PU_2015_375 Which of the following measures is more flexible when compared to other measures?

2 of PU_2015_375 Which of the following measures is more flexible when compared to other measures? PU M Sc Statistics 1 of 100 194 PU_2015_375 The population census period in India is for every:- quarterly Quinqennial year biannual Decennial year 2 of 100 105 PU_2015_375 Which of the following measures

More information

Econometric modelling of inbound tourist expenditure in South Africa

Econometric modelling of inbound tourist expenditure in South Africa Economeric modelling of inbound ouris expendiure in Souh Africa Paper prepared for CBTS 2011, Brunico, Ialy by Andrea Saayman and Melville Saayman Norh-Wes Universiy, Pochefsroom Campus Agenda Inroducion

More information

Comparison of back-testing results for various VaR estimation methods. Aleš Kresta, ICSP 2013, Bergamo 8 th July, 2013

Comparison of back-testing results for various VaR estimation methods. Aleš Kresta, ICSP 2013, Bergamo 8 th July, 2013 Comparison of back-esing resuls for various VaR esimaion mehods, ICSP 3, Bergamo 8 h July, 3 THE MOTIVATION AND GOAL In order o esimae he risk of financial invesmens, i is crucial for all he models o esimae

More information

EXCHANGE RATE AND GOLD PRICE: EVIDENCE FROM MALAYSIA. JEL Classification: F31, G11, G15 Keywords: Exchange rate, gold price, cointegration

EXCHANGE RATE AND GOLD PRICE: EVIDENCE FROM MALAYSIA. JEL Classification: F31, G11, G15 Keywords: Exchange rate, gold price, cointegration Labuan Bullein OF INTERNATIONAL BUSINESS & FINANCE Volume 12, 2014 ISSN 1675-7262 EXCHANGE RATE AND GOLD PRICE: EVIDENCE FROM MALAYSIA Wong Hock Tsen 1 School of Business and Economics, Universii Malaysia

More information

Empirical Evidence on Korea s Import Demand Behavior Revisited

Empirical Evidence on Korea s Import Demand Behavior Revisited 015, Vol. 7, No. Empirical Evidence on Korea s Impor Demand Behavior Revisied Jungho, Baek 1,* 1 Deparmen of Economics, School of Managemen, Universiy of Alaska Fairbanks, AK, USA *Correspondence: Deparmen

More information

An enduring question in macroeconomics: does monetary policy have any important effects on the real (i.e, real GDP, consumption, etc) economy?

An enduring question in macroeconomics: does monetary policy have any important effects on the real (i.e, real GDP, consumption, etc) economy? ONETARY OLICY IN THE INFINITE-ERIOD ECONOY: SHORT-RUN EFFECTS NOVEBER 6, 20 oneary olicy Analysis: Shor-Run Effecs IS ONETARY OLICY NEUTRAL? An enduring quesion in macroeconomics: does moneary policy have

More information

E&G, Ch. 8: Multi-Index Models & Grouping Techniques I. Multi-Index Models.

E&G, Ch. 8: Multi-Index Models & Grouping Techniques I. Multi-Index Models. 1 E&G, Ch. 8: Multi-Index Models & Grouping Techniques I. Multi-Index Models. A. The General Multi-Index Model: R i = a i + b i1 I 1 + b i2 I 2 + + b il I L + c i Explanation: 1. Let I 1 = R m ; I 2 =

More information

As time goes by... On the performance of significance tests in reaction time experiments. Wolfgang Wiedermann & Bartosz Gula

As time goes by... On the performance of significance tests in reaction time experiments. Wolfgang Wiedermann & Bartosz Gula On the performance of significance tests in reaction time experiments Wolfgang Bartosz wolfgang.wiedermann@uni-klu.ac.at bartosz.gula@uni-klu.ac.at Department of Psychology University of Klagenfurt, Austria

More information

Bid-ask spread, order size and volatility in the foreign exchange market: an empirical investigation

Bid-ask spread, order size and volatility in the foreign exchange market: an empirical investigation E3 Journal of Business Managemen and Economics Vol. 4(). pp. 67-75, December, 3 Available online hp://www.e3journals.org IN 4-748 E3 Journals 3 Full lengh research paper Bid-ask spread, order size and

More information

APPENDIX I EQUALITY AND THE BENTHAMITE SOCIAL WELFARE FUNCTION

APPENDIX I EQUALITY AND THE BENTHAMITE SOCIAL WELFARE FUNCTION APPENDIX I EQUALITY AND THE BENTHAMITE SOCIAL WELFARE FUNCTION In is appendix we explain e reason wy iliy levels differ beween differen locaions a e Benamie opimm Te basic reason is a e iliy possibiliy

More information

The Impact of Interest Rate Liberalization Announcement in China on the Market Value of Hong Kong Listed Chinese Commercial Banks

The Impact of Interest Rate Liberalization Announcement in China on the Market Value of Hong Kong Listed Chinese Commercial Banks Journal of Finance and Invesmen Analysis, vol. 2, no.3, 203, 35-39 ISSN: 224-0998 (prin version), 224-0996(online) Scienpress Ld, 203 The Impac of Ineres Rae Liberalizaion Announcemen in China on he Marke

More information

The Dynamics of Income Shares and the Wage Curve-Phillips Curve Controversy 1

The Dynamics of Income Shares and the Wage Curve-Phillips Curve Controversy 1 The Dynamics of Income Shares and he Wage Crve-Phillips Crve Conroversy 1 Jakob B Madsen Deparmen of Economics and Finance Brnel Universiy Uxbridge, Middlesex, UB8 3PH, UK Jakob.madsen@brnel.ac.k Absrac.

More information

Does the Fisher Hypothesis Hold in Sweden? An Analysis of Long-Term Interest Rates under the Regime of Inflation Targeting

Does the Fisher Hypothesis Hold in Sweden? An Analysis of Long-Term Interest Rates under the Regime of Inflation Targeting Review of Inegraive Business and Economics Research, Vol. 5, no. 3, pp.283-295, July 2016 283 Does he Fisher Hypohesis Hold in Sweden? An Analysis of Long-Term Ineres Raes under he Regime of Inflaion Targeing

More information

Does Exchange Rate Risk Affect Exports Asymmetrically? Asian Evidence

Does Exchange Rate Risk Affect Exports Asymmetrically? Asian Evidence Does Exchange Rae Risk Affec Expors Asymmerically? Asian Evidence by WenShwo Fang, a YiHao Lai, b and Sephen M. Miller c,d a Deparmen of Economics, Feng Chia Universiy and he Overseas Chinese Insiue of

More information

An approximate sampling distribution for the t-ratio. Caution: comparing population means when σ 1 σ 2.

An approximate sampling distribution for the t-ratio. Caution: comparing population means when σ 1 σ 2. Stat 529 (Winter 2011) Non-pooled t procedures (The Welch test) Reading: Section 4.3.2 The sampling distribution of Y 1 Y 2. An approximate sampling distribution for the t-ratio. The Sri Lankan analysis.

More information

Hasil Common Effect Model

Hasil Common Effect Model Hasil Common Effect Model Date: 05/11/18 Time: 06:20 C 21.16046 1.733410 12.20742 0.0000 IPM -25.74125 2.841429-9.059263 0.0000 FDI 9.11E-11 1.96E-11 4.654743 0.0000 X 0.044150 0.021606 2.043430 0.0425

More information

STAT Chapter 7: Confidence Intervals

STAT Chapter 7: Confidence Intervals STAT 515 -- Chapter 7: Confidence Intervals With a point estimate, we used a single number to estimate a parameter. We can also use a set of numbers to serve as reasonable estimates for the parameter.

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

STOCK MARKET EFFICIENCY IN NEPAL

STOCK MARKET EFFICIENCY IN NEPAL 40 Vol. Issue 5, May 0, ISSN 3 5780 ABSTRACT STOCK MARKET EFFICIENCY IN NEPAL JEETENDRA DANGOL* *Lecurer, Public Youh Campus, Tribhuvan Universiy, Nepal. The paper examines random-walk behaviour and weak-form

More information

Watch out for the impact of Scottish independence opinion polls on UK s borrowing costs

Watch out for the impact of Scottish independence opinion polls on UK s borrowing costs Wach ou for he impac of Scoish independence opinion polls on UK s borrowing coss Cosas Milas (Universiy of Liverpool; email: cosas.milas@liverpool.ac.uk) and Tim Worrall (Universiy of Edinburgh; email:

More information

Modelling volatility and correlation

Modelling volatility and correlation Modelling volailiy and correlaion An Excursion ino Non-lineariy Land Moivaion: i he linear srucural l( (and ime series) models canno explain a number of imporan feaures common o much financial daa - lepokurosis

More information

May 2007 Exam MFE Solutions 1. Answer = (B)

May 2007 Exam MFE Solutions 1. Answer = (B) May 007 Exam MFE Soluions. Answer = (B) Le D = he quarerly dividend. Using formula (9.), pu-call pariy adjused for deerminisic dividends, we have 0.0 0.05 0.03 4.50 =.45 + 5.00 D e D e 50 e = 54.45 D (

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

Inferences on Correlation Coefficients of Bivariate Log-normal Distributions

Inferences on Correlation Coefficients of Bivariate Log-normal Distributions Inferences on Correlation Coefficients of Bivariate Log-normal Distributions Guoyi Zhang 1 and Zhongxue Chen 2 Abstract This article considers inference on correlation coefficients of bivariate log-normal

More information

Lecture 23: Forward Market Bias & the Carry Trade

Lecture 23: Forward Market Bias & the Carry Trade Lecure 23: Forward Marke Bias & he Carry Trade Moivaions: Efficien markes hypohesis Does raional expecaions hold? Does he forward rae reveal all public informaion? Does Uncovered Ineres Pariy hold? Or

More information

Chapter 7: Estimation Sections

Chapter 7: Estimation Sections 1 / 40 Chapter 7: Estimation Sections 7.1 Statistical Inference Bayesian Methods: Chapter 7 7.2 Prior and Posterior Distributions 7.3 Conjugate Prior Distributions 7.4 Bayes Estimators Frequentist Methods:

More information

INSTITUTE OF ACTUARIES OF INDIA

INSTITUTE OF ACTUARIES OF INDIA INSTITUTE OF ACTUARIES OF INDIA EXAMINATIONS 9 h November 2010 Subjec CT6 Saisical Mehods Time allowed: Three Hours (10.00 13.00 Hrs.) Toal Marks: 100 INSTRUCTIONS TO THE CANDIDATES 1. Please read he insrucions

More information

Information in the term structure for the conditional volatility of one year bond returns

Information in the term structure for the conditional volatility of one year bond returns Informaion in he erm srucure for he condiional volailiy of one year bond reurns Revansiddha Basavaraj Khanapure 1 This Draf: December, 2013 1 Conac: 42 Amsel Avenue, 318 Purnell Hall, Newark, Delaware,

More information

Purchasing Power Parity (PPP) in the Long-Run: A Cointegration Approach. Md. Nisar Ahmed Shams * S. M. Woahid Murad **

Purchasing Power Parity (PPP) in the Long-Run: A Cointegration Approach. Md. Nisar Ahmed Shams * S. M. Woahid Murad ** Purchasing Power Pariy (PPP) in he Long-Run: A Coinegraion Approach Md. Nisar Ahmed Shams * S. M. Woahid Murad ** Absrac: This paper inends o es he long-run purchasing power pariy (PPP) in Bangladesh economy

More information

STAT 425: Introduction to Bayesian Analysis

STAT 425: Introduction to Bayesian Analysis STAT 45: Introduction to Bayesian Analysis Marina Vannucci Rice University, USA Fall 018 Marina Vannucci (Rice University, USA) Bayesian Analysis (Part 1) Fall 018 1 / 37 Lectures 9-11: Multi-parameter

More information

WesVar uses repeated replication variance estimation methods exclusively and as a result does not offer the Taylor Series Linearization approach.

WesVar uses repeated replication variance estimation methods exclusively and as a result does not offer the Taylor Series Linearization approach. CHAPTER 9 ANALYSIS EXAMPLES REPLICATION WesVar 4.3 GENERAL NOTES ABOUT ANALYSIS EXAMPLES REPLICATION These examples are intended to provide guidance on how to use the commands/procedures for analysis of

More information

Online Appendix to: Implementing Supply Routing Optimization in a Make-To-Order Manufacturing Network

Online Appendix to: Implementing Supply Routing Optimization in a Make-To-Order Manufacturing Network Online Appendix o: Implemening Supply Rouing Opimizaion in a Make-To-Order Manufacuring Nework A.1. Forecas Accuracy Sudy. July 29, 2008 Assuming a single locaion and par for now, his sudy can be described

More information

Stock Market Behaviour Around Profit Warning Announcements

Stock Market Behaviour Around Profit Warning Announcements Sock Marke Behaviour Around Profi Warning Announcemens Henryk Gurgul Conen 1. Moivaion 2. Review of exising evidence 3. Main conjecures 4. Daa and preliminary resuls 5. GARCH relaed mehodology 6. Empirical

More information

What Drives Stock Prices? Identifying the Determinants of Stock Price Movements

What Drives Stock Prices? Identifying the Determinants of Stock Price Movements Wha Drives Sock Prices? Idenifying he Deerminans of Sock Price Movemens Nahan S. Balke Deparmen of Economics, Souhern Mehodis Universiy Dallas, TX 75275 and Research Deparmen, Federal Reserve Bank of Dallas

More information

Researcher extracted the following results after applying SPSS software. Frequency Tables from table 4.1 to 4.9 are shown as follows: Valid.

Researcher extracted the following results after applying SPSS software. Frequency Tables from table 4.1 to 4.9 are shown as follows: Valid. Objective 1: To understand various promotional mix strategies undertaken by life insurance companies in Iran and India Researcher extracted the following results after applying SPSS software. Company located

More information

Testing Causality and Cointegration Between Saving and Investment in Bangladesh

Testing Causality and Cointegration Between Saving and Investment in Bangladesh Economics 205; 4(6): 25-3 Published online December 8, 205 (hp://www.sciencepublishinggroup.com/j/eco) doi: 0.648/j.eco.2050406.5 ISSN: 2376-659X (Prin); ISSN: 2376-6603 (Online) Tesing Causaliy and Coinegraion

More information

STA258 Analysis of Variance

STA258 Analysis of Variance STA258 Analysis of Variance Al Nosedal. University of Toronto. Winter 2017 The Data Matrix The following table shows last year s sales data for a small business. The sample is put into a matrix format

More information

TESTING THE VALIDITY OF PURCHASING POWER PARITY FOR ASIAN COUNTRIES DURING THE CURRENT FLOAT

TESTING THE VALIDITY OF PURCHASING POWER PARITY FOR ASIAN COUNTRIES DURING THE CURRENT FLOAT JOURNAL OF ECONOMIC DEVELOPMENT 29 Volume 28, Number 2, December 2003 TESTING THE VALIDITY OF PURCHASING POWER PARITY FOR ASIAN COUNTRIES DURING THE CURRENT FLOAT Al-zayoonah Universiy of Jordan Previous

More information

Package NPHMC. R topics documented: February 19, Type Package

Package NPHMC. R topics documented: February 19, Type Package Type Pacage Pacage NPHMC February 19, 2015 Tile Sample Size Calculaion for he Proporional Hazards Mixure Cure Model Version 2.2 Dae 2013-09-23 Auhor Chao Cai, Songfeng Wang, Wenbin Lu, Jiajia Zhang Mainainer

More information

A Strategy Proof Test of Portfolio Returns. Dean P. Foster and H. Peyton Young. July 27, 2011

A Strategy Proof Test of Portfolio Returns. Dean P. Foster and H. Peyton Young. July 27, 2011 A Sraegy Proof Tes of Porfolio Reurns Dean P. Foser and H. Peyon Young July 7, 011 Absrac. Tradiional mehods for analyzing orfolio reurns ofen rely on mulifacor risk assessmen, and ess of significance

More information

Cross-Sectional Asset Pricing with Individual Stocks: Betas versus Characteristics. Tarun Chordia, Amit Goyal, and Jay Shanken

Cross-Sectional Asset Pricing with Individual Stocks: Betas versus Characteristics. Tarun Chordia, Amit Goyal, and Jay Shanken Cross-Secional Asse Pricing wih Individual Socks: Beas versus Characerisics Tarun Chordia, Ami Goyal, and Jay Shanken Main quesion Are expeced reurns relaed o Risk/beas, OR Characerisics If boh, which

More information

Unit 5: Sampling Distributions of Statistics

Unit 5: Sampling Distributions of Statistics Unit 5: Sampling Distributions of Statistics Statistics 571: Statistical Methods Ramón V. León 6/12/2004 Unit 5 - Stat 571 - Ramon V. Leon 1 Definitions and Key Concepts A sample statistic used to estimate

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

Unit 5: Sampling Distributions of Statistics

Unit 5: Sampling Distributions of Statistics Unit 5: Sampling Distributions of Statistics Statistics 571: Statistical Methods Ramón V. León 6/12/2004 Unit 5 - Stat 571 - Ramon V. Leon 1 Definitions and Key Concepts A sample statistic used to estimate

More information

Characteristics of the Asian and US Stock Markets --- Seoul, Tokyo, Jakarta, Shanghai, and New York ---

Characteristics of the Asian and US Stock Markets --- Seoul, Tokyo, Jakarta, Shanghai, and New York --- 1 Characerisics of he Asian and US Sock Markes --- Seoul, okyo, Jakara, Shanghai, and New York --- Kilman Shin* Absrac he January effec refers o he heory ha he monhly average sock reurn is he highes in

More information

Right-cancellability of a family of operations on binary trees

Right-cancellability of a family of operations on binary trees Right-cancellability of a family of operations on binary trees Philippe Dchon LaBRI, U.R.A. CNRS 1304, Université Bordeax 1, 33405 Talence, France We prove some new reslts on a family of operations on

More information

Uncovered interest parity and policy behavior: new evidence

Uncovered interest parity and policy behavior: new evidence Economics Leers 69 (000) 81 87 www.elsevier.com/ locae/ econbase Uncovered ineres pariy and policy behavior: new evidence Michael Chrisensen* The Aarhus School of Business, Fuglesangs Alle 4, DK-810 Aarhus

More information

VOLATILITY CLUSTERING, NEW HEAVY-TAILED DISTRIBUTION AND THE STOCK MARKET RETURNS IN SOUTH KOREA

VOLATILITY CLUSTERING, NEW HEAVY-TAILED DISTRIBUTION AND THE STOCK MARKET RETURNS IN SOUTH KOREA 64 VOLATILITY CLUSTERING, NEW HEAVY-TAILED DISTRIBUTION AND THE STOCK MARKET RETURNS IN SOUTH KOREA Yoon Hong, PhD, Research Fellow Deparmen of Economics Hanyang Universiy, Souh Korea Ji-chul Lee, PhD,

More information

Market Models. Practitioner Course: Interest Rate Models. John Dodson. March 29, 2009

Market Models. Practitioner Course: Interest Rate Models. John Dodson. March 29, 2009 s Praciioner Course: Ineres Rae Models March 29, 2009 In order o value European-syle opions, we need o evaluae risk-neural expecaions of he form V (, T ) = E [D(, T ) H(T )] where T is he exercise dae,

More information

An Empirical Investigation of Trade Flows Between Australia and its Major Trading Partners

An Empirical Investigation of Trade Flows Between Australia and its Major Trading Partners Ausralasian Accouning, Business and Finance Journal Volume 8 Issue 5 Aricle 4 An Empirical Invesigaion of Trade Flows Beween Ausralia and is Major Trading Parners Samuel Belicka Vicoria Universiy, Ausralia,

More information

International Review of Business Research Papers Vol. 4 No.3 June 2008 Pp Understanding Cross-Sectional Stock Returns: What Really Matters?

International Review of Business Research Papers Vol. 4 No.3 June 2008 Pp Understanding Cross-Sectional Stock Returns: What Really Matters? Inernaional Review of Business Research Papers Vol. 4 No.3 June 2008 Pp.256-268 Undersanding Cross-Secional Sock Reurns: Wha Really Maers? Yong Wang We run a horse race among eigh proposed facors and eigh

More information

Documentation: Philadelphia Fed's Real-Time Data Set for Macroeconomists First-, Second-, and Third-Release Values

Documentation: Philadelphia Fed's Real-Time Data Set for Macroeconomists First-, Second-, and Third-Release Values Documenaion: Philadelphia Fed's Real-Time Daa Se for Macroeconomiss Firs-, Second-, and Third-Release Values Las Updaed: December 16, 2013 1. Inroducion We documen our compuaional mehods for consrucing

More information

CENTRO DE ESTUDIOS MONETARIOS Y FINANCIEROS T. J. KEHOE MACROECONOMICS I WINTER 2011 PROBLEM SET #6

CENTRO DE ESTUDIOS MONETARIOS Y FINANCIEROS T. J. KEHOE MACROECONOMICS I WINTER 2011 PROBLEM SET #6 CENTRO DE ESTUDIOS MONETARIOS Y FINANCIEROS T J KEHOE MACROECONOMICS I WINTER PROBLEM SET #6 This quesion requires you o apply he Hodrick-Presco filer o he ime series for macroeconomic variables for he

More information

Does Exchange Rate Risk Affect Exports Asymmetrically? Asian Evidence

Does Exchange Rate Risk Affect Exports Asymmetrically? Asian Evidence Universiy of Connecicu DigialCommons@UConn Economics Working Papers Deparmen of Economics March 005 Does Exchange Rae Risk Affec Expors Asymmerically? Asian Evidence WenShwo Fang Feng Chia Universiy YiHao

More information