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

Size: px
Start display at page:

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

Transcription

1 Fortin Econ Econometric Review 1 Contents 1 Panel Data Methods Fixed Effects Dummy Variables Regression First Differencing Methods Within Estimator Random Effects Dynamic Panel Data Models

2 Fortin Econ Econometric Review 2 1 Panel Data Methods 1.1 Fixed Effects Fixed effects can be seen as a generalization of Differences-in-Differences (DD) in the case of more than two periods (say T periods) and more than 2 groups (say J groups). In the OLS regression, Y it = β 0 + β 1 X it + δ 0 W it + ɛ it (1) c Nicole M. Fortin. Not to be copied, used, or revised without explicit permission from the copyright owner.

3 Fortin Econ Econometric Review 3 where the double subscript it indicate that we have observations for each observation unit i in each time period t. The estimate of δ 0 will be biased if treatment W it is correlated with ɛ it, for example if ɛ it = α i + u it, where α i is the individual fixed effect Consider the estimation of the impact of unions on log wages. If we have panel data on workers: W it = 1 if a worker has a union job and W it = 0 if the worker is non-unionized. If workers self-select into unionized jobs or if employers screen higher ability workers for unionized jobs, we will expect the α i and thus ɛ it will be positively correlated with W it, and thus the OLS estimate of the union effect on wages will be overestimated.

4 Fortin Econ Econometric Review 4 From Wooldridge s example 14.4 which uses Vella and Verbreek (1998) NLSY data on 545 men from 1980 to reg lwage union educ exper expersq hisp black married Source SS df MS Number of obs = F( 7, 4352) = Model Prob > F = Residual R-squared = Adj R-squared = Total Root MSE = lwage Coef. Std. Err. t P> t [95% Conf. Interval] union educ exper expersq hisp black

5 Fortin Econ Econometric Review 5 married _cons reg lwage union educ exper expersq hisp black married, vce(cluster nr) Linear regression Number of obs = 4360 F( 7, 544) = Prob > F = R-squared = Root MSE = (Std. Err. adjusted for 545 clusters in nr) Robust lwage Coef. Std. Err. t P> t [95% Conf. Interval] union educ exper expersq

6 Fortin Econ Econometric Review 6 hisp black married _cons Also the OLS standard errors underestimate the true standard errors because of serial correlation. By comparison, the clustered standard errors are much larger. Note that the individual effect α i does not change over time. It is said to be fixed (for historical reasons) if it is tought to be correlated with the X s.

7 Fortin Econ Econometric Review 7 On the other hand, if α i can be assumed to be uncorrelated with the X s, α i is said to be a random effect, and we will see later how to estimate the model in this case Dummy Variables Regression One way to solve this problem is to put group dummies and time dummies in the regression: Y it = β 0 + β 1 X i + δ 0 W it + γ i D i + γ t D t + ɛ jt where D i and D t are individual and time dummies respectively The identification then comes from the within group-time variation, that is, group specific changes over time.

8 Fortin Econ Econometric Review 8 In the case of the effect of union on log wages, the identification comes from the relationship between individual changes in union status and wages over time, that is for switchers.. xi: reg lwage union educ exper expersq hisp black married union i.nr i.year i.nr _Inr_ (naturally coded; _Inr_13 omitted) i.year _Iyear_ (naturally coded; _Iyear_1980 omitted) Source SS df MS Number of obs = F(554, 3805) = Model Prob > F = Residual R-squared = Adj R-squared = Total Root MSE = lwage Coef. Std. Err. t P> t [95% Conf. Interval] union educ

9 Fortin Econ Econometric Review 9 exper expersq hisp black married Inr_ _Inr_ _Inr_ _Inr_ _Inr_ _Inr_ _Iyear_ _Iyear_ _Iyear_ _Iyear_ _Iyear_ _Iyear_ _Iyear_ _cons

10 Fortin Econ Econometric Review 10 Changes common to all groups are captured by the time dummies and thus are not a source of variation that identification of fixed effects. When there are a large number of observations units, such as this example, you may want to use the following command. areg lwage union educ exper expersq hisp black married yrd*, absorb(nr) Linear regression, absorbing indicators Number of obs = 4360 F( 10, 3805) = Prob > F = R-squared = Adj R-squared = Root MSE = lwage Coef. Std. Err. t P> t [95% Conf. Interval]

11 Fortin Econ Econometric Review 11 union educ (dropped) exper expersq hisp (dropped) black (dropped) married yrd1 (dropped) yrd yrd yrd yrd yrd yrd yrd8 (dropped) _cons nr F(544, 3805) = (545 categories)

12 Fortin Econ Econometric Review First Differencing Methods Another way to eliminate the individual effects α i is by first differencing. Since the lagged value of equation (1) is Y it 1 = β 0 + β 1 X it 1 + δ 0 W it 1 + α i + u it 1 (2) Subtracting (2) from (1) (Y it Y it 1 ) = β 1 (X it X it 1 ) + δ 0 (W it W it 1 ) + (u it u it 1 ) or Y it = β 1 X it + δ 0 W it + u it where we now have T 1 time periods for each unit i. The δ F D obtained by first differencing gives us consistent estimates of δ 0

13 Fortin Econ Econometric Review 13 sort nr. by nr:gen dwage=lwage-lwage[_n-1] (545 missing values generated). by nr:gen dexpe=exper-exper[_n-1] (545 missing values generated). by nr:gen dexp2=expersq-expersq[_n-1] (545 missing values generated). by nr:gen dmarr=married-married[_n-1] (545 missing values generated). by nr:gen dunion=union-union[_n-1] (545 missing values generated). tab year, gen(yrd). reg dwage dunion dexpe dexp2 dmarr yrd*, cluster(nr)

14 Fortin Econ Econometric Review 14 Linear regression Number of obs = 3815 F( 9, 544) = 5.46 Prob > F = R-squared = Number of clusters (nr) = 545 Root MSE = Robust dwage Coef. Std. Err. t P> t [95% Conf. Interval] dunion dexpe (dropped) dexp dmarr yrd1 (dropped) yrd yrd yrd yrd yrd yrd

15 Fortin Econ Econometric Review 15 yrd8 (dropped) _cons But differencing introduces spurious negative correlation across observations since cov( u it 1, u it ) = cov[(u it 1 u it 2 ), (u it u it 1 )] = var(u it 1 ). Sometimes, this problem can be solved by clustering across observations units, that is allowing the error terms for each observation unit to be correlated In our union example, it is best to use longer differences since differencing can make measurement error worse!

16 Fortin Econ Econometric Review 16. reg d2wage d2union d2expe d2exp2 d2marr yrd*, cluster(nr) Linear regression Number of obs = 3270 F( 8, 544) = 9.01 Prob > F = R-squared = Number of clusters (nr) = 545 Root MSE = Robust d2wage Coef. Std. Err. t P> t [95% Conf. Interval] d2union d2expe (dropped) d2exp d2marr yrd1 (dropped) yrd2 (dropped) yrd3 (dropped) yrd yrd

17 Fortin Econ Econometric Review 17 yrd yrd yrd _cons In applying first differencing, we should difference all variables appearing in the structural equation, including any binary treatment indicator. In the case of 2 time periods, however, it generally does not matter whether the policy variable is differenced, If W i1 = 0 and W i2 = 1, then W it = W i2 and the differenced equation is just Y it = β 1 X it + δ 0 W i2 + u it

18 Fortin Econ Econometric Review 18 This is a direct extension of DD where there are 2 groups that experience different changes in policy over 2 periods Within Estimator There is yet another way to get rid of the individual effects α i. For each individual, let s average equation (1) over time Ȳ i = β 1 X i + δ 0 W i + α i + ū i (3) where Ȳ it = 1/T T i=1 Y it and so on, but where ᾱ i = α i since α i is constant over time. Substracting equation (3) from (1) gives (Y it Ȳ i ) = β 1 (X it X i ) + δ 0 (W it W i ) + (u it ū i ) (4)

19 Fortin Econ Econometric Review 19 Under strict exogeneity assumptions, the within estimator and the dummy variables estimator are equivalent But within estimators easily implemented for unbalanced panels, not just balanced panels If we were to do this estimation by hand, the standard errors would be incorrect, because the software would think that df = NT k, but really is N(T 1) k because we used up dfs calculating means. global v1list lwage union educ exper expersq hisp black married. foreach var of varlist $v1list { 2. by nr: egen var bar= mean ( var ) 3. gen var _dev= var - var bar

20 Fortin Econ Econometric Review }. reg lwage_dev union_dev educ_dev exper_dev expersq_dev hisp_dev black_dev married_dev, noconstant Source SS df MS Number of obs = F( 4, 4356) = Model Prob > F = Residual R-squared = Adj R-squared = Total Root MSE = lwage_dev Coef. Std. Err. t P> t [95% Conf. Interval] union_dev educ_dev (dropped) exper_dev expersq_dev hisp_dev (dropped) black_dev (dropped)

21 Fortin Econ Econometric Review 21 married_dev xtset nr year panel variable: nr (strongly balanced) time variable: year, 1980 to 1987 delta: 1 unit. xtdescribe nr: 13, 17,..., n = 545 year: 1980, 1981,..., 1987 T = 8 Delta(year) = 1 unit Span(year) = 8 periods (nr*year uniquely identifies each observation) Distribution of T_i: min 5% 25% 50% 75% 95% max

22 Fortin Econ Econometric Review 22 Freq. Percent Cum. Pattern XXXXXXXX. xtreg lwage union educ exper expersq hisp black married, fe Fixed-effects (within) regression Number of obs = 4360 Group variable (i): nr Number of groups = 545 R-sq: within = Obs per group: min = 8 between = avg = 8.0 overall = max = 8 F(4,3811) = corr(u_i, Xb) = Prob > F =

23 Fortin Econ Econometric Review 23 lwage Coef. Std. Err. t P> t [95% Conf. Interval] union educ (dropped) exper expersq hisp (dropped) black (dropped) married _cons sigma_u sigma_e rho (fraction of variance due to u_i) F test that all u_i=0: F(544, 3811) = 7.98 Prob > F = xtsum married Variable Mean Std. Dev. Min Max Observations

24 Fortin Econ Econometric Review married overall N = 4360 between n = 545 within T = 8. xtsum educ Variable Mean Std. Dev. Min Max Observations educ overall N = 4360 between n = 545 within T = 8 If we anticipate unobserved heterogeneity to persist over time for individuals, we can use clustered standard errors.. xtreg lwage union educ exper expersq hisp black married, fe vce(cluster nr)

25 Fortin Econ Econometric Review 25 Fixed-effects (within) regression Number of obs = 4360 Group variable: nr Number of groups = 545 R-sq: within = Obs per group: min = 8 between = avg = 8.0 overall = max = 8 F(4,544) = corr(u_i, Xb) = Prob > F = (Std. Err. adjusted for 545 clusters in nr) Robust lwage Coef. Std. Err. t P> t [95% Conf. Interval] union educ (dropped) exper expersq hisp (dropped) black (dropped)

26 Fortin Econ Econometric Review 26 married _cons sigma_u sigma_e rho (fraction of variance due to u_i). est store fixed_effects Now the dummy variable estimate also includes that time fixed effects, we can add those to the individual fixed effects model. xi: xtreg lwage union educ exper expersq hisp black married i.year, fe i.year _Iyear_ (naturally coded; _Iyear_1980 omitted) note: educ omitted because of collinearity note: hisp omitted because of collinearity note: black omitted because of collinearity note: _Iyear_1987 omitted because of collinearity

27 Fortin Econ Econometric Review 27 Fixed-effects (within) regression Number of obs = 4360 Group variable: nr Number of groups = 545 R-sq: within = Obs per group: min = 8 between = avg = 8.0 overall = max = 8 F(10,3805) = corr(u_i, Xb) = Prob > F = lwage Coef. Std. Err. t P> t [95% Conf. Interval] union educ 0 (omitted) exper expersq hisp 0 (omitted) black 0 (omitted) married

28 Fortin Econ Econometric Review 28 _Iyear_ _Iyear_ _Iyear_ _Iyear_ _Iyear_ _Iyear_ _Iyear_ (omitted) _cons sigma_u sigma_e rho (fraction of variance due to u_i) F test that all u_i=0: F(544, 3805) = 9.16 Prob > F = testparm _Iyear* ( 1) _Iyear_1981 = 0 ( 2) _Iyear_1982 = 0 ( 3) _Iyear_1983 = 0 ( 4) _Iyear_1984 = 0

29 Fortin Econ Econometric Review 29 ( 5) _Iyear_1985 = 0 ( 6) _Iyear_1986 = 0 F( 6, 3805) = 1.96 Prob > F = The Prob > F is > 0.05, so we failed to reject the null that the coefficients for all years are jointly equal to zero, therefore no time fixed effects are needed in this case. The dummy variable estimate δ D =0.080 (0.019) of the union effect is now identical to the fixed effects estimate δ F EF T =0.080 (0.019).

30 Fortin Econ Econometric Review Random Effects Up to now we have assumed that the α i were correlated with the X s, but what if they are not? If Cov(X it, α i ) = 0, t = 1,..., T and if the explanatory variables are strictly exogenous, OLS would be consistent in that case The composite error ɛ it = α i + u it has variance σ ɛ = var(α i + u it ) = (σ 2 α + σ2 u ) For individual i, cov(ɛ it, ɛ is ) = σ 2 α, so the error term is serially correlated : Corr(ɛ it, ɛ is ) = σ 2 α/(σ 2 α + σ 2 u), t s

31 Fortin Econ Econometric Review 31 We will need to transform the model and use feasible GLS to perform the estimation and make correct inferences The idea will be to used quasi-differenced variables using λ = 1 [σ 2 u/(σ 2 u + T σ 2 α)] 1/2 where deriving this transformation requires sophisticated matrix algebra (see, Wooldridge, 1999, chap. 10) The intuition behind the formula is that σ 2 u is the regression error variance from the fixed effects estimator and σ 2 α comes out in the computation of the regression error variance from the between estimator (runned on time averaged observations) (see Adkins and Hill, 2012 on how to do this by hand )

32 Fortin Econ Econometric Review 32 The transformed equation will be (Y it λȳ i ) = β 0 (1 λ)+β 1 (X it λ X i )+δ 0 (W it λ W i )+(u it λū i ) That is, the random effects transformation subtracts a fraction of the unit time average, where the fraction depends on σ 2 u, σ2 α and the number of time periods T. If λ = 1, then this is just the within estimator. If λ = 0, then this is just the OLS estimator. So, the bigger the variance of the unobserved effect, the closer it is to within estimator. The smaller the variance of the unobserved effect, the closer it is to OLS Since it involves quasi-demeaning of the data, a variable without time variation within the individual may be included in the random effects model.

33 Fortin Econ Econometric Review 33 Note that STATA calls the individual fixed effect u i and the unobserved effect e it (I use the same terminology as Wooldridge) and the coefficient rho = σ 2 u /(σ2 u + σ2 e ) corresponds to Corr(ɛ it, ɛ is ) above.. xtreg lwage union educ exper expersq hisp black married, re Random-effects GLS regression Number of obs = 4360 Group variable (i): nr Number of groups = 545 R-sq: within = Obs per group: min = 8 between = avg = 8.0 overall = max = 8 Random effects u_i ~ Gaussian Wald chi2(7) = corr(u_i, X) = 0 (assumed) Prob > chi2 = lwage Coef. Std. Err. z P> z [95% Conf. Interval] union

34 Fortin Econ Econometric Review 34 educ exper expersq hisp black married _cons sigma_u sigma_e rho (fraction of variance due to u_i) Prob > chi2 = The following LM test helps you decide between a random effects regression and a simple OLS regression. The Breusch-Pagan test statistic consider the null H 0 : σ 2 u = 0 [aka σ 2 a = 0] that variances across entities is zero.

35 Fortin Econ Econometric Review 35. xttest0 Breusch and Pagan Lagrangian multiplier test for random effects lwage[nr,t] = Xb + u[nr] + e[nr,t] Estimated results: Var sd = sqrt(var) lwage e u Test: Var(u) = 0 chi2(1) = Prob > chi2 = Rejecting the null leads us to conclude that random effects are present.

36 Fortin Econ Econometric Review 36 We might consider RE as an appropriate model when applied to a random sample of individuals, such as a sample of workers, or the unemployed, or those who have completed a job training program. In the case of union, it make more sense to think of fixed effects, since we think that the problem comes from something unobserved (such as ability) that is correlated with the Xs But we can perform a Hausman asking whether the random effects coefficients are statistically different from the allegedly consistent fixed effects, which should go first in the test. quietly xtreg lwage union educ exper expersq hisp black married, fe. estimates store fixed

37 Fortin Econ Econometric Review 37. quietly xtreg lwage union educ exper expersq hisp black married, re. estimates store random. hausman fixed random ---- Coefficients ---- (b) (B) (b-b) sqrt(diag(v_b-v_b)) fixed random Difference S.E union exper expersq married 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

38 Fortin Econ Econometric Review 38 chi2(4) = (b-b) [(V_b-V_B)^(-1)](b-B) = Prob>chi2 = Thus we reject the hypothesis of equality of the coefficients estimates, suggesting that the random effects estimator is inconsistent Another testing approach asks if there is a systematic relation between α i [u i ] and the X s. It adds time averages to the other explanatory variables which should not be significant if there is no systematic relationship, which we expect to find here.. xtreg lwage union exper experbar expersq expersqbar married marriedbar, re vce(cluster nr)

39 Fortin Econ Econometric Review 39 Random-effects GLS regression Number of obs = 4360 Group variable: nr Number of groups = 545 R-sq: within = Obs per group: min = 8 between = avg = 8.0 overall = max = 8 Random effects u_i ~ Gaussian Wald chi2(8) = corr(u_i, X) = 0 (assumed) Prob > chi2 = (Std. Err. adjusted for 545 clusters in nr) Robust lwage Coef. Std. Err. z P> z [95% Conf. Interval] union exper experbar expersq expersqbar married

40 Fortin Econ Econometric Review 40 marriedbar _cons sigma_u sigma_e rho (fraction of variance due to u_i). test experbar expersqbar marriedbar ( 1) experbar = 0 ( 2) expersqbar = 0 ( 3) marriedbar = 0 chi2( 3) = Prob > chi2 = Sometimes it may be helpful to use a procedure that allow for the error term u it to be correlated over i: u it = ρ i u it 1 + ε it

41 Fortin Econ Econometric Review 41 The Prais-Winsten procedure is one such GLS procedure (with ρ i = ρ) that is correctly implemented in STATA in the case of panel data with the command xtpcse It uses quasi-differenced data Y it ρy it 1, X it ρx it 1 instead or Y it and X it and a special correction ( 1 ρ 2 ) for the first observation (see Wooldridge, chap. 12 or Hill et al. chap. 12). xtpcse lwage union educ exper expersq hisp black married, correlation(ar1) hetonly (note: estimates of rho outside [-1,1] bounded to be in the range [-1,1]) Prais-Winsten regression, heteroskedastic panels corrected standard errors Group variable: nr Number of obs = 4360 Time variable: year Number of groups = 545 Panels: heteroskedastic (balanced) Obs per group: min = 8

42 Fortin Econ Econometric Review 42 Autocorrelation: common AR(1) avg = 8 max = 8 Estimated covariances = 545 R-squared = Estimated autocorrelations = 1 Wald chi2(7) = Estimated coefficients = 8 Prob > chi2 = Het-corrected lwage Coef. Std. Err. z P> z [95% Conf. Interval] union educ exper expersq hisp black married _cons rho

43 Fortin Econ Econometric Review 43 So which estimates of union effects should we trust? Here all specialized estimates are much closer to each other than to the OLS, δ OLS =0.180 (0.017). Whereas δ LSDV =δ F EF T = (0.019) (least squares dummy variables, fixed effects fixed time ) and δ F E =0.082 (0.019) (fixed effects, within estimator), even δ RE = (0.018) (random effects) and δ P rais W insten = 0.099(0.018) (random effects, Prais-Winsten correction) We think that the OLS estimates of the union effect indeed overestimate the impact of unions on wages! Another idea would be to control for occupations!

44 Fortin Econ Econometric Review Dynamic Panel Data Models Another serious difficulty, distinct from the autocorrelation of the error term, arises with the fixed effects model in the context of a dynamic panel data (DPD) model: one containing a lagged dependent variable (and possibly other regressors). In the simplest setup of a pure AR(1) model without additional regressors: Y it = β 0 + ρy it 1 + α i + u it (5) (Y it Ȳ i ) = ρ(y it 1 Ȳ i, 1 ) + α i + (u it ū i ) (6) where Ȳ it = 1/T T i=1 Y it and so on,

45 Fortin Econ Econometric Review 45 Because u it enters every value of Y it by assumption, the lagged dependent variable cannot be independent of the composite error process The demeaning process which subtracts the individual s mean value of Y and each X from the respective variable creates a correlation between regressor and error. If ρ > 0, the bias is invariably negative, so that the persistence of Y will be underestimated. If the regressors are correlated with the lagged dependent variable to some degree, their coefficients may be seriously biased as well. A solution to this problem involves taking first differences of the original model.

46 Fortin Econ Econometric Review 46 Consider a model containing a lagged dependent variable and a single regressor X: Y it = β 0 + ρy it 1 + β 1 X it + α i + u it (7) The first difference transformation removes both the constant term and the individual effect: Y it = ρ Y it 1 + β 1 X it + u it (8) There is still correlation between the differenced lagged dependent variable and the error process: the former contains Y it 1 and the latter contains u it 1. But we can instrument the lagged dependent variable with the second and third lags of Y it, either in the form of differences or lagged levels.

47 Fortin Econ Econometric Review 47 This approach first proposed by Anderson and Hsiao (1982) provides consistent estimates; it is implemented in STATA by xtivreg, fd. The example below uses the Arellano and Bond (1991) panel dataset, which is based on a sample of 140 UK firms surveyed annually from 1976 to 1984, and considers the determinants of firm s employment adjustment. The panel is unbalanced, with some firms having more observations than others. Because hiring and firing workers is costly, we expect employment to adjust with delay to changes in factors such as firms capital stock, wages, and demand for the firms output.

48 Fortin Econ Econometric Review 48 The variables names are as follows: n is firm employment, w is the firms wage level, k is the firms gross capital, and ys is the aggregate output in the firms sector, as a proxy for demand; all variables are in logarithms. Variable names beginning with D indicate differenced variables. Variable names ending in L1 or L2 indicate lagged copies. For example D.nL1 = n it 1. In their model, Arellano and Bond include the current and first lags of wages, the first two lags of employment, the current and first two lags of capital and sector-level output, and a set of time dummies.

49 Fortin Econ Econometric Review 49. webuse abdata. xtivreg n (nl1=nl2) w wl1 k kl1 kl2 ys ysl1 ysl2 yr*, fd note: yr1984 omitted because of collinearity First-differenced IV regression Group variable: id Number of obs = 611 Time variable: year Number of groups = 140 R-sq: within = Obs per group: min = 4 between = avg = 4.4 overall = max = 6 Wald chi2(14) = corr(u_i, Xb) = Prob > chi2 = D.n Coef. Std. Err. z P> z [95% Conf. Interval] nl1

50 Fortin Econ Econometric Review 50 D w D wl1 D k D kl1 D kl2 D ys D ysl1

51 Fortin Econ Econometric Review 51 D ysl2 D yr1979 D yr1980 D yr1981 D yr1982 D yr1983 D

52 Fortin Econ Econometric Review 52 yr1984 D1. 0 (omitted) _cons sigma_u sigma_e rho (fraction of variance due to u_i) Instrumented: nl1 Instruments: w wl1 k kl1 kl2 ys ysl1 ysl2 yr1978 yr1979 yr1980 yr1981 yr1982 yr1983 nl2 Arellano and Bond (1991) actually proposed an alternative GMM approach based on the notion that the instrumental variables approach above does not exploit all of the information available in the sample.

53 Fortin Econ Econometric Review 53 Their original version xtabond was superseeded by xtabond2, which offers a much more flexible syntax and allows different specification of instrument sets, including differences of lagged dependent variables and correction for standard errors of the two-step estimates.

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

Microeconometrics (PhD) Problem set 2: Dynamic Panel Data Solutions 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

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

7 Introduction to Time Series Time Series vs. Cross-Sectional Data Detrending Time Series... 15

7 Introduction to Time Series Time Series vs. Cross-Sectional Data Detrending Time Series... 15 Econ 495 - Econometric Review 1 Contents 7 Introduction to Time Series 3 7.1 Time Series vs. Cross-Sectional Data............ 3 7.2 Detrending Time Series................... 15 7.3 Types of Stochastic

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

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

Lecture 9: Panel Data Model (Chapter 14, Wooldridge Textbook)

Lecture 9: Panel Data Model (Chapter 14, Wooldridge Textbook) Lecture 9: Panel Data Model (Chapter 14, Wooldridge Textbook) 1 2 Panel Data Panel data is obtained by observing the same person, firm, county, etc over several periods. Unlike the pooled cross sections,

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

Graduate Econometrics Lecture 4: Heteroskedasticity

Graduate Econometrics Lecture 4: Heteroskedasticity Graduate Econometrics Lecture 4: Heteroskedasticity Department of Economics University of Gothenburg November 30, 2014 1/43 and Autocorrelation Consequences for OLS Estimator Begin from the linear model

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

****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

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

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

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

Econometrics. Week 4. Fall Institute of Economic Studies Faculty of Social Sciences Charles University in Prague

Econometrics. Week 4. Fall Institute of Economic Studies Faculty of Social Sciences Charles University in Prague Econometrics Week 4 Institute of Economic Studies Faculty of Social Sciences Charles University in Prague Fall 2012 1 / 23 Recommended Reading For the today Serial correlation and heteroskedasticity in

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

Course Econometrics I

Course Econometrics I Course Econometrics I 4. Heteroskedasticity Martin Halla Johannes Kepler University of Linz Department of Economics Last update: May 6, 2014 Martin Halla CS Econometrics I 4 1/31 Our agenda for today Consequences

More information

(a) Briefly discuss the advantage of using panel data in this situation rather than pure crosssections

(a) Briefly discuss the advantage of using panel data in this situation rather than pure crosssections Answer Key Fixed Effect and First Difference Models 1. See discussion in class.. David Neumark and William Wascher published a study in 199 of the effect of minimum wages on teenage employment using a

More information

Applied Microeconometrics (L5): Panel Data-Basics

Applied Microeconometrics (L5): Panel Data-Basics Applied Microeconometrics (L5): Panel Data-Basics Nicholas Giannakopoulos University of Patras Department of Economics ngias@upatras.gr November 10, 2015 Nicholas Giannakopoulos (UPatras) MSc Applied Economics

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

Answer all questions from part I. Answer two question from part II.a, and one question from part II.b.

Answer all questions from part I. Answer two question from part II.a, and one question from part II.b. B203: Quantitative Methods Answer all questions from part I. Answer two question from part II.a, and one question from part II.b. Part I: Compulsory Questions. Answer all questions. Each question carries

More information

New Developments in Econometrics Lecture 11: Difference-in-Differences Estimation

New Developments in Econometrics Lecture 11: Difference-in-Differences Estimation New Developments in Econometrics Lecture 11: Difference-in-Differences Estimation Jeff Wooldridge Cemmap Lectures, UCL, June 2009 1. The Basic Methodology 2. How Should We View Uncertainty in DD Settings?

More information

Econometrics. Week 8. Fall Institute of Economic Studies Faculty of Social Sciences Charles University in Prague

Econometrics. Week 8. Fall Institute of Economic Studies Faculty of Social Sciences Charles University in Prague Econometrics Week 8 Institute of Economic Studies Faculty of Social Sciences Charles University in Prague Fall 2012 1 / 25 Recommended Reading For the today Instrumental Variables Estimation and Two Stage

More information

Applied Quantitative Methods II

Applied Quantitative Methods II Applied Quantitative Methods II Lecture 10: Panel Data Klára Kaĺıšková Klára Kaĺıšková AQM II - Lecture 10 VŠE, SS 2016/17 1 / 38 Outline 1 Introduction 2 Pooled OLS 3 First differences 4 Fixed effects

More information

Econometrics of Panel Data

Econometrics of Panel Data Econometrics of Panel Data Jakub Mućk Meeting # 1 Jakub Mućk Econometrics of Panel Data Meeting # 1 1 / 31 Outline 1 Course outline 2 Panel data Advantages of Panel Data Limitations of Panel Data 3 Pooled

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

Econometrics I KS. Module 2: Multivariate Linear Regression. Alexander Ahammer. This version: April 16, 2018

Econometrics I KS. Module 2: Multivariate Linear Regression. Alexander Ahammer. This version: April 16, 2018 Econometrics I KS Module 2: Multivariate Linear Regression Alexander Ahammer Department of Economics Johannes Kepler University of Linz This version: April 16, 2018 Alexander Ahammer (JKU) Module 2: Multivariate

More information

Applied Economics. Panel Data. Department of Economics Universidad Carlos III de Madrid

Applied Economics. Panel Data. Department of Economics Universidad Carlos III de Madrid Applied Economics Panel Data Department of Economics Universidad Carlos III de Madrid See also Wooldridge (chapter 13), and Stock and Watson (chapter 10) 1 / 38 Panel Data vs Repeated Cross-sections In

More information

Linear Panel Data Models

Linear Panel Data Models Linear Panel Data Models Michael R. Roberts Department of Finance The Wharton School University of Pennsylvania October 5, 2009 Michael R. Roberts Linear Panel Data Models 1/56 Example First Difference

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

Econometrics. Week 6. Fall Institute of Economic Studies Faculty of Social Sciences Charles University in Prague

Econometrics. Week 6. Fall Institute of Economic Studies Faculty of Social Sciences Charles University in Prague Econometrics Week 6 Institute of Economic Studies Faculty of Social Sciences Charles University in Prague Fall 2012 1 / 21 Recommended Reading For the today Advanced Panel Data Methods. Chapter 14 (pp.

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

7 Introduction to Time Series

7 Introduction to Time Series Econ 495 - Econometric Review 1 7 Introduction to Time Series 7.1 Time Series vs. Cross-Sectional Data Time series data has a temporal ordering, unlike cross-section data, we will need to changes some

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

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

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

ECON Introductory Econometrics. Lecture 13: Internal and external validity

ECON Introductory Econometrics. Lecture 13: Internal and external validity ECON4150 - Introductory Econometrics Lecture 13: Internal and external validity Monique de Haan (moniqued@econ.uio.no) Stock and Watson Chapter 9 Lecture outline 2 Definitions of internal and external

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

Econometrics of Panel Data

Econometrics of Panel Data Econometrics of Panel Data Jakub Mućk Meeting # 2 Jakub Mućk Econometrics of Panel Data Meeting # 2 1 / 26 Outline 1 Fixed effects model The Least Squares Dummy Variable Estimator The Fixed Effect (Within

More information

Auto correlation 2. Note: In general we can have AR(p) errors which implies p lagged terms in the error structure, i.e.,

Auto correlation 2. Note: In general we can have AR(p) errors which implies p lagged terms in the error structure, i.e., 1 Motivation Auto correlation 2 Autocorrelation occurs when what happens today has an impact on what happens tomorrow, and perhaps further into the future This is a phenomena mainly found in time-series

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

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

Wooldridge, Introductory Econometrics, 4th ed. Chapter 15: Instrumental variables and two stage least squares

Wooldridge, Introductory Econometrics, 4th ed. Chapter 15: Instrumental variables and two stage least squares Wooldridge, Introductory Econometrics, 4th ed. Chapter 15: Instrumental variables and two stage least squares Many economic models involve endogeneity: that is, a theoretical relationship does not fit

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

Lab 10 - Binary Variables

Lab 10 - Binary Variables Lab 10 - Binary Variables Spring 2017 Contents 1 Introduction 1 2 SLR on a Dummy 2 3 MLR with binary independent variables 3 3.1 MLR with a Dummy: different intercepts, same slope................. 4 3.2

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

Control Function and Related Methods: Nonlinear Models

Control Function and Related Methods: Nonlinear Models Control Function and Related Methods: Nonlinear Models Jeff Wooldridge Michigan State University Programme Evaluation for Policy Analysis Institute for Fiscal Studies June 2012 1. General Approach 2. Nonlinear

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

1 Linear Regression Analysis The Mincer Wage Equation Data Econometric Model Estimation... 11

1 Linear Regression Analysis The Mincer Wage Equation Data Econometric Model Estimation... 11 Econ 495 - Econometric Review 1 Contents 1 Linear Regression Analysis 4 1.1 The Mincer Wage Equation................. 4 1.2 Data............................. 6 1.3 Econometric Model.....................

More information

ECON2228 Notes 7. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 41

ECON2228 Notes 7. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 41 ECON2228 Notes 7 Christopher F Baum Boston College Economics 2014 2015 cfb (BC Econ) ECON2228 Notes 6 2014 2015 1 / 41 Chapter 8: Heteroskedasticity In laying out the standard regression model, we made

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

Panel Data Models. Chapter 5. Financial Econometrics. Michael Hauser WS17/18 1 / 63

Panel Data Models. Chapter 5. Financial Econometrics. Michael Hauser WS17/18 1 / 63 1 / 63 Panel Data Models Chapter 5 Financial Econometrics Michael Hauser WS17/18 2 / 63 Content Data structures: Times series, cross sectional, panel data, pooled data Static linear panel data models:

More information

Panel Data. March 2, () Applied Economoetrics: Topic 6 March 2, / 43

Panel Data. March 2, () Applied Economoetrics: Topic 6 March 2, / 43 Panel Data March 2, 212 () Applied Economoetrics: Topic March 2, 212 1 / 43 Overview Many economic applications involve panel data. Panel data has both cross-sectional and time series aspects. Regression

More information

Dynamic Panel Data Ch 1. Reminder on Linear Non Dynamic Models

Dynamic Panel Data Ch 1. Reminder on Linear Non Dynamic Models Dynamic Panel Data Ch 1. Reminder on Linear Non Dynamic Models Pr. Philippe Polomé, Université Lumière Lyon M EcoFi 016 017 Overview of Ch. 1 Data Panel Data Models Within Estimator First-Differences Estimator

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

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

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

Difference-in-Differences Estimation

Difference-in-Differences Estimation Difference-in-Differences Estimation Jeff Wooldridge Michigan State University Programme Evaluation for Policy Analysis Institute for Fiscal Studies June 2012 1. The Basic Methodology 2. How Should We

More information

Lab 07 Introduction to Econometrics

Lab 07 Introduction to Econometrics Lab 07 Introduction to Econometrics Learning outcomes for this lab: Introduce the different typologies of data and the econometric models that can be used Understand the rationale behind econometrics Understand

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

Applied Statistics and Econometrics

Applied Statistics and Econometrics Applied Statistics and Econometrics Lecture 6 Saul Lach September 2017 Saul Lach () Applied Statistics and Econometrics September 2017 1 / 53 Outline of Lecture 6 1 Omitted variable bias (SW 6.1) 2 Multiple

More information

10 Panel Data. Andrius Buteikis,

10 Panel Data. Andrius Buteikis, 10 Panel Data Andrius Buteikis, andrius.buteikis@mif.vu.lt http://web.vu.lt/mif/a.buteikis/ Introduction Panel data combines cross-sectional and time series data: the same individuals (persons, firms,

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

Lecture 4: Linear panel models

Lecture 4: Linear panel models Lecture 4: Linear panel models Luc Behaghel PSE February 2009 Luc Behaghel (PSE) Lecture 4 February 2009 1 / 47 Introduction Panel = repeated observations of the same individuals (e.g., rms, workers, countries)

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

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

ECON Introductory Econometrics. Lecture 5: OLS with One Regressor: Hypothesis Tests

ECON Introductory Econometrics. Lecture 5: OLS with One Regressor: Hypothesis Tests ECON4150 - Introductory Econometrics Lecture 5: OLS with One Regressor: Hypothesis Tests Monique de Haan (moniqued@econ.uio.no) Stock and Watson Chapter 5 Lecture outline 2 Testing Hypotheses about one

More information

Ninth ARTNeT Capacity Building Workshop for Trade Research "Trade Flows and Trade Policy Analysis"

Ninth ARTNeT Capacity Building Workshop for Trade Research Trade Flows and Trade Policy Analysis Ninth ARTNeT Capacity Building Workshop for Trade Research "Trade Flows and Trade Policy Analysis" June 2013 Bangkok, Thailand Cosimo Beverelli and Rainer Lanz (World Trade Organization) 1 Selected econometric

More information

Panel Data III. Stefan Dahlberg

Panel Data III. Stefan Dahlberg Panel Data III Stefan Dahlberg Overview of Part #3 VII. Spatial Panel Data & Unit Heterogeneity VIII. Panel Corrected Standard Errors (PCSE) IX. Fixed and Random Effects X. Hausman Test XI. The Hybrid

More information

Panel data methods for policy analysis

Panel data methods for policy analysis IAPRI Quantitative Analysis Capacity Building Series Panel data methods for policy analysis Part I: Linear panel data models Outline 1. Independently pooled cross sectional data vs. panel/longitudinal

More information

ECO220Y Simple Regression: Testing the Slope

ECO220Y Simple Regression: Testing the Slope ECO220Y Simple Regression: Testing the Slope Readings: Chapter 18 (Sections 18.3-18.5) Winter 2012 Lecture 19 (Winter 2012) Simple Regression Lecture 19 1 / 32 Simple Regression Model y i = β 0 + β 1 x

More information

1. You have data on years of work experience, EXPER, its square, EXPER2, years of education, EDUC, and the log of hourly wages, LWAGE

1. You have data on years of work experience, EXPER, its square, EXPER2, years of education, EDUC, and the log of hourly wages, LWAGE 1. You have data on years of work experience, EXPER, its square, EXPER, years of education, EDUC, and the log of hourly wages, LWAGE You estimate the following regressions: (1) LWAGE =.00 + 0.05*EDUC +

More information

Fixed Effects Models for Panel Data. December 1, 2014

Fixed Effects Models for Panel Data. December 1, 2014 Fixed Effects Models for Panel Data December 1, 2014 Notation Use the same setup as before, with the linear model Y it = X it β + c i + ɛ it (1) where X it is a 1 K + 1 vector of independent variables.

More information

Heteroskedasticity Example

Heteroskedasticity Example ECON 761: Heteroskedasticity Example L Magee November, 2007 This example uses the fertility data set from assignment 2 The observations are based on the responses of 4361 women in Botswana s 1988 Demographic

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

ECON2228 Notes 2. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 47

ECON2228 Notes 2. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 47 ECON2228 Notes 2 Christopher F Baum Boston College Economics 2014 2015 cfb (BC Econ) ECON2228 Notes 2 2014 2015 1 / 47 Chapter 2: The simple regression model Most of this course will be concerned with

More information

Problem Set #5-Key Sonoma State University Dr. Cuellar Economics 317- Introduction to Econometrics

Problem Set #5-Key Sonoma State University Dr. Cuellar Economics 317- Introduction to Econometrics Problem Set #5-Key Sonoma State University Dr. Cuellar Economics 317- Introduction to Econometrics C1.1 Use the data set Wage1.dta to answer the following questions. Estimate regression equation wage =

More information