Microeconometrics (PhD) Problem set 2: Dynamic Panel Data Solutions

Size: px
Start display at page:

Download "Microeconometrics (PhD) Problem set 2: Dynamic Panel Data Solutions"

Transcription

1 Microeconometrics (PhD) Problem set 2: Dynamic Panel Data Solutions QUESTION 1 Data for this exercise can be prepared by running the do-file called preparedo posted on my webpage This do-file collects the variables needed for the estimation from the 8 personal files of the European Community Household Panel (ECHP) and put them all together in a unique file named earnings_itdta This data file already contains the variables you need for the estimation: female, age, experience, years of schooling (edu), log of earnings (lny), a personal id number (npid) and the number of periods the person is in the sample with non-missing information on all necessary variables (N) a 2 η 2 ν Var (ln ) = σ + σ where the first term represent the permanent component of the y it variance and the second the temporary component b The output for this and the following sub-questions is produced using the do-file called PS2_q1_0708do Here, I compute the component of the total variance as: σ σ 2 ν 2 η = = 1 NT 1 N N N i= 1 T i= 1 t= 1 (ln y (ln y i it ln y) ln y ) 2 i 2 σ T 2 ν ******************************************************************************** ************************************************ *** ESTIMATE VARIANCE COMPONENTS *** ************************************************ use earnings_itdta, clear by npid: egen ybar_i=mean(lny) by npid: egen var_yi=sd(lny) keep if i==1 (14595 observations deleted) replace var_yi=var_yi^2 (2083 real changes made) egen var_v=mean(var_yi) replace var_v=var_v (0 real changes made)

2 egen var_ybar=sd(ybar) replace var_ybar=var_ybar^2 (2085 real changes made) g var_eta=var_ybar-(var_v/8) g sd_v=sqrt(var_v) g sd_eta=sqrt(var_eta) g ratio_eta=var_eta/(var_v+var_eta) g ratio_v=var_v/(var_v+var_eta) su sd_eta sd_v ratio_eta ratio_v Variable Obs Mean Std Dev Min Max sd_eta sd_v ratio_eta ratio_v ******************************************************************************** And now I prepare data for the Random Effect estimates In particular, you need to tsset your data and to do that you need a numeric id number (our npid is a string) I do get the same results ******************************************************************************** use earnings_itdta, clear destring npid, g(id) npid has all characters numeric; id generated as long tsset id wave panel variable: id (strongly balanced) time variable: wave, 1 to 8 xtreg lny, re Random-effects GLS regression Number of obs = Group variable (i): id Number of groups = 2085 R-sq: within = Obs per group: min = 8 between = avg = 80 overall = max = 8 Random effects u_i ~ Gaussian Wald chi2(0) = 000 corr(u_i, X) = 0 (assumed) Prob > chi2 = lny Coef Std Err z P> z [95% Conf Interval]

3 _cons sigma_u sigma_e rho (fraction of variance due to u_i) ******************************************************************************** c Now I add the covariates: ********************************************************************* **** add covariates **** xtreg lny female age agesq exp expsq edu, re Random-effects GLS regression Number of obs = Group variable (i): id Number of groups = 2085 R-sq: within = Obs per group: min = 8 between = avg = 80 overall = max = 8 Random effects u_i ~ Gaussian Wald chi2(6) = corr(u_i, X) = 0 (assumed) Prob > chi2 = lny Coef Std Err z P> z [95% Conf Interval] female age agesq exp expsq edu _cons sigma_u sigma_e rho (fraction of variance due to u_i) *******************************************************************************

4 QUESTION 2 The output for this question is produced using the file PS2_q2_0708do First of all, I prepare and clean the original data according to the indication of the text of the problem **************************************************************************** ************************************************ ********** CLEAN AND PREPARE DATA ********** ************************************************ use abdatadta, clear keep if year>=1977&year<=1982 (193 observations deleted) sort id year egen smpl=rowmiss(id year n w k ys) drop if smpl>0 (0 observations deleted) by id: g N=_N keep if N==6 (10 observations deleted) egen wave=group(year) keep id year wave n w k ys order id year wave n w k ys sort id wave save abdatanewdta, replace **************************************************************************** a Now, run the two models: **************************************************************************** tsset id wave panel variable: id (strongly balanced) time variable: wave, 1 to 6 *RUN THE HAUSMAN TEST USING STATA'S ROUTINE xtreg n w k ys, re

5 Random-effects GLS regression Number of obs = 828 Group variable (i): id Number of groups = 138 R-sq: within = Obs per group: min = 6 between = avg = 60 overall = max = 6 Random effects u_i ~ Gaussian Wald chi2(3) = corr(u_i, X) = 0 (assumed) Prob > chi2 = n Coef Std Err z P> z [95% Conf Interval] w k ys _cons sigma_u sigma_e rho (fraction of variance due to u_i) est store random xtreg n w k ys, fe Fixed-effects (within) regression Number of obs = 828 Group variable (i): id Number of groups = 138 R-sq: within = Obs per group: min = 6 between = avg = 60 overall = max = 6 F(3,687) = corr(u_i, Xb) = Prob > F = n Coef Std Err t P> t [95% Conf Interval] w k ys _cons sigma_u sigma_e rho (fraction of variance due to u_i) F test that all u_i=0: F(137, 687) = Prob > F = est store fixed **************************************************************************** b And perform the Hausman test using Stata s routine (pay attention to the order in which you call the estimators in Hausman First the consistent, then the efficient) **************************************************************************** ********************

6 *** HAUSMAN TEST *** ******************** ---- Coefficients ---- (b) (B) (b-b) sqrt(diag(v_b-v_b)) fixed random Difference SE w k ys b = consistent under Ho and Ha; obtained from xtreg B = inconsistent under Ha, efficient under Ho; obtained from xtreg Test: Ho: difference in coefficients not systematic chi2(3) = (b-b)'[(v_b-v_b)^(-1)](b-b) = 7380 Prob>chi2 = (V_b-V_B is not positive definite) ********************************************************************* You might get a message like the one here at the bottom that warns you that the matrix V_b-V_B is not positive definite This may occur occasionally since Hausman uses two different estimates of σ ν for the computation of V_b and V_B (namely the estimates obtained from the fixed- and the random-effects models respectively) This means that, although asymptotically they converge to the same true value, they can differ in small samples and lead to a non-positive V_b-V_B You can solve the problem by forcing Hausman to use the same estimate of σ ν for both variancecovariance matrices (use the option sigmaless or sigmamore for this) To know more, look up in the manuals the description of how xtreg computes the variance components under the different models Also, take a look at this user discussion about this topic: You can replicate results by saving the estimated coefficients and variance-covariance matrices of the two models and computing the test manually ********************************************************************* *REDO THE TEST MANUALLY est restore random (results random are active now) matrix RE=e(b)' matrix RE=RE[13,] matrix Vre=e(V) matrix Vre=Vre[13,13] est restore fixed (results fixed are active now)

7 est store WG matrix WG=e(b)' matrix WG=WG[13,] matrix Vwg=e(V) matrix Vwg=Vwg[13,13] matrix h1=(re-wg)'*inv(vwg-vre)*(re-wg) matrix list h1 symmetric h1[1,1] y1 y ********************************************************************* c What happens if we use the alternative version? This we can only do manually ********************************************************************* * TRY OTHER VERSION OF THE TEST xtreg n w k ys, be Between regression (regression on group means) Number of obs = 828 Group variable (i): id Number of groups = 138 R-sq: within = Obs per group: min = 6 between = avg = 60 overall = max = 6 F(3,134) = sd(u_i + avg(e_i))= Prob > F = n Coef Std Err t P> t [95% Conf Interval] w k ys _cons matrix BG=e(b)' matrix BG=BG[13,] matrix Vbg=e(V) matrix Vbg=Vbg[13,13] matrix h2=(bg-wg)'*inv(vwg+vbg)*(bg-wg) matrix list h2

8 symmetric h2[1,1] y1 y ********************************************************************* We get a different result (although the two statistics are asymptotically identical) because the identity proved by Hausman & Taylor (1981) in Econometrica is valid asymptotically In small samples the two tests can differ because of the same problem discussed above (the different estimates of σ ν ) In fact, if you force Hausman to use the estimate of σ ν from the fixed-effect model, you get the same result: ********************************************************************* hausman fixed random, sigmaless ---- Coefficients ---- (b) (B) (b-b) sqrt(diag(v_b-v_b)) fixed random Difference SE w k ys b = consistent under Ho and Ha; obtained from xtreg B = inconsistent under Ha, efficient under Ho; obtained from xtreg Test: Ho: difference in coefficients not systematic chi2(3) = (b-b)'[(v_b-v_b)^(-1)](b-b) = 6640 Prob>chi2 = ********************************************************************* For your curiosity, you can construct these tests manually also using Stata s matrix language Mata Here is how to do it (only the alternative version of the test is computed here): ********************************************************************* ******* REDO THIS LAST TEST WITH MATA mata mata (type end to exit) : : BG=st_matrix("BG") : Vbg=st_matrix("Vbg") : WG=st_matrix("WG") : Vwg=st_matrix("Vwg") : : (BG-WG)'*invsym(Vwg+Vbg)*(BG-WG)

9 : : end -- *********************************************************************

10 QUESTION 3 First of all, to make sure you have all the software pieces needed, you may want to update your Stata and download the necessary user-written files: ********************************************************************* (output omitted) update all search xtabond2, all net install xtabond2pkg, replace search ivreg2, all net sj 5-4 st0030_2 net install st0030_2pkg, replace ********************************************************************* a Select only the first three years of data and run difference GMM using xtabond2 ********************************************************************* use abdatanew, clear keep if wave<=3 (414 observations deleted) tsset id wave panel variable: id (strongly balanced) time variable: wave, 1 to 3 * once the data have been tsset we can use the lag (l) and the difference (d) operators ****** * 1 DIFFERENCE GMM WITH T=3 ***** xtabond2 n ln, gmm(ln) noleveleq Favoring space over speed To switch, type or click on mata: mata set matafavor speed, perm Dynamic panel-data estimation, one-step difference GMM Group variable: id Number of obs = 138 Time variable : wave Number of groups = 138 Number of instruments = 1 Obs per group: min = 1 Wald chi2(1) = 001 avg = 100 Prob > chi2 = 0940 max = 1 n Coef Std Err z P> z [95% Conf Interval] n

11 L Arellano-Bond test for AR(1) in first differences: z = Pr > z = Arellano-Bond test for AR(2) in first differences: z = Pr > z = Sargan test of overid restrictions: chi2(0) = 000 Prob > chi2 = (Not robust, but not weakened by many instruments) ********************************************************************* The model in first differences has only one observation per firm so there is no test for autocorrelation in the disturbances (either first or second order) Moreover, there is only one instrument so there is no test for over-identifying restrictions The syntax of xtabond is slightly different The same model can be obtained as follows: ********************************************************************* xtabond n, noc note: the residuals and the L(1) residuals have no obs in common The AR(1) is trivially zero note: the residuals and the L(2) residuals have no obs in common The AR(2) is trivially zero Arellano-Bond dynamic panel-data estimation Number of obs = 138 Group variable (i): id Number of groups = 138 Wald chi2() = Time variable (t): wave Obs per group: min = 1 avg = 1 max = 1 One-step results Dn Coef Std Err z P> z [95% Conf Interval] n LD Sargan test of over-identifying restrictions: chi2(0) = 000 Prob > chi2 = Arellano-Bond test that average autocovariance in residuals of order 1 is 0: H0: no autocorrelation z = Pr > z = Arellano-Bond test that average autocovariance in residuals of order 2 is 0: H0: no autocorrelation z = Pr > z = ********************************************************************* The point estimates are identical but the standard errors are slightly different because xtabond reports by default the small-sample version of the estimators variances (indeed, you can force xtabond2 to use small sample adjustments wit the small option) b The same results can also be replicated with simple ivreg by taking the model in first-differences and instrumenting the lagged difference with the dependent variable lagged twice

12 ********************************************************************* ivreg2 dn (ldn=l2n), noc Instrumental variables (2SLS) regression Number of obs = 138 F( 1, 137) = 001 Prob > F = Total (centered) SS = Centered R2 = Total (uncentered) SS = Uncentered R2 = Residual SS = Root MSE = 0789 Dn Coef Std Err z P> z [95% Conf Interval] n LD Anderson canon corr LR statistic (identification/iv relevance test): 3343 Chi-sq(1) P-val = Sargan statistic (overidentification test of all instruments): 0000 (equation exactly identified) Instrumented: LDn Excluded instruments: L2n ********************************************************************* c Now, repeat difference GMM with all available time periods Below I do it both with xtabond and xtabond2 ********************************************************************* use abdatanew, clear xtabond2 n ln, gmm(ln) noleveleq Favoring space over speed To switch, type or click on mata: mata set matafavor speed, perm Dynamic panel-data estimation, one-step difference GMM Group variable: id Number of obs = 552 Time variable : wave Number of groups = 138 Number of instruments = 10 Obs per group: min = 4 Wald chi2(1) = avg = 400 Prob > chi2 = 0000 max = 4 n Coef Std Err z P> z [95% Conf Interval] n L Arellano-Bond test for AR(1) in first differences: z = -483 Pr > z = 0000 Arellano-Bond test for AR(2) in first differences: z = -275 Pr > z = 0006 Sargan test of overid restrictions: chi2(9) = Prob > chi2 = 0000

13 (Not robust, but not weakened by many instruments) xtabond n, noc Arellano-Bond dynamic panel-data estimation Number of obs = 552 Group variable (i): id Number of groups = 138 Wald chi2() = Time variable (t): wave Obs per group: min = 4 avg = 4 max = 4 One-step results Dn Coef Std Err z P> z [95% Conf Interval] n LD Sargan test of over-identifying restrictions: chi2(9) = Prob > chi2 = Arellano-Bond test that average autocovariance in residuals of order 1 is 0: H0: no autocorrelation z = -483 Pr > z = Arellano-Bond test that average autocovariance in residuals of order 2 is 0: H0: no autocorrelation z = -275 Pr > z = ********************************************************************* The instruments in levels (for the model in differences) that we are using now require the errors to be uncorrelated over time within individuals If there is some autocorrelation (as the tests suggests there is on average ) then we should drop the instruments that are too close (for example, start using the level at the second or third lag) The cost of dropping the closest instruments, however, is that these are the strongest one in terms of predictive power for the endogenous variable Recall that, if we had some strictly exogenous or pre-determined variables, then we could use them as instruments for the endogenous lagged dependent variable These conditions do not require the errors to be uncorrelated over time d With ivreg we cannot reproduce the same estimates Let s first do the best we can with ivreg It is important to be careful in how we construct the matrix of instruments: ********************************************************************* use abdatanew, clear tsset id wave panel variable: id (strongly balanced) time variable: wave, 1 to 6 forvalues yr=2/6 { 2 local m=`yr'-1 3 forvalues lag=2/`m' { 4 quietly generate z`yr'l`lag'=l`lag'n if wave==`yr' 5 }

14 6 } quietly recode z* (=0) g d_n=dn (138 missing values generated) g dl_n=dln (276 missing values generated) order id wave n d_n dl_n z* ivreg2 dn (ldn=z*), noc Instrumental variables (2SLS) regression Number of obs = 552 F( 1, 551) = 5304 Prob > F = Total (centered) SS = Centered R2 = Total (uncentered) SS = Uncentered R2 = Residual SS = Root MSE = 1405 Dn Coef Std Err z P> z [95% Conf Interval] n LD Anderson canon corr LR statistic (identification/iv relevance test): Chi-sq(10) P-val = Sargan statistic (overidentification test of all instruments): Chi-sq(9) P-val = Instrumented: LDn Excluded instruments: z3l2 z4l2 z4l3 z5l2 z5l3 z5l4 z6l2 z6l3 z6l4 z6l5 ********************************************************************* These estimates are different from the ones produced by xtabond2 because in this second case Stata performs efficient GMM, that is it uses the sample variancecovariance matrix of the moment conditions as a weighting matrix This is the only true difference, which means that the ivreg and the xtabond2 estimates are asymptotically indistinguishable To check this, we can force xtabond2 to assume homoskedasticity of the error terms and thus produce the same results as ivreg The xtabond2 option that controls the weighting matrix is h( ) ********************************************************************* xtabond2 n ln, gmm(ln) noleveleq h(1) Favoring space over speed To switch, type or click on mata: mata set matafavor speed, perm Dynamic panel-data estimation, one-step difference GMM Group variable: id Number of obs = 552

15 Time variable : wave Number of groups = 138 Number of instruments = 10 Obs per group: min = 4 Wald chi2(1) = 5314 avg = 400 Prob > chi2 = 0000 max = 4 n Coef Std Err z P> z [95% Conf Interval] n L Arellano-Bond test for AR(1) in first differences: z = -196 Pr > z = 0050 Arellano-Bond test for AR(2) in first differences: z = -211 Pr > z = 0035 Sargan test of overid restrictions: chi2(9) = 5920 Prob > chi2 = 0000 (Not robust, but not weakened by many instruments) ********************************************************************* e System GMM is only available with xtabond2 Here is how it can be produced (it is actually the default in xtabond2) ********************************************************************* use abdatanew, clear xtabond2 n ln, gmm(ln) noc Favoring space over speed To switch, type or click on mata: mata set matafavor speed, perm Dynamic panel-data estimation, one-step system GMM Group variable: id Number of obs = 690 Time variable : wave Number of groups = 138 Number of instruments = 14 Obs per group: min = 5 Wald chi2(1) = avg = 500 Prob > chi2 = 0000 max = 5 n Coef Std Err z P> z [95% Conf Interval] n L Arellano-Bond test for AR(1) in first differences: z = -672 Pr > z = 0000 Arellano-Bond test for AR(2) in first differences: z = -261 Pr > z = 0009 Sargan test of overid restrictions: chi2(13) = Prob > chi2 = 0000 (Not robust, but not weakened by many instruments) Difference-in-Sargan tests of exogeneity of instrument subsets: GMM instruments for levels Sargan test excluding group: chi2(9) = Prob > chi2 = 0000 Difference (null H = exogenous): chi2(4) = Prob > chi2 = 0000 ********************************************************************* f As in question d), we cannot replicate the results with ivreg ********************************************************************* g model="diff"

16 g lhs=dn (138 missing values generated) g rhs=ldn (276 missing values generated) order model id wave n d_n lhs rhs z* keep if wave>2 (276 observations deleted) keep model id wave n d_n lhs rhs z* sort id wave save dmodeldta, replace file dmodeldta saved use abdatanewdta, clear forvalues yr=2/6 { 2 local m=`yr'-2 3 forvalues lag=0/`m' { 4 quietly generate Dz`yr'L`lag'=l`lag'd1n if wave==`yr' 5 } 6 } quietly recode Dz* (=0) keep id wave n Dz* g lhs=n g rhs=llhs (138 missing values generated) g model="level" g d_n=dn (138 missing values generated) order model id wave n d_n lhs rhs Dz* keep if wave>1 (138 observations deleted) append using dmodeldta keep id wave n d_n lhs rhs z* Dz* model order model id wave n d_n lhs rhs z* Dz* sort model id wave quietly recode z* Dz* (=0)

17 ivreg2 lhs (rhs=z* Dz*L1), noc Instrumental variables (2SLS) regression Number of obs = 1242 F( 1, 1241) = Prob > F = Total (centered) SS = Centered R2 = Total (uncentered) SS = Uncentered R2 = Residual SS = Root MSE = 2016 lhs Coef Std Err z P> z [95% Conf Interval] rhs Anderson canon corr LR statistic (identification/iv relevance test): Chi-sq(14) P-val = Sargan statistic (overidentification test of all instruments): Chi-sq(13) P-val = Instrumented: rhs Excluded instruments: z3l2 z4l2 z4l3 z5l2 z5l3 z5l4 z6l2 z6l3 z6l4 z6l5 Dz3L1 Dz4L1 Dz5L1 Dz6L1 ********************************************************************* but we can force xtabond2 to assume homoskedasticity: ********************************************************************* use abdatanewdta, clear xtabond2 n ln, gmm(ln) h(1) noc Favoring space over speed To switch, type or click on mata: mata set matafavor speed, perm Dynamic panel-data estimation, one-step system GMM Group variable: id Number of obs = 690 Time variable : wave Number of groups = 138 Number of instruments = 14 Obs per group: min = 5 Wald chi2(1) = avg = 500 Prob > chi2 = 0000 max = 5 n Coef Std Err z P> z [95% Conf Interval] n L Arellano-Bond test for AR(1) in first differences: z = -354 Pr > z = 0000 Arellano-Bond test for AR(2) in first differences: z = -147 Pr > z = 0143 Sargan test of overid restrictions: chi2(13) = 4874 Prob > chi2 = 0000 (Not robust, but not weakened by many instruments) Difference-in-Sargan tests of exogeneity of instrument subsets: GMM instruments for levels Sargan test excluding group: chi2(9) = 2092 Prob > chi2 = 0013

18 Difference (null H = exogenous): chi2(4) = 2782 Prob > chi2 = 0000 ********************************************************************* then, we get the same point estimates Not the same standard errors, though In fact, in this particular case, even under homoskedasticity the correct variancecovariance matrix of the iv model would not be a simple identity matrix because the equations in levels and in difference are obviously correlated

Problem Set 10: Panel Data

Problem Set 10: Panel Data Problem Set 10: Panel Data 1. Read in the data set, e11panel1.dta from the course website. This contains data on a sample or 1252 men and women who were asked about their hourly wage in two years, 2005

More information

4 Instrumental Variables Single endogenous variable One continuous instrument. 2

4 Instrumental Variables Single endogenous variable One continuous instrument. 2 Econ 495 - Econometric Review 1 Contents 4 Instrumental Variables 2 4.1 Single endogenous variable One continuous instrument. 2 4.2 Single endogenous variable more than one continuous instrument..........................

More information

4 Instrumental Variables Single endogenous variable One continuous instrument. 2

4 Instrumental Variables Single endogenous variable One continuous instrument. 2 Econ 495 - Econometric Review 1 Contents 4 Instrumental Variables 2 4.1 Single endogenous variable One continuous instrument. 2 4.2 Single endogenous variable more than one continuous instrument..........................

More information

Fixed and Random Effects Models: Vartanian, SW 683

Fixed and Random Effects Models: Vartanian, SW 683 : Vartanian, SW 683 Fixed and random effects models See: http://teaching.sociology.ul.ie/dcw/confront/node45.html When you have repeated observations per individual this is a problem and an advantage:

More information

Econometrics. 8) Instrumental variables

Econometrics. 8) Instrumental variables 30C00200 Econometrics 8) Instrumental variables Timo Kuosmanen Professor, Ph.D. http://nomepre.net/index.php/timokuosmanen Today s topics Thery of IV regression Overidentification Two-stage least squates

More information

point estimates, standard errors, testing, and inference for nonlinear combinations

point estimates, standard errors, testing, and inference for nonlinear combinations Title xtreg postestimation Postestimation tools for xtreg Description The following postestimation commands are of special interest after xtreg: command description xttest0 Breusch and Pagan LM test for

More information

Maria Elena Bontempi Roberto Golinelli this version: 5 September 2007

Maria Elena Bontempi Roberto Golinelli this version: 5 September 2007 INSTRUMENTAL VARIABLES (IV) ESTIMATION A Maria Elena Bontempi e.bontempi@economia.unife.it Roberto Golinelli roberto.golinelli@unibo.it this version: 5 September 2007 1. The instrumental variables approach

More information

Dynamic Panels. Chapter Introduction Autoregressive Model

Dynamic Panels. Chapter Introduction Autoregressive Model Chapter 11 Dynamic Panels This chapter covers the econometrics methods to estimate dynamic panel data models, and presents examples in Stata to illustrate the use of these procedures. The topics in this

More information

Эконометрика, , 4 модуль Семинар Для Группы Э_Б2015_Э_3 Семинарист О.А.Демидова

Эконометрика, , 4 модуль Семинар Для Группы Э_Б2015_Э_3 Семинарист О.А.Демидова Эконометрика, 2017-2018, 4 модуль Семинар 3 160418 Для Группы Э_Б2015_Э_3 Семинарист ОАДемидова * Stata program * copyright C 2010 by A Colin Cameron and Pravin K Trivedi * used for "Microeconometrics

More information

1

1 i 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 Foreign Liabilities/ Dependen Variabel Rasio Foreign Liabilities Total Debt (1) (2) Konstanta 0.216*** 0.219*** Ekspor/Total Sales -0.064-0.055

More information

****Lab 4, Feb 4: EDA and OLS and WLS

****Lab 4, Feb 4: EDA and OLS and WLS ****Lab 4, Feb 4: EDA and OLS and WLS ------- log: C:\Documents and Settings\Default\Desktop\LDA\Data\cows_Lab4.log log type: text opened on: 4 Feb 2004, 09:26:19. use use "Z:\LDA\DataLDA\cowsP.dta", clear.

More information

xtdpdqml: Quasi-maximum likelihood estimation of linear dynamic short-t panel data models

xtdpdqml: Quasi-maximum likelihood estimation of linear dynamic short-t panel data models xtdpdqml: Quasi-maximum likelihood estimation of linear dynamic short-t panel data models Sebastian Kripfganz University of Exeter Business School, Department of Economics, Exeter, UK UK Stata Users Group

More information

Handout 12. Endogeneity & Simultaneous Equation Models

Handout 12. Endogeneity & Simultaneous Equation Models Handout 12. Endogeneity & Simultaneous Equation Models In which you learn about another potential source of endogeneity caused by the simultaneous determination of economic variables, and learn how to

More information

Dynamic Panel Data estimators

Dynamic Panel Data estimators Dynamic Panel Data estimators Christopher F Baum EC 823: Applied Econometrics Boston College, Spring 2014 Christopher F Baum (BC / DIW) Dynamic Panel Data estimators Boston College, Spring 2014 1 / 50

More information

Please discuss each of the 3 problems on a separate sheet of paper, not just on a separate page!

Please discuss each of the 3 problems on a separate sheet of paper, not just on a separate page! Econometrics - Exam May 11, 2011 1 Exam Please discuss each of the 3 problems on a separate sheet of paper, not just on a separate page! Problem 1: (15 points) A researcher has data for the year 2000 from

More information

Fortin Econ Econometric Review 1. 1 Panel Data Methods Fixed Effects Dummy Variables Regression... 7

Fortin Econ Econometric Review 1. 1 Panel Data Methods Fixed Effects Dummy Variables Regression... 7 Fortin Econ 495 - Econometric Review 1 Contents 1 Panel Data Methods 2 1.1 Fixed Effects......................... 2 1.1.1 Dummy Variables Regression............ 7 1.1.2 First Differencing Methods.............

More information

Lecture 3 Linear random intercept models

Lecture 3 Linear random intercept models Lecture 3 Linear random intercept models Example: Weight of Guinea Pigs Body weights of 48 pigs in 9 successive weeks of follow-up (Table 3.1 DLZ) The response is measures at n different times, or under

More information

Quantitative Methods Final Exam (2017/1)

Quantitative Methods Final Exam (2017/1) Quantitative Methods Final Exam (2017/1) 1. Please write down your name and student ID number. 2. Calculator is allowed during the exam, but DO NOT use a smartphone. 3. List your answers (together with

More information

Applied Econometrics. Lecture 3: Introduction to Linear Panel Data Models

Applied Econometrics. Lecture 3: Introduction to Linear Panel Data Models Applied Econometrics Lecture 3: Introduction to Linear Panel Data Models Måns Söderbom 4 September 2009 Department of Economics, Universy of Gothenburg. Email: mans.soderbom@economics.gu.se. Web: www.economics.gu.se/soderbom,

More information

Description Quick start Menu Syntax Options Remarks and examples Stored results Methods and formulas Acknowledgment References Also see

Description Quick start Menu Syntax Options Remarks and examples Stored results Methods and formulas Acknowledgment References Also see Title stata.com hausman Hausman specification test Description Quick start Menu Syntax Options Remarks and examples Stored results Methods and formulas Acknowledgment References Also see Description hausman

More information

Dynamic Panel Data Models

Dynamic Panel Data Models Models Amjad Naveed, Nora Prean, Alexander Rabas 15th June 2011 Motivation Many economic issues are dynamic by nature. These dynamic relationships are characterized by the presence of a lagged dependent

More information

IV and IV-GMM. Christopher F Baum. EC 823: Applied Econometrics. Boston College, Spring 2014

IV and IV-GMM. Christopher F Baum. EC 823: Applied Econometrics. Boston College, Spring 2014 IV and IV-GMM Christopher F Baum EC 823: Applied Econometrics Boston College, Spring 2014 Christopher F Baum (BC / DIW) IV and IV-GMM Boston College, Spring 2014 1 / 1 Instrumental variables estimators

More information

Exercices for Applied Econometrics A

Exercices for Applied Econometrics A QEM F. Gardes-C. Starzec-M.A. Diaye Exercices for Applied Econometrics A I. Exercice: The panel of households expenditures in Poland, for years 1997 to 2000, gives the following statistics for the whole

More information

Simultaneous Equations with Error Components. Mike Bronner Marko Ledic Anja Breitwieser

Simultaneous Equations with Error Components. Mike Bronner Marko Ledic Anja Breitwieser Simultaneous Equations with Error Components Mike Bronner Marko Ledic Anja Breitwieser PRESENTATION OUTLINE Part I: - Simultaneous equation models: overview - Empirical example Part II: - Hausman and Taylor

More information

Econometrics Homework 4 Solutions

Econometrics Homework 4 Solutions Econometrics Homework 4 Solutions Computer Question (Optional, no need to hand in) (a) c i may capture some state-specific factor that contributes to higher or low rate of accident or fatality. For example,

More information

Warwick Economics Summer School Topics in Microeconometrics Instrumental Variables Estimation

Warwick Economics Summer School Topics in Microeconometrics Instrumental Variables Estimation Warwick Economics Summer School Topics in Microeconometrics Instrumental Variables Estimation Michele Aquaro University of Warwick This version: July 21, 2016 1 / 31 Reading material Textbook: Introductory

More information

Monday 7 th Febraury 2005

Monday 7 th Febraury 2005 Monday 7 th Febraury 2 Analysis of Pigs data Data: Body weights of 48 pigs at 9 successive follow-up visits. This is an equally spaced data. It is always a good habit to reshape the data, so we can easily

More information

1 The basics of panel data

1 The basics of panel data Introductory Applied Econometrics EEP/IAS 118 Spring 2015 Related materials: Steven Buck Notes to accompany fixed effects material 4-16-14 ˆ Wooldridge 5e, Ch. 1.3: The Structure of Economic Data ˆ Wooldridge

More information

Practice 2SLS with Artificial Data Part 1

Practice 2SLS with Artificial Data Part 1 Practice 2SLS with Artificial Data Part 1 Yona Rubinstein July 2016 Yona Rubinstein (LSE) Practice 2SLS with Artificial Data Part 1 07/16 1 / 16 Practice with Artificial Data In this note we use artificial

More information

Outline. Linear OLS Models vs: Linear Marginal Models Linear Conditional Models. Random Intercepts Random Intercepts & Slopes

Outline. Linear OLS Models vs: Linear Marginal Models Linear Conditional Models. Random Intercepts Random Intercepts & Slopes Lecture 2.1 Basic Linear LDA 1 Outline Linear OLS Models vs: Linear Marginal Models Linear Conditional Models Random Intercepts Random Intercepts & Slopes Cond l & Marginal Connections Empirical Bayes

More information

Problem Set 5 ANSWERS

Problem Set 5 ANSWERS Economics 20 Problem Set 5 ANSWERS Prof. Patricia M. Anderson 1, 2 and 3 Suppose that Vermont has passed a law requiring employers to provide 6 months of paid maternity leave. You are concerned that women

More information

Reply to Manovskii s Discussion on The Limited Macroeconomic Effects of Unemployment Benefit Extensions

Reply to Manovskii s Discussion on The Limited Macroeconomic Effects of Unemployment Benefit Extensions Reply to Manovskii s Discussion on The Limited Macroeconomic Effects of Unemployment Benefit Extensions Gabriel Chodorow-Reich Harvard University and NBER Loukas Karabarbounis University of Minnesota and

More information

Instrumental Variables, Simultaneous and Systems of Equations

Instrumental Variables, Simultaneous and Systems of Equations Chapter 6 Instrumental Variables, Simultaneous and Systems of Equations 61 Instrumental variables In the linear regression model y i = x iβ + ε i (61) we have been assuming that bf x i and ε i are uncorrelated

More information

Jeffrey M. Wooldridge Michigan State University

Jeffrey M. Wooldridge Michigan State University Fractional Response Models with Endogenous Explanatory Variables and Heterogeneity Jeffrey M. Wooldridge Michigan State University 1. Introduction 2. Fractional Probit with Heteroskedasticity 3. Fractional

More information

M.E. Bontempi R. Golinelli 29 August 2006

M.E. Bontempi R. Golinelli 29 August 2006 DYNAMIC MODELS FOR PANEL DATA: APPLICATION IN STATA A M.E. Bontempi e.bontempi@economia.unife.it R. Golinelli golinell@spbo.unibo.it 9 August 006. Introduction.... The data-set...3 3. Model estimates...5

More information

CRE METHODS FOR UNBALANCED PANELS Correlated Random Effects Panel Data Models IZA Summer School in Labor Economics May 13-19, 2013 Jeffrey M.

CRE METHODS FOR UNBALANCED PANELS Correlated Random Effects Panel Data Models IZA Summer School in Labor Economics May 13-19, 2013 Jeffrey M. CRE METHODS FOR UNBALANCED PANELS Correlated Random Effects Panel Data Models IZA Summer School in Labor Economics May 13-19, 2013 Jeffrey M. Wooldridge Michigan State University 1. Introduction 2. Linear

More information

Econ 836 Final Exam. 2 w N 2 u N 2. 2 v N

Econ 836 Final Exam. 2 w N 2 u N 2. 2 v N 1) [4 points] Let Econ 836 Final Exam Y Xβ+ ε, X w+ u, w N w~ N(, σi ), u N u~ N(, σi ), ε N ε~ Nu ( γσ, I ), where X is a just one column. Let denote the OLS estimator, and define residuals e as e Y X.

More information

Exam ECON3150/4150: Introductory Econometrics. 18 May 2016; 09:00h-12.00h.

Exam ECON3150/4150: Introductory Econometrics. 18 May 2016; 09:00h-12.00h. Exam ECON3150/4150: Introductory Econometrics. 18 May 2016; 09:00h-12.00h. This is an open book examination where all printed and written resources, in addition to a calculator, are allowed. If you are

More information

Lecture#12. Instrumental variables regression Causal parameters III

Lecture#12. Instrumental variables regression Causal parameters III Lecture#12 Instrumental variables regression Causal parameters III 1 Demand experiment, market data analysis & simultaneous causality 2 Simultaneous causality Your task is to estimate the demand function

More information

Dynamic Panel Data Models

Dynamic Panel Data Models June 23, 2010 Contents Motivation 1 Motivation 2 Basic set-up Problem Solution 3 4 5 Literature Motivation Many economic issues are dynamic by nature and use the panel data structure to understand adjustment.

More information

GMM Estimation in Stata

GMM Estimation in Stata GMM Estimation in Stata Econometrics I Department of Economics Universidad Carlos III de Madrid Master in Industrial Economics and Markets 1 Outline Motivation 1 Motivation 2 3 4 2 Motivation 3 Stata and

More information

Empirical Application of Panel Data Regression

Empirical Application of Panel Data Regression Empirical Application of Panel Data Regression 1. We use Fatality data, and we are interested in whether rising beer tax rate can help lower traffic death. So the dependent variable is traffic death, while

More information

Instrumental Variables Estimation in Stata

Instrumental Variables Estimation in Stata Christopher F Baum 1 Faculty Micro Resource Center Boston College March 2007 1 Thanks to Austin Nichols for the use of his material on weak instruments and Mark Schaffer for helpful comments. The standard

More information

ECON2228 Notes 10. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 48

ECON2228 Notes 10. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 48 ECON2228 Notes 10 Christopher F Baum Boston College Economics 2014 2015 cfb (BC Econ) ECON2228 Notes 10 2014 2015 1 / 48 Serial correlation and heteroskedasticity in time series regressions Chapter 12:

More information

Measurement Error. Often a data set will contain imperfect measures of the data we would ideally like.

Measurement Error. Often a data set will contain imperfect measures of the data we would ideally like. Measurement Error Often a data set will contain imperfect measures of the data we would ideally like. Aggregate Data: (GDP, Consumption, Investment are only best guesses of theoretical counterparts and

More information

Final Exam. 1. Definitions: Briefly Define each of the following terms as they relate to the material covered in class.

Final Exam. 1. Definitions: Briefly Define each of the following terms as they relate to the material covered in class. Name Answer Key Economics 170 Spring 2003 Honor pledge: I have neither given nor received aid on this exam including the preparation of my one page formula list and the preparation of the Stata assignment

More information

Econometrics for PhDs

Econometrics for PhDs Econometrics for PhDs Amine Ouazad April 2012, Final Assessment - Answer Key 1 Questions with a require some Stata in the answer. Other questions do not. 1 Ordinary Least Squares: Equality of Estimates

More information

ERSA Training Workshop Lecture 5: Estimation of Binary Choice Models with Panel Data

ERSA Training Workshop Lecture 5: Estimation of Binary Choice Models with Panel Data ERSA Training Workshop Lecture 5: Estimation of Binary Choice Models with Panel Data Måns Söderbom Friday 16 January 2009 1 Introduction The methods discussed thus far in the course are well suited for

More information

Confidence intervals for the variance component of random-effects linear models

Confidence intervals for the variance component of random-effects linear models The Stata Journal (2004) 4, Number 4, pp. 429 435 Confidence intervals for the variance component of random-effects linear models Matteo Bottai Arnold School of Public Health University of South Carolina

More information

Problem set - Selection and Diff-in-Diff

Problem set - Selection and Diff-in-Diff Problem set - Selection and Diff-in-Diff 1. You want to model the wage equation for women You consider estimating the model: ln wage = α + β 1 educ + β 2 exper + β 3 exper 2 + ɛ (1) Read the data into

More information

Generalized method of moments estimation in Stata 11

Generalized method of moments estimation in Stata 11 Generalized method of moments estimation in Stata 11 David M. Drukker StataCorp Stata Conference Washington, DC 2009 1 / 27 Outline 1 A quick introduction to GMM 2 gmm examples Ordinary least squares Two-stage

More information

n Coef. Std. Err. t P> t [95% Conf. Interval]

n Coef. Std. Err. t P> t [95% Conf. Interval] log: /Users/baum/doc/Courses 2007-2008/EC77101S/771dpd.smcl log type: smcl opeed o: 16 Apr 2008, 13:48:51. * 771 DPD. use http://.stata-press.com/data/r7/abdata.dta,clear. xtabod2 l. l(0/1).( ) yr1980-yr1984,

More information

Lecture 8 Panel Data

Lecture 8 Panel Data Lecture 8 Panel Data Economics 8379 George Washington University Instructor: Prof. Ben Williams Introduction This lecture will discuss some common panel data methods and problems. Random effects vs. fixed

More information

Final Exam. Question 1 (20 points) 2 (25 points) 3 (30 points) 4 (25 points) 5 (10 points) 6 (40 points) Total (150 points) Bonus question (10)

Final Exam. Question 1 (20 points) 2 (25 points) 3 (30 points) 4 (25 points) 5 (10 points) 6 (40 points) Total (150 points) Bonus question (10) Name Economics 170 Spring 2004 Honor pledge: I have neither given nor received aid on this exam including the preparation of my one page formula list and the preparation of the Stata assignment for the

More information

Econometrics of Panel Data

Econometrics of Panel Data Econometrics of Panel Data Jakub Mućk Meeting # 6 Jakub Mućk Econometrics of Panel Data Meeting # 6 1 / 36 Outline 1 The First-Difference (FD) estimator 2 Dynamic panel data models 3 The Anderson and Hsiao

More information

Econometrics. 9) Heteroscedasticity and autocorrelation

Econometrics. 9) Heteroscedasticity and autocorrelation 30C00200 Econometrics 9) Heteroscedasticity and autocorrelation Timo Kuosmanen Professor, Ph.D. http://nomepre.net/index.php/timokuosmanen Today s topics Heteroscedasticity Possible causes Testing for

More information

ECON Introductory Econometrics. Lecture 16: Instrumental variables

ECON Introductory Econometrics. Lecture 16: Instrumental variables ECON4150 - Introductory Econometrics Lecture 16: Instrumental variables Monique de Haan (moniqued@econ.uio.no) Stock and Watson Chapter 12 Lecture outline 2 OLS assumptions and when they are violated Instrumental

More information

Panel Data: Very Brief Overview Richard Williams, University of Notre Dame, https://www3.nd.edu/~rwilliam/ Last revised April 6, 2015

Panel Data: Very Brief Overview Richard Williams, University of Notre Dame, https://www3.nd.edu/~rwilliam/ Last revised April 6, 2015 Panel Data: Very Brief Overview Richard Williams, University of Notre Dame, https://www3.nd.edu/~rwilliam/ Last revised April 6, 2015 These notes borrow very heavily, often verbatim, from Paul Allison

More information

10) Time series econometrics

10) Time series econometrics 30C00200 Econometrics 10) Time series econometrics Timo Kuosmanen Professor, Ph.D. 1 Topics today Static vs. dynamic time series model Suprious regression Stationary and nonstationary time series Unit

More information

INTRODUCTION TO BASIC LINEAR REGRESSION MODEL

INTRODUCTION TO BASIC LINEAR REGRESSION MODEL INTRODUCTION TO BASIC LINEAR REGRESSION MODEL 13 September 2011 Yogyakarta, Indonesia Cosimo Beverelli (World Trade Organization) 1 LINEAR REGRESSION MODEL In general, regression models estimate the effect

More information

Vector Autogregression and Impulse Response Functions

Vector Autogregression and Impulse Response Functions Chapter 8 Vector Autogregression and Impulse Response Functions 8.1 Vector Autogregressions Consider two sequences {y t } and {z t }, where the time path of {y t } is affected by current and past realizations

More information

Handout 11: Measurement Error

Handout 11: Measurement Error Handout 11: Measurement Error In which you learn to recognise the consequences for OLS estimation whenever some of the variables you use are not measured as accurately as you might expect. A (potential)

More information

Autocorrelation. Think of autocorrelation as signifying a systematic relationship between the residuals measured at different points in time

Autocorrelation. Think of autocorrelation as signifying a systematic relationship between the residuals measured at different points in time Autocorrelation Given the model Y t = b 0 + b 1 X t + u t Think of autocorrelation as signifying a systematic relationship between the residuals measured at different points in time This could be caused

More information

ECON2228 Notes 10. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 54

ECON2228 Notes 10. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 54 ECON2228 Notes 10 Christopher F Baum Boston College Economics 2014 2015 cfb (BC Econ) ECON2228 Notes 10 2014 2015 1 / 54 erial correlation and heteroskedasticity in time series regressions Chapter 12:

More information

ECON 497 Final Exam Page 1 of 12

ECON 497 Final Exam Page 1 of 12 ECON 497 Final Exam Page of 2 ECON 497: Economic Research and Forecasting Name: Spring 2008 Bellas Final Exam Return this exam to me by 4:00 on Wednesday, April 23. It may be e-mailed to me. It may be

More information

University of California at Berkeley Fall Introductory Applied Econometrics Final examination. Scores add up to 125 points

University of California at Berkeley Fall Introductory Applied Econometrics Final examination. Scores add up to 125 points EEP 118 / IAS 118 Elisabeth Sadoulet and Kelly Jones University of California at Berkeley Fall 2008 Introductory Applied Econometrics Final examination Scores add up to 125 points Your name: SID: 1 1.

More information

LONGITUDINAL DATA ANALYSIS Homework I, 2005 SOLUTION. A = ( 2) = 36; B = ( 4) = 94. Therefore A B = 36 ( 94) = 3384.

LONGITUDINAL DATA ANALYSIS Homework I, 2005 SOLUTION. A = ( 2) = 36; B = ( 4) = 94. Therefore A B = 36 ( 94) = 3384. LONGITUDINAL DATA ANALYSIS Homework I, 2005 SOLUTION 1. Suppose A and B are both 2 2 matrices with A = ( 6 3 2 5 ) ( 4 10, B = 7 6 (a) Verify that A B = AB. ) A = 6 5 3 ( 2) = 36; B = ( 4) 6 10 7 = 94.

More information

Lecture 8: Instrumental Variables Estimation

Lecture 8: Instrumental Variables Estimation Lecture Notes on Advanced Econometrics Lecture 8: Instrumental Variables Estimation Endogenous Variables Consider a population model: y α y + β + β x + β x +... + β x + u i i i i k ik i Takashi Yamano

More information

Dealing With and Understanding Endogeneity

Dealing With and Understanding Endogeneity Dealing With and Understanding Endogeneity Enrique Pinzón StataCorp LP October 20, 2016 Barcelona (StataCorp LP) October 20, 2016 Barcelona 1 / 59 Importance of Endogeneity Endogeneity occurs when a variable,

More information

How To Do Piecewise Exponential Survival Analysis in Stata 7 (Allison 1995:Output 4.20) revised

How To Do Piecewise Exponential Survival Analysis in Stata 7 (Allison 1995:Output 4.20) revised WM Mason, Soc 213B, S 02, UCLA Page 1 of 15 How To Do Piecewise Exponential Survival Analysis in Stata 7 (Allison 1995:Output 420) revised 4-25-02 This document can function as a "how to" for setting up

More information

multilevel modeling: concepts, applications and interpretations

multilevel modeling: concepts, applications and interpretations multilevel modeling: concepts, applications and interpretations lynne c. messer 27 october 2010 warning social and reproductive / perinatal epidemiologist concepts why context matters multilevel models

More information

Topic 10: Panel Data Analysis

Topic 10: Panel Data Analysis Topic 10: Panel Data Analysis Advanced Econometrics (I) Dong Chen School of Economics, Peking University 1 Introduction Panel data combine the features of cross section data time series. Usually a panel

More information

Suggested Answers Problem set 4 ECON 60303

Suggested Answers Problem set 4 ECON 60303 Suggested Answers Problem set 4 ECON 60303 Bill Evans Spring 04. A program that answers part A) is on the web page and is named psid_iv_comparison.do. Below are some key results and a summary table is

More information

Chapter 6. Panel Data. Joan Llull. Quantitative Statistical Methods II Barcelona GSE

Chapter 6. Panel Data. Joan Llull. Quantitative Statistical Methods II Barcelona GSE Chapter 6. Panel Data Joan Llull Quantitative Statistical Methods II Barcelona GSE Introduction Chapter 6. Panel Data 2 Panel data The term panel data refers to data sets with repeated observations over

More information

Mediation Analysis: OLS vs. SUR vs. 3SLS Note by Hubert Gatignon July 7, 2013, updated November 15, 2013

Mediation Analysis: OLS vs. SUR vs. 3SLS Note by Hubert Gatignon July 7, 2013, updated November 15, 2013 Mediation Analysis: OLS vs. SUR vs. 3SLS Note by Hubert Gatignon July 7, 2013, updated November 15, 2013 In Chap. 11 of Statistical Analysis of Management Data (Gatignon, 2014), tests of mediation are

More information

Nonrecursive Models Highlights Richard Williams, University of Notre Dame, https://www3.nd.edu/~rwilliam/ Last revised April 6, 2015

Nonrecursive Models Highlights Richard Williams, University of Notre Dame, https://www3.nd.edu/~rwilliam/ Last revised April 6, 2015 Nonrecursive Models Highlights Richard Williams, University of Notre Dame, https://www3.nd.edu/~rwilliam/ Last revised April 6, 2015 This lecture borrows heavily from Duncan s Introduction to Structural

More information

EC327: Advanced Econometrics, Spring 2007

EC327: Advanced Econometrics, Spring 2007 EC327: Advanced Econometrics, Spring 2007 Wooldridge, Introductory Econometrics (3rd ed, 2006) Chapter 14: Advanced panel data methods Fixed effects estimators We discussed the first difference (FD) model

More information

Recent Advances in the Field of Trade Theory and Policy Analysis Using Micro-Level Data

Recent Advances in the Field of Trade Theory and Policy Analysis Using Micro-Level Data Recent Advances in the Field of Trade Theory and Policy Analysis Using Micro-Level Data July 2012 Bangkok, Thailand Cosimo Beverelli (World Trade Organization) 1 Content a) Classical regression model b)

More information

9) Time series econometrics

9) Time series econometrics 30C00200 Econometrics 9) Time series econometrics Timo Kuosmanen Professor Management Science http://nomepre.net/index.php/timokuosmanen 1 Macroeconomic data: GDP Inflation rate Examples of time series

More information

Meta-analysis of epidemiological dose-response studies

Meta-analysis of epidemiological dose-response studies Meta-analysis of epidemiological dose-response studies Nicola Orsini 2nd Italian Stata Users Group meeting October 10-11, 2005 Institute Environmental Medicine, Karolinska Institutet Rino Bellocco Dept.

More information

Longitudinal Data Analysis. RatSWD Nachwuchsworkshop Vorlesung von Josef Brüderl 25. August, 2009

Longitudinal Data Analysis. RatSWD Nachwuchsworkshop Vorlesung von Josef Brüderl 25. August, 2009 Longitudinal Data Analysis RatSWD Nachwuchsworkshop Vorlesung von Josef Brüderl 25. August, 2009 Longitudinal Data Analysis Traditional definition Statistical methods for analyzing data with a time dimension

More information

. *DEFINITIONS OF ARTIFICIAL DATA SET. mat m=(12,20,0) /*matrix of means of RHS vars: edu, exp, error*/

. *DEFINITIONS OF ARTIFICIAL DATA SET. mat m=(12,20,0) /*matrix of means of RHS vars: edu, exp, error*/ . DEFINITIONS OF ARTIFICIAL DATA SET. mat m=(,,) /matrix of means of RHS vars: edu, exp, error/. mat c=(5,-.6, \ -.6,9, \,,.) /covariance matrix of RHS vars /. mat l m /displays matrix of means / c c c3

More information

Instrumental Variables and GMM: Estimation and Testing. Steven Stillman, New Zealand Department of Labour

Instrumental Variables and GMM: Estimation and Testing. Steven Stillman, New Zealand Department of Labour Instrumental Variables and GMM: Estimation and Testing Christopher F Baum, Boston College Mark E. Schaffer, Heriot Watt University Steven Stillman, New Zealand Department of Labour March 2003 Stata Journal,

More information

Longitudinal Data Analysis Using Stata Paul D. Allison, Ph.D. Upcoming Seminar: May 18-19, 2017, Chicago, Illinois

Longitudinal Data Analysis Using Stata Paul D. Allison, Ph.D. Upcoming Seminar: May 18-19, 2017, Chicago, Illinois Longitudinal Data Analysis Using Stata Paul D. Allison, Ph.D. Upcoming Seminar: May 18-19, 217, Chicago, Illinois Outline 1. Opportunities and challenges of panel data. a. Data requirements b. Control

More information

Econometric Analysis of Panel Data. Assignment 3

Econometric Analysis of Panel Data. Assignment 3 Department of Economics Econometric Analysis of Panel Data Professor William Greene Phone: 22.998.0876 Office: KMC 7-78 Home page:www.stern.nyu.edu/~wgreene Email: wgreene@stern.nyu.edu URL for course

More information

Binary Dependent Variables

Binary Dependent Variables Binary Dependent Variables In some cases the outcome of interest rather than one of the right hand side variables - is discrete rather than continuous Binary Dependent Variables In some cases the outcome

More information

Capital humain, développement et migrations: approche macroéconomique (Empirical Analysis - Static Part)

Capital humain, développement et migrations: approche macroéconomique (Empirical Analysis - Static Part) Séminaire d Analyse Economique III (LECON2486) Capital humain, développement et migrations: approche macroéconomique (Empirical Analysis - Static Part) Frédéric Docquier & Sara Salomone IRES UClouvain

More information

xtseqreg: Sequential (two-stage) estimation of linear panel data models

xtseqreg: Sequential (two-stage) estimation of linear panel data models xtseqreg: Sequential (two-stage) estimation of linear panel data models and some pitfalls in the estimation of dynamic panel models Sebastian Kripfganz University of Exeter Business School, Department

More information

Day 2A Instrumental Variables, Two-stage Least Squares and Generalized Method of Moments

Day 2A Instrumental Variables, Two-stage Least Squares and Generalized Method of Moments Day 2A nstrumental Variables, Two-stage Least Squares and Generalized Method of Moments c A. Colin Cameron Univ. of Calif.- Davis Frontiers in Econometrics Bavarian Graduate Program in Economics. Based

More information

8. Nonstandard standard error issues 8.1. The bias of robust standard errors

8. Nonstandard standard error issues 8.1. The bias of robust standard errors 8.1. The bias of robust standard errors Bias Robust standard errors are now easily obtained using e.g. Stata option robust Robust standard errors are preferable to normal standard errors when residuals

More information

Basic Regressions and Panel Data in Stata

Basic Regressions and Panel Data in Stata Developing Trade Consultants Policy Research Capacity Building Basic Regressions and Panel Data in Stata Ben Shepherd Principal, Developing Trade Consultants 1 Basic regressions } Stata s regress command

More information

Lab 11 - Heteroskedasticity

Lab 11 - Heteroskedasticity Lab 11 - Heteroskedasticity Spring 2017 Contents 1 Introduction 2 2 Heteroskedasticity 2 3 Addressing heteroskedasticity in Stata 3 4 Testing for heteroskedasticity 4 5 A simple example 5 1 1 Introduction

More information

STATA Commands for Unobserved Effects Panel Data

STATA Commands for Unobserved Effects Panel Data STATA Commands for Unobserved Effects Panel Data John C Frain 21st February 2005 Contents 1 Introduction 1 2 Estimation usingxtreg 9 3 Testing afterxtreg 13 4 Prediction after xtreg 15 5 Faster estimation

More information

Econometrics II. Lecture 4: Instrumental Variables Part I

Econometrics II. Lecture 4: Instrumental Variables Part I Econometrics II Lecture 4: Instrumental Variables Part I Måns Söderbom 12 April 2011 mans.soderbom@economics.gu.se. www.economics.gu.se/soderbom. www.soderbom.net 1. Introduction Recall from lecture 3

More information

Problem 3.1: Error autotocorrelation and heteroskedasticity Standard variance components model:

Problem 3.1: Error autotocorrelation and heteroskedasticity Standard variance components model: ECON 510: Panel data econometrcs Semnar 3: October., 007 Problem 3.1: Error autotocorrelaton and heteroskedastcy Standard varance components model: (0.1) y = k+ x β + + u, ε = + u, IID(0, ), u Rewrng the

More information

Understanding the multinomial-poisson transformation

Understanding the multinomial-poisson transformation The Stata Journal (2004) 4, Number 3, pp. 265 273 Understanding the multinomial-poisson transformation Paulo Guimarães Medical University of South Carolina Abstract. There is a known connection between

More information

Ecmt 675: Econometrics I

Ecmt 675: Econometrics I Ecmt 675: Econometrics I Assignment 7 Problem 1 a. reg hours lwage educ age kidslt6 kidsge6 nwifeinc, r Linear regression Number of obs = 428 F( 6, 421) = 3.93 Prob > F = 0.0008 R-squared = 0.0670 Root

More information

ECON 4551 Econometrics II Memorial University of Newfoundland. Panel Data Models. Adapted from Vera Tabakova s notes

ECON 4551 Econometrics II Memorial University of Newfoundland. Panel Data Models. Adapted from Vera Tabakova s notes ECON 4551 Econometrics II Memorial University of Newfoundland Panel Data Models Adapted from Vera Tabakova s notes 15.1 Grunfeld s Investment Data 15.2 Sets of Regression Equations 15.3 Seemingly Unrelated

More information

From the help desk: Comparing areas under receiver operating characteristic curves from two or more probit or logit models

From the help desk: Comparing areas under receiver operating characteristic curves from two or more probit or logit models The Stata Journal (2002) 2, Number 3, pp. 301 313 From the help desk: Comparing areas under receiver operating characteristic curves from two or more probit or logit models Mario A. Cleves, Ph.D. Department

More information

Empirical Application of Simple Regression (Chapter 2)

Empirical Application of Simple Regression (Chapter 2) Empirical Application of Simple Regression (Chapter 2) 1. The data file is House Data, which can be downloaded from my webpage. 2. Use stata menu File Import Excel Spreadsheet to read the data. Don t forget

More information