getspanel: Getting Started

The getspanel package can be downloaded and installed from GitHub.

The package can be installed using:

# install.packages("devtools")
devtools::install_github("moritzpschwarz/getspanel")

Once installed we need to load the library:

library(getspanel)

Currently the package is called getspanel to align with the gets package, but it’s main function of course remains the isatpanel function.

A quick overview over what has changed:

The isatpanel function

We first load some data of EU CO2 Emissions in the housing sector.

data("EUCO2residential")
head(EUCO2residential)
# A tibble: 6 × 9
  country  year  lgdp  lhdd  lcdd urban av.rate     pop agg.directem
  <chr>   <dbl> <dbl> <dbl> <dbl> <dbl>   <dbl>   <dbl>        <dbl>
1 Austria  1969  25.6    NA    NA  65.2      NA      NA           NA
2 Austria  1970  25.7    NA    NA  65.3      NA      NA           NA
3 Austria  1971  25.8    NA    NA  65.3      NA 7500482           NA
4 Austria  1972  25.8    NA    NA  65.3      NA 7544201           NA
5 Austria  1973  25.9    NA    NA  65.3      NA 7586115           NA
6 Austria  1974  25.9    NA    NA  65.3      NA 7599038           NA

# let's subset this a little bit to speed this up
EUCO2residential <- EUCO2residential[EUCO2residential$year > 2000 & 
                                       EUCO2residential$country %in% c("Germany", "Austria",
                                                                       "Belgium", "Italy", 
                                                                       "Sweden", "Denmark"),]

# and let's also turn off printing the intermediate output from isatpanel
options(print.searchoutput = FALSE)

Let’s look at how we input what we want to model. Each isatpanel command takes:

Basics

  1. In the gets package style i.e. using vectors and matrices to specify y, mxreg, time and id

  2. But also in a form that resembles the lm and plm specification i.e. inputting a data.frame (or matrix or tibble), a formula argument as well as character vectors for index (in the form c("group_variable_name", "time_variable_name"))

This already means that the following two commands will give the same result:

Using the new method

is_lm <- isatpanel(data = EUCO2residential,
                   formula = lagg.directem_pc ~ lgdp, 
                   index = c("country","year"),
                   
                   effect = "twoways",
                   
                   fesis = TRUE)
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found

Using the traditional method

is_gets <- isatpanel(y = EUCO2residential$lagg.directem_pc,
                     mxreg = EUCO2residential$lgdp,
                     time = EUCO2residential$year,
                     id = EUCO2residential$country,

                     effect = "twoways",

                     fesis = TRUE)
Warning: Unknown or uninitialised column: `lagg.directem_pc`.
Error in data.frame(id, time, y, mxreg): arguments imply differing number of rows: 216, 0

From here onwards, I will use the lm notation.

Plotting

We can plot these simply using the default plotting methods (rely on the ggplot2 package):

plot(is_lm)
Error in plot(is_lm): object 'is_lm' not found
plot_grid(is_lm)
Error in plot_grid(is_lm): object 'is_lm' not found
plot_counterfactual(is_lm)
Error in plot_counterfactual(is_lm): object 'is_lm' not found

Saturation Methods

Impulse Indicator Saturation

This argument works just as in the gets package. The method simply adds a 0 and 1 dummy for each observation.

Simply set iis = TRUE.

iis_example <- isatpanel(data = EUCO2residential,
                         formula = lagg.directem_pc ~ lgdp,
                         index = c("country","year"),

                         effect = "twoways",

                         iis = TRUE)
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found
plot(iis_example)
Error in plot(iis_example): object 'iis_example' not found

Step Indicator Saturation

Traditional Step Indicator Saturation does not make sense in a panel setting. Therefore, the gets function of sis is disabled.

Joint Step Indicator Saturation

It is possible, however, to consider Step Indicator Saturation with common breaks across individuals. Such indicators would be collinear, if effects = c("twoways") or effects = c("time") i.e. if Time Fixed Effects are included.

If, however, effect = "individual" then we can use jsis = TRUE to select over all individual time fixed effects.

jsis_example <- isatpanel(data = EUCO2residential,
                          formula = lagg.directem_pc ~ lgdp,
                          index = c("country","year"),

                          effect = "twoways",

                          jsis = TRUE)
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found
plot(jsis_example)
Error in plot(jsis_example): object 'jsis_example' not found

Coefficient Step Indicator Saturation

Note: This method has only been tested using the lm implementation (using data, formula, and index).

This method allows detection of coefficient breaks that are common across all groups. It is the interaction between jsis and the relevant coefficient.

To illustrate this, as well as the advantages of using the lm approach, we include a non-linear term of the lgdperature variable using I(lgdp^2):

csis_example <- isatpanel(data = EUCO2residential,
                          formula = lagg.directem_pc ~ lgdp + I(lgdp^2),
                          index = c("country","year"),

                          effect = "twoways",

                          csis = TRUE)
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found
plot(csis_example)
Error in plot(csis_example): object 'csis_example' not found

By default, all coefficients will be interacted and added to the indicator list - but his can be controlled using the csis_var, which takes a character vector of column names i.e. csis_var = "lgdp".

csis_example2 <- isatpanel(data = EUCO2residential,
                           formula = lagg.directem_pc ~ lgdp + I(lgdp^2),
                           index = c("country","year"),

                           effect = "twoways",

                           csis = TRUE,
                           csis_var = "lgdp")
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found

Fixed Effect Step Indicator Saturation

This is equivalent to supplying a constant to the mxbreak argument in the old method. This essentially breaks the group-specific intercept i.e. the individual fixed effect.

fesis_example <- isatpanel(data = EUCO2residential,
                           formula = lagg.directem_pc ~ lgdp + I(lgdp^2),
                           index = c("country","year"),

                           effect = "twoways",

                           fesis = TRUE)
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found
plot(fesis_example)
Error in plot(fesis_example): object 'fesis_example' not found

Similar to the csis_var idea, we can specify the fesis method for a subset of individuals as well using the fesis_id variable, which takes a character vector of individuals. In this case we can use e.g. fesis_id = c("2","3").

fesis_example2 <- isatpanel(data = EUCO2residential,
                           formula = lagg.directem_pc ~ lgdp + I(lgdp^2),
                           index = c("country","year"),

                           effect = "twoways",

                           fesis = TRUE,
                           fesis_id = c("2","3"))
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found
plot(fesis_example2)
Error in plot(fesis_example2): object 'fesis_example2' not found

Coefficient Fixed Effect Step Indicator Saturation

This method combines the csis and the fesis approach and detects whether coefficients for individual units break over time.

This means we can also combine the subsetting in both the variable and in the individual units using cfesis_id and cfesis_var.

cfesis_example <- isatpanel(data = EUCO2residential,
                            formula = lagg.directem_pc ~ lgdp + I(lgdp^2),
                            index = c("country","year"),

                            effect = "twoways",

                            cfesis = TRUE,
                            cfesis_id = c("2","3"),
                            cfesis_var = "lgdp")
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found
plot(cfesis_example)
Error in plot(cfesis_example): object 'cfesis_example' not found

The ar argument

It is now possible to specify an argument to include autoregressive coefficients, using the ar argument.

fesis_ar1_example <- isatpanel(data = EUCO2residential,
                               formula = lagg.directem_pc ~ lgdp + I(lgdp^2),
                               index = c("country","year"),

                               effect = "twoways",

                               fesis = TRUE,

                               ar = 1)
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found

Post-selection robustness

The options for the robust.isatpanel are to use HAC Standard Errors, use a standard White Standard Error Correction (with the option of clustering the S.E. within groups or time):

robust.isatpanel(fesis_ar1_example, HAC = TRUE, robust = TRUE, cluster = "group")
Error in robust.isatpanel(fesis_ar1_example, HAC = TRUE, robust = TRUE, : object 'fesis_ar1_example' not found

The engine argument

Another new argument is also the engine argument. This allows us to use an external package to estimate our models. At this stage, the fixest package can be used.

This also means that we can now use an argument to cluster Standard Errors using cluster.

fixest_example <- isatpanel(data = EUCO2residential,
                            formula = lagg.directem_pc ~ lgdp,
                            index = c("country","year"),

                            effect = "twoways",

                            fesis = TRUE,

                            engine = "fixest",
                            cluster = "none")
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found

We can verify that, using no clustering of Standard Errors at all, using the fixest package does not change our estimates:

head(fixest_example$isatpanel.result$mean.results)
Error in head(fixest_example$isatpanel.result$mean.results): object 'fixest_example' not found

Compared to the default estimator:

head(is_lm$isatpanel.result$mean.results)
Error in head(is_lm$isatpanel.result$mean.results): object 'is_lm' not found

However, changing the cluster specification of course does. The Standard Error correction with it’s current implementation is not valid, so allows for many more indicators than true - therefore clustering is therefore not recommended.

fixest_example_cluster <- isatpanel(data = EUCO2residential,
                                    formula = lagg.directem_pc ~ lgdp + I(lgdp^2),
                                    index = c("country","year"),

                                    effect = "twoways",

                                    fesis = TRUE,

                                    engine = "fixest",
                                    cluster = "individual")
Error in eval(predvars, data, env): object 'lagg.directem_pc' not found
plot(fixest_example_cluster)
Error in plot(fixest_example_cluster): object 'fixest_example_cluster' not found