This is a consolidated output of the various models

library(sjPlot)
library(sjmisc)
## Learn more about sjmisc with 'browseVignettes("sjmisc")'.
library(sjlabelled)

library(plm)

file_df <- read.csv("tripathi.csv")

View(file_df)

ols <- lm(CASBTA ~ roe + Year + LNMCAP + DGP + DMANU, data=file_df)

fixed.dum <-lm(CASBTA ~ factor(DGP) - 1, data = file_df)

random <- plm(CASBTA ~ roe, data=file_df, model="random")

tsls1<-lm(CASBTA~ roe + LNMCAP, data = file_df)

tab_model(ols, fixed.dum, random, tsls1)
  CASBTA CASBTA CASBTA CASBTA
Predictors Estimates CI p Estimates CI p Estimates CI p Estimates CI p
(Intercept) -10.79 -16.07 – -5.52 <0.001 0.20 0.19 – 0.21 <0.001 -0.04 -0.06 – -0.02 <0.001
roe -0.01 -0.05 – 0.02 0.368 0.01 -0.00 – 0.03 0.102 -0.04 -0.07 – -0.01 0.014
Year 0.01 0.00 – 0.01 <0.001
LNMCAP 0.03 0.03 – 0.03 <0.001 0.03 0.03 – 0.03 <0.001
DGP 0.02 0.01 – 0.03 <0.001
DMANU -0.10 -0.11 – -0.09 <0.001
DGP [0] 0.18 0.18 – 0.19 <0.001
DGP [1] 0.22 0.21 – 0.23 <0.001
Observations 6709 6709 6709 6709
R2 / R2 adjusted 0.140 / 0.139 0.511 / 0.511 0.001 / 0.001 0.083 / 0.083