1 DATA PREPARATION

## Data loading

#metadata <- import("1-CEO-20241210.csv")%>%setDT()
metadata <- read_excel("1-CEO-20241210.xlsx", sheet = "final")%>%setDT()
#metadata <- rio::import("1-CEO-20250102.xlsx")%>%setDT()
#metadata <- rio::import(paste0(gsub("https://docs.google.com/spreadsheets/d/", "https://drive.google.com/uc?id=", gsub("/edit.*$", "", "https://docs.google.com/spreadsheets/d/1u7UGFGt2riUtZu8dC7CNx1n1Q0DkO7t-/edit?usp=sharing&ouid=115346063709313800668&rtpof=true&sd=true")), "&export=download"))%>%setDT()#Wrong variable format#https://docs.google.com/spreadsheets/d/18ZjrKpuvgrbtrhCoXBOIMwljFi7I7-Yl/edit?usp=sharing&ouid=115346063709313800668&rtpof=true&sd=true
#names(metadata)
#str(metadata)

## Reverse coding

metadata=metadata[, `:=`(Xreverse = fifelse(is.na(Xreverse), 1,fifelse(Xreverse == TRUE, -1, as.numeric(Xreverse))),
           Yrevese = fifelse(is.na(Yrevese), 1,fifelse(Yrevese == TRUE, -1, as.numeric(Yrevese))))]%>%
  .[, Xstructure := paste(X_rename,XOriginalName, sep = "#")]%>%
  .[, Ystructure := paste(Y_rename,YoriginalName, sep = "#")]%>%
  .[, Xr := paste(X_rename,XOriginalName, Xreverse, sep = "#")]%>%
  .[, Yr := paste(Y_rename,YoriginalName, Yrevese, sep = "#")]%>%
  .[, `:=`(N = fifelse(is.na(N), 250, N))]
#Freq(metadata$Xreverse)
#unique(metadata$Yrevese)
metadata <-added(metadata,{
  rxy=rxyi*Xreverse*Yrevese
  rxx=1
  ryy=1
  })

## Impute missing value 

#metadata[, `:=`(realibility_X = fifelse(is.na(realibility_X), 1, realibility_X),
#                realibility_Y = fifelse(is.na(realibility_Y), 1, realibility_Y),
#                N = as.numeric(N))]
#metadata[, `:=`(N = fifelse(is.na(N), 250, N))]
#FreqTrX=FreqT(metadata$realibility_X)
#Freq(metadata$rxx)
#Freq(metadata$sample_id)
#Describe(metadata)
Variables <- rbind(
  data.table(Variable = metadata$X_rename),
  data.table(Variable = metadata$Y_rename)
)

1.1 CEO variable

CEOVariable=FreqT(Variables[grepl("CEO", Variable, ignore.case = TRUE)]$Variable)
## Frequency Statistics:
## ────────────────────────────────────────────────────
##                                               N    %
## ────────────────────────────────────────────────────
## CEO age                                    4936  7.0
## CEO duality                                5623  8.0
## CEO education level                        2963  4.2
## CEO elite education                         266  0.4
## CEO Ethnicity                                43  0.1
## CEO family characteristic                   591  0.8
## CEO gender                                 1729  2.5
## CEO human capital                            74  0.1
## CEO Leadership behavior                    1809  2.6
## CEO long-term incentive pay                7578 10.8
## CEO managerial ability                      907  1.3
## CEO nationality                             194  0.3
## CEO perquisites                              17  0.0
## CEO power                                  9790 13.9
## CEO prior career experience and expertise  7831 11.1
## CEO self-concept                           6522  9.3
## CEO social capital                         3225  4.6
## CEO succession                              848  1.2
## CEO tenure                                 7655 10.9
## CEO total pay                              6534  9.3
## Demographic similarity (CEO VS TMT)        1185  1.7
## Minority CEO                                118  0.2
## ────────────────────────────────────────────────────
## Total N = 70,438
## Number of categories for this variable: 22

1.2 Correlates

Correlates=FreqT(Variables[!grepl("CEO", Variable, ignore.case = TRUE)]$Variable)
## Frequency Statistics:
## ──────────────────────────────────────────────────────
##                                                 N    %
## ──────────────────────────────────────────────────────
## Board power                                  8121  5.4
## Board, TMT & Employee career success         2038  1.3
## Board, TMT & Employee human capital         11519  7.6
## Certification awards and Social reputation   1241  0.8
## Chairman power                                 96  0.1
## Compensation committee monitoring            1481  1.0
## Consultant influence                          173  0.1
## Country's socio-economic level                615  0.4
## Country governance quality                     49  0.0
## Employee and manager performance              253  0.2
## Environment turbulence                       3688  2.4
## External supervision                         4700  3.1
## Financial performance                       21028 13.9
## Firm risk taking                            33877 22.4
## firms Characteristics (Firm prestige)           3  0.0
## Firms Characteristics (Firm prestige)       28703 19.0
## General performance                          3699  2.4
## Industry Performance                         3654  2.4
## Insider power                                1176  0.8
## Institution                                  1050  0.7
## Institutional investor power                 3057  2.0
## Labor market                                  102  0.1
## Labor union power                              44  0.0
## Large owners power                           1495  1.0
## M                                            1535  1.0
## Nominating committee power                    106  0.1
## Operational performance                      4514  3.0
## Ownership concentration                       648  0.4
## Peer-group control                             80  0.1
## Region                                       1201  0.8
## Religion                                       75  0.0
## Shareholder power                             511  0.3
## State/public-owned                            799  0.5
## Subjective performance                        422  0.3
## Tax Performance                               441  0.3
## Voting rights                                  73  0.0
## X                                            9043  6.0
## (NA)                                           64  0.0
## ──────────────────────────────────────────────────────
## Total N = 151,374
## Valid N = 151,310
## Number of categories for this variable: 38

2 MATE-ANALYSIS

DATAmeta<- ma_r(rxyi = rxy, n = N,
                construct_x = X_rename,construct_y = Y_rename,
                rxx = realibility_X,ryy = realibility_Y,
                sample_id ="sample_id",collapse_method = "average",
                ma_method = "ic",control=control_psychmeta(hs_override = TRUE),
                moderators = c("HI1VC2HC3VI4"), cat_moderators=TRUE,
                data = metadata)
##  **** Running ma_r: Meta-analysis of correlations **** 
##  Cleaning reliability information
CEOResults = HSOutput(data = DATAmeta, NewVariables = cc("SE, HI1VC2HC3VI4"), Order = "construct_y", title = "")#,Cnote=T)

FullResults <- CEOResults[grepl("CEO", construct_x, ignore.case = TRUE) |
                            grepl("CEO", construct_y, ignore.case = TRUE)]%>%
  .[, X := fifelse(
  grepl("ceo", construct_x, ignore.case = TRUE) &
    grepl("ceo", construct_y, ignore.case = TRUE),
  # 如果 construct_x 和 construct_y 都包含 "ceo",选择字母排序靠前的
  pmin(construct_x, construct_y),
  # 否则选择包含 "ceo" 的那个
  fifelse(grepl("ceo", construct_x, ignore.case = TRUE), construct_x, construct_y)
)]%>%
  .[, Y := fifelse(X == construct_x, construct_y, construct_x)]%>%
  #.[, c("construct_x", "construct_y") := NULL]%>%
  .[order(X, Y)]%>%
  setcolorder(., c("X", "Y", "HI1VC2HC3VI4"))

#head(CEOResults)%>%print_table()
#nrow(CEOResults)
Subgroups <- aHS.Subgroups(FullResults, "HI1VC2HC3VI4") # 按Moderator列进行分组
#  print_table = TRUE)    # 打印每个子组的数据表
#  note = TRUE,           # 显示英文说明
#  Cnote = FALSE          # 不显示中文说明
#)
print_table(Subgroups$`All Levels`[, cc("construct_x,construct_y,analysis_id,HI1VC2HC3VI4,SE") := NULL],title = "TABLE 1. Meta-analysis of all countries")#,file = "T1.doc",row.names = F)
## TABLE 1. Meta-analysis of all countries
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                              X                                          Y       k          N mean_r sd_res mean_rho sd_rho CI_LL_95 CI_UL_95 CR_LL_80 CR_UL_80
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## 1    CEO Ethnicity                             Board power                                  2.000  10399.000  0.017  0.000    0.017  0.000   -0.001    0.036    0.017    0.017
## 2    CEO Ethnicity                             Board, TMT & Employee human capital          3.000  11359.000 -0.013  0.010   -0.013  0.010   -0.034    0.009   -0.025   -0.000
## 3    CEO Ethnicity                             CEO gender                                   2.000  10399.000  0.032  0.000    0.032  0.000    0.019    0.044    0.032    0.032
## 4    CEO Ethnicity                             CEO nationality                              1.000    960.000 -0.481          -0.481          -0.530   -0.433   -0.481   -0.481
## 5    CEO Ethnicity                             CEO power                                    1.000    339.000 -0.004          -0.004          -0.111    0.103   -0.004   -0.004
## 6    CEO Ethnicity                             CEO prior career experience and expertise    1.000    339.000  0.020           0.020          -0.087    0.127    0.020    0.020
## 7    CEO Ethnicity                             CEO social capital                           1.000    339.000 -0.010          -0.010          -0.117    0.097   -0.010   -0.010
## 8    CEO Ethnicity                             CEO tenure                                   2.000  10399.000 -0.021  0.000   -0.021  0.000   -0.028   -0.014   -0.021   -0.021
## 9    CEO Ethnicity                             CEO total pay                                1.000  10060.000  0.070           0.070           0.051    0.089    0.070    0.070
## 10   CEO Ethnicity                             Environment turbulence                       1.000    339.000  0.030           0.030          -0.076    0.137    0.030    0.030
## 11   CEO Ethnicity                             Financial performance                        2.000  11020.000 -0.014  0.000   -0.014  0.000   -0.020   -0.007   -0.014   -0.014
## 12   CEO Ethnicity                             Firm risk taking                             3.000  11359.000  0.030  0.000    0.030  0.000    0.015    0.046    0.030    0.030
## 13   CEO Ethnicity                             Firms Characteristics (Firm prestige)        3.000  11359.000  0.009  0.000    0.009  0.000   -0.001    0.019    0.009    0.009
## 14   CEO Ethnicity                             Institution                                  1.000  10060.000  0.010           0.010          -0.010    0.030    0.010    0.010
## 15   CEO Ethnicity                             Institutional investor power                 1.000  10060.000  0.020           0.020           0.000    0.040    0.020    0.020
## 16   CEO Ethnicity                             Minority CEO                                 1.000  10060.000  0.670           0.670           0.659    0.681    0.670    0.670
## 17   CEO Ethnicity                             X                                            1.000    339.000 -0.070          -0.070          -0.176    0.036   -0.070   -0.070
## 18   CEO Leadership behavior                   Board power                                  9.000  16646.000  0.009  0.078    0.007  0.079   -0.046    0.061   -0.094    0.108
## 19   CEO Leadership behavior                   Board, TMT & Employee career success         5.000   3042.000  0.046  0.118    0.047  0.131   -0.074    0.169   -0.120    0.215
## 20   CEO Leadership behavior                   Board, TMT & Employee human capital         30.000  11132.000  0.064  0.079    0.066  0.084    0.030    0.102   -0.042    0.174
## 21   CEO Leadership behavior                   CEO Leadership behavior                     51.000  22461.000  0.348  0.181    0.412  0.215    0.351    0.472    0.137    0.687
## 22   CEO Leadership behavior                   CEO long-term incentive pay                  6.000   3096.000  0.133  0.194    0.134  0.199   -0.029    0.297   -0.121    0.389
## 23   CEO Leadership behavior                   CEO managerial ability                       5.000   3254.000  0.403  0.098    0.426  0.097    0.336    0.516    0.302    0.550
## 24   CEO Leadership behavior                   CEO perquisites                              1.000    793.000  0.250           0.267           0.197    0.336    0.267    0.267
## 25   CEO Leadership behavior                   CEO power                                   15.000   8417.000  0.060  0.131    0.061  0.138   -0.013    0.134   -0.116    0.238
## 26   CEO Leadership behavior                   CEO prior career experience and expertise   11.000   6962.000  0.009  0.108    0.010  0.111   -0.060    0.079   -0.132    0.151
## 27   CEO Leadership behavior                   CEO self-concept                            47.000  22744.000  0.152  0.136    0.178  0.175    0.126    0.231   -0.045    0.402
## 28   CEO Leadership behavior                   CEO social capital                           4.000   4837.000  0.144  0.047    0.151  0.054    0.091    0.211    0.082    0.220
## 29   CEO Leadership behavior                   CEO tenure                                  31.000   9144.000  0.007  0.060    0.007  0.062   -0.023    0.038   -0.073    0.087
## 30   CEO Leadership behavior                   CEO total pay                                3.000   1068.000  0.242  0.020    0.255  0.025    0.189    0.322    0.223    0.287
## 31   CEO Leadership behavior                   Certification awards and Social reputation   1.000    367.000 -0.023          -0.023          -0.126    0.079   -0.023   -0.023
## 32   CEO Leadership behavior                   Compensation committee monitoring            2.000   1051.000  0.013  0.203    0.013  0.203   -0.275    0.300   -0.247    0.273
## 33   CEO Leadership behavior                   Consultant influence                         1.000    175.000 -0.229          -0.229          -0.369   -0.088   -0.229   -0.229
## 34   CEO Leadership behavior                   Demographic similarity (CEO VS TMT)          4.000   4282.000  0.083  0.000    0.091  0.000    0.066    0.115    0.091    0.091
## 35   CEO Leadership behavior                   Employee and manager performance             9.000   4070.000  0.129  0.096    0.146  0.110    0.066    0.226    0.005    0.288
## 36   CEO Leadership behavior                   Environment turbulence                      19.000   4756.000  0.022  0.105    0.016  0.112   -0.043    0.075   -0.128    0.160
## 37   CEO Leadership behavior                   External supervision                         5.000  12333.000 -0.006  0.000   -0.006  0.000   -0.020    0.008   -0.006   -0.006
## 38   CEO Leadership behavior                   Financial performance                       28.000  21640.000  0.044  0.072    0.043  0.075    0.012    0.074   -0.054    0.140
## 39   CEO Leadership behavior                   Firm risk taking                            28.000  22681.000  0.042  0.095    0.042  0.097    0.003    0.080   -0.082    0.166
## 40   CEO Leadership behavior                   Firms Characteristics (Firm prestige)       66.000  32333.000  0.058  0.146    0.052  0.159    0.012    0.092   -0.152    0.255
## 41   CEO Leadership behavior                   General performance                         16.000   5948.000  0.168  0.153    0.177  0.160    0.095    0.260   -0.027    0.382
## 42   CEO Leadership behavior                   Industry Performance                        12.000   6544.000  0.215  0.057    0.265  0.081    0.211    0.319    0.161    0.369
## 43   CEO Leadership behavior                   Institution                                  1.000    623.000  0.285           0.408           0.305    0.511    0.408    0.408
## 44   CEO Leadership behavior                   Institutional investor power                 1.000    793.000  0.010           0.011          -0.064    0.085    0.011    0.011
## 45   CEO Leadership behavior                   Large owners power                           1.000    793.000  0.040           0.043          -0.031    0.117    0.043    0.043
## 46   CEO Leadership behavior                   M                                           19.000  12894.000  0.190  0.175    0.217  0.234    0.110    0.324   -0.082    0.517
## 47   CEO Leadership behavior                   Minority CEO                                 1.000   2101.000 -0.020          -0.022          -0.068    0.025   -0.022   -0.022
## 48   CEO Leadership behavior                   Operational performance                     15.000   3514.000  0.140  0.158    0.147  0.168    0.055    0.239   -0.069    0.363
## 49   CEO Leadership behavior                   Region                                       5.000   1416.000  0.014  0.063    0.010  0.065   -0.069    0.088   -0.074    0.093
## 50   CEO Leadership behavior                   Shareholder power                            2.000    968.000  0.183  0.192    0.197  0.197   -0.083    0.478   -0.055    0.450
## 51   CEO Leadership behavior                   State/public-owned                           3.000    576.000  0.008  0.000    0.008  0.000   -0.026    0.043    0.008    0.008
## 52   CEO Leadership behavior                   Subjective performance                       8.000   2438.000  0.200  0.139    0.215  0.153    0.101    0.329    0.019    0.411
## 53   CEO Leadership behavior                   X                                           26.000  11831.000  0.166  0.206    0.171  0.251    0.072    0.270   -0.151    0.493
## 54   CEO age                                   Board power                                127.000 208911.782 -0.017  0.068   -0.017  0.068   -0.029   -0.004   -0.104    0.071
## 55   CEO age                                   Board, TMT & Employee career success        12.000  22330.000  0.024  0.073    0.024  0.073   -0.019    0.068   -0.069    0.118
## 56   CEO age                                   Board, TMT & Employee human capital        128.000 198140.000  0.060  0.068    0.060  0.068    0.047    0.072   -0.027    0.147
## 57   CEO age                                   CEO Ethnicity                                3.000  11359.000 -0.031  0.000   -0.031  0.000   -0.035   -0.027   -0.031   -0.031
## 58   CEO age                                   CEO Leadership behavior                     18.000   4453.000 -0.016  0.000   -0.016  0.000   -0.042    0.010   -0.016   -0.016
## 59   CEO age                                   CEO age                                     19.000  28178.000  0.241  0.339    0.241  0.339    0.088    0.394   -0.194    0.676
## 60   CEO age                                   CEO duality                                135.000 316829.010  0.134  0.110    0.134  0.110    0.115    0.153   -0.007    0.275
## 61   CEO age                                   CEO education level                         79.000  97430.000 -0.067  0.088   -0.067  0.088   -0.087   -0.046   -0.179    0.046
## 62   CEO age                                   CEO elite education                          6.000   9259.000 -0.042  0.000   -0.042  0.000   -0.056   -0.027   -0.042   -0.042
## 63   CEO age                                   CEO family characteristic                    4.000  11228.000  0.087  0.032    0.087  0.032    0.051    0.123    0.046    0.128
## 64   CEO age                                   CEO gender                                  66.000 168641.000  0.008  0.060    0.008  0.060   -0.007    0.023   -0.068    0.085
## 65   CEO age                                   CEO long-term incentive pay                 76.000 236090.496  0.016  0.071    0.016  0.071   -0.001    0.032   -0.075    0.106
## 66   CEO age                                   CEO managerial ability                       8.000   6466.000 -0.007  0.117   -0.007  0.117   -0.091    0.078   -0.157    0.144
## 67   CEO age                                   CEO nationality                              4.000   2420.000  0.072  0.000    0.072  0.000    0.033    0.111    0.072    0.072
## 68   CEO age                                   CEO power                                  143.000 267093.000  0.070  0.095    0.070  0.095    0.054    0.086   -0.051    0.191
## 69   CEO age                                   CEO prior career experience and expertise  114.000 134686.047  0.027  0.094    0.027  0.094    0.009    0.045   -0.094    0.148
## 70   CEO age                                   CEO self-concept                            65.000  71756.338  0.009  0.044    0.009  0.044   -0.004    0.022   -0.048    0.066
## 71   CEO age                                   CEO social capital                          24.000  43782.000  0.076  0.047    0.076  0.047    0.055    0.097    0.016    0.137
## 72   CEO age                                   CEO succession                              16.000  19774.000 -0.013  0.169   -0.013  0.169   -0.097    0.071   -0.230    0.204
## 73   CEO age                                   CEO tenure                                 198.000 417491.856  0.322  0.152    0.322  0.152    0.300    0.343    0.127    0.516
## 74   CEO age                                   CEO total pay                               83.000 225988.000  0.027  0.057    0.027  0.057    0.014    0.040   -0.046    0.101
## 75   CEO age                                   Certification awards and Social reputation  19.000  23882.000  0.028  0.041    0.028  0.041    0.005    0.050   -0.025    0.080
## 76   CEO age                                   Compensation committee monitoring           19.000  20286.000  0.081  0.064    0.081  0.064    0.049    0.113   -0.001    0.164
## 77   CEO age                                   Consultant influence                         2.000    587.000  0.065  0.000    0.065  0.000    0.057    0.073    0.065    0.065
## 78   CEO age                                   Country governance quality                   2.000    540.000 -0.049  0.064   -0.049  0.064   -0.172    0.073   -0.131    0.033
## 79   CEO age                                   Country's socio-economic level              10.000  13108.000 -0.043  0.082   -0.043  0.082   -0.097    0.010   -0.149    0.062
## 80   CEO age                                   Demographic similarity (CEO VS TMT)          5.000   8444.000  0.017  0.111    0.017  0.111   -0.082    0.117   -0.125    0.160
## 81   CEO age                                   Employee and manager performance             1.000    262.000  0.070           0.076          -0.055    0.206    0.076    0.076
## 82   CEO age                                   Environment turbulence                      68.000 130024.000 -0.016  0.051   -0.016  0.051   -0.029   -0.002   -0.082    0.050
## 83   CEO age                                   External supervision                        25.000  85375.000  0.009  0.037    0.009  0.037   -0.007    0.025   -0.038    0.057
## 84   CEO age                                   Financial performance                      202.000 440237.830  0.001  0.045    0.001  0.045   -0.006    0.007   -0.057    0.058
## 85   CEO age                                   Firm risk taking                           234.000 455699.375  0.001  0.067    0.001  0.067   -0.008    0.010   -0.084    0.087
## 86   CEO age                                   Firms Characteristics (Firm prestige)      271.000 450923.920  0.067  0.069    0.067  0.069    0.059    0.076   -0.021    0.156
## 87   CEO age                                   General performance                         52.000  53821.718 -0.010  0.054   -0.010  0.055   -0.027    0.007   -0.080    0.060
## 88   CEO age                                   Industry Performance                        47.000  63518.000 -0.030  0.053   -0.030  0.053   -0.047   -0.013   -0.098    0.037
## 89   CEO age                                   Insider power                               19.000  32249.000  0.020  0.060    0.020  0.060   -0.009    0.049   -0.057    0.097
## 90   CEO age                                   Institution                                 23.000  56086.000 -0.034  0.049   -0.034  0.049   -0.056   -0.013   -0.097    0.028
## 91   CEO age                                   Institutional investor power                49.000 164794.000 -0.013  0.065   -0.013  0.065   -0.031    0.006   -0.096    0.070
## 92   CEO age                                   Labor market                                 5.000   2899.000  0.045  0.037    0.045  0.037   -0.004    0.093   -0.003    0.092
## 93   CEO age                                   Large owners power                          22.000  27045.000  0.008  0.029    0.008  0.029   -0.009    0.025   -0.028    0.045
## 94   CEO age                                   M                                           14.000  18525.000  0.064  0.063    0.064  0.063    0.029    0.100   -0.016    0.145
## 95   CEO age                                   Minority CEO                                 2.000  11410.000 -0.062  0.047   -0.062  0.047   -0.129    0.005   -0.122   -0.002
## 96   CEO age                                   Nominating committee power                   2.000    659.000 -0.027  0.000   -0.027  0.000   -0.047   -0.007   -0.027   -0.027
## 97   CEO age                                   Operational performance                     68.000  98803.000 -0.040  0.065   -0.040  0.065   -0.057   -0.024   -0.124    0.043
## 98   CEO age                                   Ownership concentration                     13.000  12171.000 -0.004  0.000   -0.004  0.000   -0.021    0.014   -0.004   -0.004
## 99   CEO age                                   Region                                       8.000   6347.000  0.022  0.041    0.022  0.041   -0.015    0.060   -0.030    0.075
## 100  CEO age                                   Shareholder power                            8.000  35033.000  0.049  0.007    0.049  0.007    0.038    0.060    0.041    0.058
## 101  CEO age                                   State/public-owned                          17.000  42408.000  0.044  0.042    0.044  0.042    0.022    0.066   -0.010    0.097
## 102  CEO age                                   Subjective performance                       7.000   3928.000  0.029  0.066    0.029  0.066   -0.029    0.087   -0.056    0.114
## 103  CEO age                                   Tax Performance                              3.000  11648.000  0.010  0.000    0.010  0.000   -0.003    0.023    0.010    0.010
## 104  CEO age                                   Voting rights                                1.000    267.000 -0.006          -0.006          -0.126    0.114   -0.006   -0.006
## 105  CEO age                                   X                                           89.000 139098.861  0.020  0.071    0.020  0.071    0.004    0.036   -0.071    0.112
## 106  CEO duality                               Board power                                205.000 358248.174  0.038  0.101    0.038  0.101    0.024    0.053   -0.091    0.168
## 107  CEO duality                               Board, TMT & Employee career success        24.000  46155.000 -0.037  0.060   -0.037  0.060   -0.062   -0.011   -0.113    0.040
## 108  CEO duality                               Board, TMT & Employee human capital        167.000 305353.388  0.027  0.106    0.027  0.106    0.010    0.043   -0.109    0.163
## 109  CEO duality                               CEO Leadership behavior                      2.000   1169.000 -0.043  0.000   -0.043  0.000   -0.068   -0.017   -0.043   -0.043
## 110  CEO duality                               CEO duality                                 12.000  46880.000  0.355  0.315    0.355  0.315    0.177    0.533   -0.048    0.758
## 111  CEO duality                               CEO education level                         35.000  88299.000  0.004  0.063    0.004  0.063   -0.018    0.026   -0.076    0.085
## 112  CEO duality                               CEO elite education                         11.000  13887.000  0.040  0.070    0.040  0.070   -0.005    0.084   -0.050    0.130
## 113  CEO duality                               CEO family characteristic                    1.000   2240.000  0.140           0.140           0.099    0.181    0.140    0.140
## 114  CEO duality                               CEO gender                                  41.000 152410.000  0.028  0.052    0.028  0.052    0.012    0.045   -0.038    0.095
## 115  CEO duality                               CEO long-term incentive pay                111.000 310948.000  0.052  0.092    0.052  0.092    0.035    0.069   -0.066    0.170
## 116  CEO duality                               CEO managerial ability                      10.000  12920.000 -0.022  0.062   -0.022  0.062   -0.064    0.020   -0.101    0.057
## 117  CEO duality                               CEO nationality                              3.000   2686.000 -0.036  0.026   -0.036  0.026   -0.084    0.012   -0.069   -0.003
## 118  CEO duality                               CEO power                                  209.000 426077.829  0.097  0.115    0.097  0.115    0.081    0.113   -0.050    0.244
## 119  CEO duality                               CEO prior career experience and expertise   93.000 149568.000 -0.018  0.097   -0.018  0.097   -0.039    0.002   -0.142    0.106
## 120  CEO duality                               CEO self-concept                            48.000  79343.000  0.044  0.057    0.045  0.057    0.027    0.062   -0.028    0.117
## 121  CEO duality                               CEO social capital                          30.000  66815.000  0.154  0.204    0.154  0.204    0.081    0.228   -0.107    0.416
## 122  CEO duality                               CEO succession                              12.000   7088.000 -0.039  0.138   -0.039  0.138   -0.120    0.042   -0.215    0.137
## 123  CEO duality                               CEO tenure                                 210.000 506009.137  0.147  0.161    0.147  0.161    0.125    0.169   -0.059    0.353
## 124  CEO duality                               CEO total pay                              136.000 386729.000  0.058  0.067    0.058  0.067    0.047    0.070   -0.028    0.144
## 125  CEO duality                               Certification awards and Social reputation  22.000  14796.000  0.049  0.039    0.049  0.039    0.026    0.072   -0.001    0.098
## 126  CEO duality                               Chairman power                               1.000    385.000 -0.183          -0.183          -0.280   -0.087   -0.183   -0.183
## 127  CEO duality                               Compensation committee monitoring           37.000  96487.000 -0.023  0.088   -0.023  0.088   -0.052    0.006   -0.135    0.089
## 128  CEO duality                               Consultant influence                         2.000    587.000  0.015  0.000    0.015  0.000   -0.053    0.083    0.015    0.015
## 129  CEO duality                               Country governance quality                   2.000    782.000 -0.003  0.000   -0.003  0.000   -0.072    0.066   -0.003   -0.003
## 130  CEO duality                               Country's socio-economic level               9.000  13524.000  0.075  0.066    0.075  0.066    0.029    0.121   -0.009    0.159
## 131  CEO duality                               Demographic similarity (CEO VS TMT)          9.000  13976.000 -0.008  0.058   -0.008  0.058   -0.049    0.033   -0.082    0.066
## 132  CEO duality                               Environment turbulence                      53.000 141191.000 -0.012  0.027   -0.012  0.027   -0.021   -0.003   -0.047    0.023
## 133  CEO duality                               External supervision                        51.000 189704.000  0.019  0.079    0.019  0.079   -0.003    0.041   -0.082    0.120
## 134  CEO duality                               Financial performance                      261.000 559735.103 -0.000  0.053   -0.000  0.053   -0.007    0.007   -0.068    0.068
## 135  CEO duality                               Firm risk taking                           289.000 625235.434 -0.003  0.045   -0.003  0.045   -0.009    0.002   -0.061    0.054
## 136  CEO duality                               Firms Characteristics (Firm prestige)      294.000 570383.179  0.053  0.122    0.053  0.122    0.039    0.067   -0.104    0.210
## 137  CEO duality                               General performance                         49.000  86630.000  0.013  0.044    0.013  0.044   -0.001    0.027   -0.043    0.069
## 138  CEO duality                               Industry Performance                        51.000 131297.000  0.003  0.023    0.003  0.023   -0.005    0.011   -0.026    0.032
## 139  CEO duality                               Insider power                               40.000  46442.000  0.004  0.135    0.004  0.135   -0.039    0.046   -0.169    0.176
## 140  CEO duality                               Institution                                 22.000  22847.000 -0.026  0.066   -0.026  0.066   -0.057    0.004   -0.112    0.059
## 141  CEO duality                               Institutional investor power                68.000 160851.000  0.031  0.102    0.031  0.102    0.006    0.055   -0.100    0.161
## 142  CEO duality                               Labor market                                 2.000   1747.000  0.020  0.000    0.020  0.000   -0.022    0.061    0.020    0.020
## 143  CEO duality                               Labor union power                            1.000     93.000  0.151           0.151          -0.049    0.351    0.151    0.151
## 144  CEO duality                               Large owners power                          50.000  70411.000 -0.038  0.066   -0.038  0.067   -0.058   -0.018   -0.123    0.047
## 145  CEO duality                               M                                           25.000  28384.000 -0.031  0.123   -0.031  0.123   -0.081    0.019   -0.189    0.127
## 146  CEO duality                               Nominating committee power                   6.000   3109.000  0.095  0.214    0.095  0.214   -0.080    0.270   -0.180    0.370
## 147  CEO duality                               Operational performance                     61.000 154931.000 -0.025  0.063   -0.025  0.063   -0.041   -0.008   -0.106    0.056
## 148  CEO duality                               Ownership concentration                     23.000  48105.000 -0.051  0.043   -0.051  0.043   -0.071   -0.032   -0.106    0.003
## 149  CEO duality                               Region                                       8.000   6003.000 -0.019  0.021   -0.019  0.021   -0.049    0.010   -0.047    0.008
## 150  CEO duality                               Shareholder power                           11.000  26409.000  0.081  0.059    0.081  0.059    0.044    0.118    0.006    0.156
## 151  CEO duality                               State/public-owned                          29.000 106914.000 -0.026  0.165   -0.026  0.165   -0.086    0.034   -0.237    0.185
## 152  CEO duality                               Subjective performance                       6.000   5793.000 -0.000  0.018    0.000  0.018   -0.030    0.030   -0.023    0.024
## 153  CEO duality                               Tax Performance                              7.000   3265.000  0.045  0.029    0.045  0.029    0.004    0.086    0.007    0.083
## 154  CEO duality                               Voting rights                                2.000   1083.000 -0.077  0.132   -0.077  0.132   -0.269    0.115   -0.246    0.092
## 155  CEO duality                               X                                           78.000 165144.861 -0.024  0.092   -0.024  0.092   -0.045   -0.003   -0.141    0.094
## 156  CEO education level                       Board power                                 33.000  43764.000  0.028  0.094    0.028  0.094   -0.005    0.061   -0.092    0.148
## 157  CEO education level                       Board, TMT & Employee career success         5.000  14755.000  0.025  0.000    0.025  0.000    0.013    0.038    0.025    0.025
## 158  CEO education level                       Board, TMT & Employee human capital         56.000  52420.000  0.042  0.112    0.042  0.112    0.011    0.073   -0.102    0.186
## 159  CEO education level                       CEO Ethnicity                                1.000    339.000 -0.020          -0.020          -0.127    0.087   -0.020   -0.020
## 160  CEO education level                       CEO Leadership behavior                     18.000   4066.000  0.088  0.148    0.092  0.155    0.014    0.171   -0.106    0.291
## 161  CEO education level                       CEO education level                         29.000  27516.000 -0.013  0.265   -0.013  0.265   -0.110    0.084   -0.353    0.327
## 162  CEO education level                       CEO elite education                          7.000  10558.000  0.101  0.035    0.101  0.035    0.069    0.133    0.056    0.146
## 163  CEO education level                       CEO family characteristic                    3.000  11286.000  0.010  0.053    0.010  0.053   -0.053    0.073   -0.059    0.078
## 164  CEO education level                       CEO gender                                  40.000  61173.000 -0.001  0.029   -0.001  0.029   -0.013    0.011   -0.039    0.036
## 165  CEO education level                       CEO human capital                            1.000    520.000  0.000           0.000          -0.086    0.086    0.000    0.000
## 166  CEO education level                       CEO long-term incentive pay                 22.000  25975.000  0.042  0.034    0.042  0.034    0.023    0.060   -0.003    0.086
## 167  CEO education level                       CEO managerial ability                       4.000   4522.000  0.271  0.145    0.272  0.145    0.127    0.416    0.086    0.457
## 168  CEO education level                       CEO nationality                              7.000   3722.000 -0.079  0.056   -0.079  0.056   -0.131   -0.026   -0.150   -0.007
## 169  CEO education level                       CEO power                                   44.000  33972.000  0.014  0.123    0.014  0.123   -0.024    0.052   -0.144    0.172
## 170  CEO education level                       CEO prior career experience and expertise   82.000  74401.000  0.038  0.074    0.038  0.074    0.021    0.056   -0.056    0.132
## 171  CEO education level                       CEO self-concept                            35.000  14178.000  0.086  0.169    0.088  0.171    0.029    0.147   -0.131    0.307
## 172  CEO education level                       CEO social capital                          19.000  31892.000  0.036  0.045    0.036  0.045    0.013    0.059   -0.022    0.094
## 173  CEO education level                       CEO succession                               5.000   5492.000 -0.021  0.025   -0.021  0.025   -0.056    0.014   -0.053    0.011
## 174  CEO education level                       CEO tenure                                  79.000  97489.000 -0.077  0.089   -0.077  0.089   -0.098   -0.057   -0.191    0.037
## 175  CEO education level                       CEO total pay                               28.000  85230.000  0.063  0.055    0.063  0.055    0.042    0.085   -0.007    0.134
## 176  CEO education level                       Certification awards and Social reputation   5.000   5059.000  0.021  0.047    0.021  0.047   -0.029    0.071   -0.040    0.082
## 177  CEO education level                       Compensation committee monitoring           11.000  25810.000  0.069  0.039    0.069  0.039    0.043    0.095    0.018    0.119
## 178  CEO education level                       Consultant influence                         2.000    170.000 -0.126  0.000   -0.126  0.000   -0.198   -0.055   -0.126   -0.126
## 179  CEO education level                       Country governance quality                   1.000    445.000  0.080           0.080          -0.012    0.173    0.080    0.080
## 180  CEO education level                       Country's socio-economic level               5.000   3596.000  0.027  0.045    0.027  0.045   -0.024    0.079   -0.031    0.085
## 181  CEO education level                       Demographic similarity (CEO VS TMT)          5.000   8603.000 -0.042  0.099   -0.042  0.099   -0.131    0.048   -0.169    0.086
## 182  CEO education level                       Employee and manager performance             3.000    704.000  0.021  0.000    0.023  0.000   -0.008    0.053    0.023    0.023
## 183  CEO education level                       Environment turbulence                      34.000  17744.000 -0.018  0.054   -0.018  0.054   -0.042    0.005   -0.088    0.051
## 184  CEO education level                       External supervision                        15.000  29501.000  0.014  0.058    0.014  0.058   -0.018    0.045   -0.060    0.088
## 185  CEO education level                       Financial performance                       75.000 116114.000  0.021  0.027    0.021  0.027    0.013    0.029   -0.013    0.055
## 186  CEO education level                       Firm risk taking                            93.000 118694.000  0.006  0.053    0.006  0.053   -0.006    0.018   -0.062    0.074
## 187  CEO education level                       Firms Characteristics (Firm prestige)      130.000  97436.259  0.037  0.070    0.037  0.070    0.023    0.050   -0.052    0.126
## 188  CEO education level                       General performance                         31.000  12823.000  0.026  0.094    0.026  0.095   -0.012    0.064   -0.096    0.148
## 189  CEO education level                       Industry Performance                        12.000   7761.000  0.022  0.039    0.022  0.039   -0.009    0.054   -0.028    0.072
## 190  CEO education level                       Insider power                                4.000   1498.000  0.020  0.000    0.020  0.000   -0.022    0.061    0.020    0.020
## 191  CEO education level                       Institution                                  7.000  10454.000  0.023  0.075    0.023  0.075   -0.036    0.081   -0.073    0.118
## 192  CEO education level                       Institutional investor power                 8.000   5985.000 -0.018  0.016   -0.018  0.016   -0.045    0.010   -0.038    0.002
## 193  CEO education level                       Labor market                                 1.000    386.000 -0.145          -0.145          -0.243   -0.047   -0.145   -0.145
## 194  CEO education level                       Large owners power                           3.000  13247.000 -0.000  0.000   -0.000  0.000   -0.015    0.015   -0.000   -0.000
## 195  CEO education level                       M                                           10.000  10511.000  0.105  0.069    0.105  0.068    0.059    0.152    0.018    0.193
## 196  CEO education level                       Operational performance                     32.000  14495.000  0.078  0.075    0.079  0.075    0.048    0.109   -0.017    0.175
## 197  CEO education level                       Ownership concentration                      3.000    855.000  0.090  0.146    0.090  0.146   -0.088    0.268   -0.097    0.277
## 198  CEO education level                       Region                                       7.000   4134.000  0.002  0.027    0.002  0.027   -0.035    0.038   -0.033    0.036
## 199  CEO education level                       Religion                                     1.000    520.000 -0.023          -0.023          -0.109    0.063   -0.023   -0.023
## 200  CEO education level                       Shareholder power                            1.000    589.000  0.000           0.000          -0.081    0.081    0.000    0.000
## 201  CEO education level                       State/public-owned                          14.000  44086.000 -0.004  0.080   -0.004  0.080   -0.047    0.039   -0.107    0.099
## 202  CEO education level                       Subjective performance                       2.000    776.000  0.151  0.000    0.159  0.000    0.090    0.227    0.159    0.159
## 203  CEO education level                       Tax Performance                              1.000    520.000  0.020           0.020          -0.066    0.106    0.020    0.020
## 204  CEO education level                       X                                           33.000  51477.000  0.033  0.028    0.033  0.028    0.020    0.046   -0.003    0.069
## 205  CEO elite education                       Board power                                  3.000   3344.000 -0.003  0.030   -0.003  0.030   -0.051    0.045   -0.041    0.035
## 206  CEO elite education                       Board, TMT & Employee career success         1.000    227.000  0.005           0.005          -0.125    0.135    0.005    0.005
## 207  CEO elite education                       Board, TMT & Employee human capital          4.000   3660.000  0.016  0.004    0.016  0.004   -0.017    0.049    0.010    0.022
## 208  CEO elite education                       CEO elite education                          2.000   2182.000  0.092  0.063    0.092  0.063   -0.006    0.189    0.010    0.173
## 209  CEO elite education                       CEO family characteristic                    1.000   2240.000  0.120           0.120           0.079    0.161    0.120    0.120
## 210  CEO elite education                       CEO gender                                   2.000   2370.000 -0.010  0.000   -0.010  0.000   -0.010   -0.010   -0.010   -0.010
## 211  CEO elite education                       CEO long-term incentive pay                  2.000    500.000  0.003  0.000    0.003  0.000   -0.027    0.034    0.003    0.003
## 212  CEO elite education                       CEO managerial ability                       1.000   1120.000  0.000           0.000          -0.059    0.059    0.000    0.000
## 213  CEO elite education                       CEO power                                   10.000   8609.000  0.041  0.055    0.041  0.055    0.000    0.081   -0.031    0.112
## 214  CEO elite education                       CEO prior career experience and expertise   11.000  13897.000  0.009  0.035    0.009  0.035   -0.018    0.035   -0.036    0.053
## 215  CEO elite education                       CEO self-concept                             2.000   1979.000  0.044  0.016    0.044  0.016   -0.005    0.093    0.025    0.064
## 216  CEO elite education                       CEO social capital                           2.000   1839.000  0.128  0.028    0.128  0.028    0.069    0.187    0.092    0.164
## 217  CEO elite education                       CEO succession                               1.000   1120.000 -0.030          -0.030          -0.089    0.029   -0.030   -0.030
## 218  CEO elite education                       CEO tenure                                   8.000   7096.000  0.084  0.065    0.084  0.065    0.034    0.135    0.001    0.167
## 219  CEO elite education                       CEO total pay                                3.000   2651.000  0.048  0.027    0.048  0.027   -0.001    0.096    0.014    0.082
## 220  CEO elite education                       Certification awards and Social reputation   2.000   1621.000 -0.050  0.000   -0.050  0.000   -0.092   -0.008   -0.050   -0.050
## 221  CEO elite education                       Country's socio-economic level               1.000     79.000  0.040           0.040          -0.181    0.262    0.040    0.040
## 222  CEO elite education                       Demographic similarity (CEO VS TMT)          2.000   7790.000 -0.078  0.019   -0.078  0.019   -0.112   -0.044   -0.102   -0.054
## 223  CEO elite education                       External supervision                         3.000   3445.000  0.063  0.026    0.063  0.026    0.019    0.107    0.031    0.096
## 224  CEO elite education                       Financial performance                        8.000   6531.000 -0.003  0.000   -0.003  0.000   -0.026    0.021   -0.003   -0.003
## 225  CEO elite education                       Firm risk taking                            12.000   8685.000  0.068  0.075    0.068  0.075    0.020    0.115   -0.029    0.164
## 226  CEO elite education                       Firms Characteristics (Firm prestige)       12.000   8297.000  0.063  0.052    0.063  0.052    0.026    0.099   -0.004    0.130
## 227  CEO elite education                       General performance                          3.000   2635.000  0.018  0.031    0.018  0.031   -0.034    0.070   -0.022    0.058
## 228  CEO elite education                       Industry Performance                         2.000   1347.000  0.012  0.000    0.012  0.000   -0.025    0.048    0.012    0.012
## 229  CEO elite education                       Insider power                                3.000   1389.000 -0.101  0.000   -0.101  0.000   -0.142   -0.060   -0.101   -0.101
## 230  CEO elite education                       Institution                                  1.000   2240.000 -0.110          -0.110          -0.151   -0.069   -0.110   -0.110
## 231  CEO elite education                       M                                            3.000   3861.000  0.041  0.094    0.041  0.094   -0.070    0.152   -0.080    0.161
## 232  CEO elite education                       Operational performance                      2.000    262.000 -0.041  0.000   -0.041  0.000   -0.060   -0.022   -0.041   -0.041
## 233  CEO elite education                       Shareholder power                            1.000   2240.000  0.100           0.100           0.059    0.141    0.100    0.100
## 234  CEO elite education                       State/public-owned                           1.000     79.000 -0.332          -0.332          -0.530   -0.135   -0.332   -0.332
## 235  CEO elite education                       X                                            5.000   5150.000  0.059  0.065    0.059  0.065   -0.004    0.123   -0.024    0.143
## 236  CEO family characteristic                 Board power                                  3.000   2119.000 -0.012  0.000   -0.013  0.000   -0.053    0.028   -0.013   -0.013
## 237  CEO family characteristic                 Board, TMT & Employee career success         2.000  10777.000 -0.004  0.095   -0.004  0.095   -0.138    0.129   -0.126    0.118
## 238  CEO family characteristic                 Board, TMT & Employee human capital          6.000  13010.000  0.049  0.020    0.049  0.022    0.025    0.074    0.021    0.077
## 239  CEO family characteristic                 CEO Leadership behavior                      2.000   2052.000  0.021  0.000    0.023  0.000   -0.008    0.053    0.023    0.023
## 240  CEO family characteristic                 CEO family characteristic                    6.000  13264.000  0.117  0.050    0.117  0.053    0.071    0.163    0.049    0.185
## 241  CEO family characteristic                 CEO gender                                   4.000  13385.000 -0.005  0.006   -0.005  0.006   -0.023    0.013   -0.013    0.002
## 242  CEO family characteristic                 CEO managerial ability                       4.000   2272.000  0.025  0.000    0.026  0.000    0.013    0.040    0.026    0.026
## 243  CEO family characteristic                 CEO power                                    5.000  16894.000  0.211  0.078    0.211  0.078    0.141    0.281    0.111    0.311
## 244  CEO family characteristic                 CEO prior career experience and expertise    3.000  12225.000  0.063  0.021    0.063  0.021    0.034    0.092    0.037    0.090
## 245  CEO family characteristic                 CEO self-concept                             4.000    573.000 -0.026  0.000   -0.029  0.000   -0.113    0.055   -0.029   -0.029
## 246  CEO family characteristic                 CEO social capital                           3.000  16302.000  0.088  0.014    0.089  0.011    0.070    0.109    0.075    0.104
## 247  CEO family characteristic                 CEO succession                               1.000  14250.000  0.030           0.030           0.014    0.046    0.030    0.030
## 248  CEO family characteristic                 CEO tenure                                   5.000  13354.000  0.052  0.052    0.052  0.052    0.003    0.100   -0.015    0.118
## 249  CEO family characteristic                 CEO total pay                                2.000  12895.000  0.057  0.000    0.057  0.000    0.052    0.062    0.057    0.057
## 250  CEO family characteristic                 Demographic similarity (CEO VS TMT)          2.000   2052.000  0.007  0.000    0.007  0.000    0.005    0.009    0.007    0.007
## 251  CEO family characteristic                 Environment turbulence                       1.000    122.000  0.141           0.141          -0.034    0.315    0.141    0.141
## 252  CEO family characteristic                 External supervision                         1.000   2240.000  0.087           0.087           0.046    0.128    0.087    0.087
## 253  CEO family characteristic                 Financial performance                        6.000  14924.000 -0.002  0.000   -0.002  0.000   -0.018    0.014   -0.002   -0.002
## 254  CEO family characteristic                 Firm risk taking                             6.000  18249.000 -0.023  0.031   -0.023  0.031   -0.052    0.005   -0.063    0.016
## 255  CEO family characteristic                 Firms Characteristics (Firm prestige)        9.000  28177.000  0.035  0.034    0.035  0.034    0.010    0.061   -0.009    0.079
## 256  CEO family characteristic                 General performance                          2.000   2338.000  0.031  0.030    0.031  0.030   -0.027    0.090   -0.008    0.070
## 257  CEO family characteristic                 Institution                                  1.000   2240.000 -0.150          -0.150          -0.191   -0.110   -0.150   -0.150
## 258  CEO family characteristic                 Labor market                                 2.000  14317.000  0.010  0.000    0.010  0.000    0.007    0.012    0.010    0.010
## 259  CEO family characteristic                 M                                            2.000   2338.000  0.544  0.073    0.545  0.072    0.441    0.648    0.452    0.637
## 260  CEO family characteristic                 Operational performance                      1.000    114.000  0.010           0.011          -0.195    0.217    0.011    0.011
## 261  CEO family characteristic                 Shareholder power                            1.000   2240.000  0.130           0.130           0.089    0.171    0.130    0.130
## 262  CEO family characteristic                 X                                            3.000   3963.000  0.051  0.020    0.052  0.019    0.014    0.090    0.028    0.076
## 263  CEO gender                                Board power                                 34.000  75819.000  0.013  0.038    0.013  0.038   -0.002    0.027   -0.036    0.062
## 264  CEO gender                                Board, TMT & Employee career success         8.000  21194.000  0.003  0.021    0.003  0.021   -0.017    0.023   -0.024    0.030
## 265  CEO gender                                Board, TMT & Employee human capital         59.000  89865.000  0.031  0.155    0.031  0.155   -0.009    0.071   -0.167    0.230
## 266  CEO gender                                CEO Leadership behavior                     14.000   4703.000 -0.020  0.000   -0.021  0.000   -0.047    0.006   -0.021   -0.021
## 267  CEO gender                                CEO gender                                   2.000   4135.000 -0.028  0.000   -0.028  0.000   -0.054   -0.002   -0.028   -0.028
## 268  CEO gender                                CEO human capital                            1.000    520.000 -0.030          -0.030          -0.116    0.056   -0.030   -0.030
## 269  CEO gender                                CEO long-term incentive pay                 22.000 116946.000  0.003  0.022    0.003  0.022   -0.008    0.014   -0.025    0.032
## 270  CEO gender                                CEO managerial ability                       3.000   3836.000  0.007  0.000    0.007  0.000   -0.009    0.023    0.007    0.007
## 271  CEO gender                                CEO nationality                              3.000   2364.000 -0.022  0.000   -0.022  0.000   -0.035   -0.009   -0.022   -0.022
## 272  CEO gender                                CEO power                                   44.000  86026.000  0.005  0.073    0.005  0.073   -0.018    0.027   -0.089    0.099
## 273  CEO gender                                CEO prior career experience and expertise   33.000  65958.000 -0.008  0.063   -0.008  0.063   -0.030    0.015   -0.088    0.073
## 274  CEO gender                                CEO self-concept                            37.000  34179.000 -0.004  0.055   -0.004  0.056   -0.025    0.017   -0.075    0.067
## 275  CEO gender                                CEO social capital                          10.000  27662.000 -0.001  0.027   -0.001  0.027   -0.022    0.019   -0.036    0.034
## 276  CEO gender                                CEO succession                               1.000   1001.000 -0.040          -0.040          -0.102    0.022   -0.040   -0.040
## 277  CEO gender                                CEO tenure                                  67.000 193632.000 -0.010  0.050   -0.010  0.050   -0.022    0.003   -0.074    0.055
## 278  CEO gender                                CEO total pay                               39.000 148290.000  0.000  0.022    0.000  0.022   -0.008    0.009   -0.028    0.029
## 279  CEO gender                                Certification awards and Social reputation   7.000   9724.000  0.020  0.041    0.020  0.041   -0.017    0.056   -0.033    0.073
## 280  CEO gender                                Compensation committee monitoring           10.000  31492.000 -0.004  0.034   -0.004  0.034   -0.028    0.020   -0.048    0.040
## 281  CEO gender                                Country's socio-economic level               2.000   2752.000  0.017  0.000    0.017  0.000   -0.008    0.042    0.017    0.017
## 282  CEO gender                                Demographic similarity (CEO VS TMT)          2.000   2413.000 -0.015  0.000   -0.015  0.000   -0.032    0.001   -0.015   -0.015
## 283  CEO gender                                Employee and manager performance             4.000   2894.000 -0.048  0.000   -0.051  0.000   -0.074   -0.028   -0.051   -0.051
## 284  CEO gender                                Environment turbulence                      25.000  81174.000  0.007  0.032    0.007  0.032   -0.007    0.022   -0.033    0.048
## 285  CEO gender                                External supervision                        12.000  79665.000 -0.024  0.022   -0.024  0.022   -0.039   -0.010   -0.052    0.004
## 286  CEO gender                                Financial performance                       74.000 215501.000  0.009  0.013    0.009  0.013    0.004    0.014   -0.007    0.026
## 287  CEO gender                                Firm risk taking                            77.000 216184.000  0.000  0.013    0.000  0.013   -0.005    0.005   -0.017    0.017
## 288  CEO gender                                Firms Characteristics (Firm prestige)      107.000 226715.259  0.006  0.034    0.006  0.034   -0.002    0.013   -0.037    0.049
## 289  CEO gender                                General performance                         27.000  26429.000 -0.020  0.050   -0.020  0.050   -0.043    0.002   -0.084    0.043
## 290  CEO gender                                Industry Performance                         8.000  18028.000 -0.030  0.034   -0.030  0.034   -0.058   -0.002   -0.074    0.014
## 291  CEO gender                                Institution                                 10.000  33692.000  0.017  0.023    0.017  0.023   -0.000    0.035   -0.012    0.046
## 292  CEO gender                                Institutional investor power                 7.000  49030.000  0.001  0.018    0.001  0.018   -0.016    0.017   -0.023    0.024
## 293  CEO gender                                Labor market                                 2.000   1256.000  0.076  0.025    0.076  0.025    0.011    0.142    0.044    0.109
## 294  CEO gender                                Labor union power                            1.000    278.000 -0.030          -0.030          -0.148    0.088   -0.030   -0.030
## 295  CEO gender                                Large owners power                           6.000  17687.000 -0.037  0.023   -0.037  0.023   -0.060   -0.013   -0.066   -0.008
## 296  CEO gender                                M                                           10.000  12506.000 -0.001  0.039   -0.001  0.039   -0.031    0.029   -0.051    0.049
## 297  CEO gender                                Minority CEO                                 4.000  14536.000  0.528  0.351    0.528  0.351    0.184    0.872    0.079    0.978
## 298  CEO gender                                Operational performance                     19.000  42874.000 -0.015  0.020   -0.015  0.020   -0.028   -0.002   -0.040    0.011
## 299  CEO gender                                Ownership concentration                      1.000    303.000  0.000           0.000          -0.113    0.113    0.000    0.000
## 300  CEO gender                                Region                                       3.000   2877.000 -0.002  0.000   -0.002  0.000   -0.019    0.016   -0.002   -0.002
## 301  CEO gender                                Religion                                     1.000    520.000  0.060           0.060          -0.026    0.146    0.060    0.060
## 302  CEO gender                                Shareholder power                            1.000   2240.000 -0.010          -0.010          -0.051    0.031   -0.010   -0.010
## 303  CEO gender                                State/public-owned                           9.000  41265.000 -0.029  0.029   -0.029  0.029   -0.050   -0.007   -0.066    0.009
## 304  CEO gender                                Subjective performance                       3.000   2052.000 -0.080  0.164   -0.087  0.175   -0.291    0.116   -0.312    0.137
## 305  CEO gender                                Tax Performance                              2.000    799.000 -0.022  0.028   -0.022  0.028   -0.101    0.057   -0.058    0.014
## 306  CEO gender                                X                                           28.000  24314.000  0.036  0.100    0.036  0.100   -0.003    0.075   -0.092    0.164
## 307  CEO human capital                         Board power                                  1.000    374.000  0.155           0.155           0.056    0.254    0.155    0.155
## 308  CEO human capital                         Board, TMT & Employee career success         1.000    520.000 -0.008          -0.008          -0.094    0.079   -0.008   -0.008
## 309  CEO human capital                         Board, TMT & Employee human capital          3.000   7307.000  0.049  0.013    0.049  0.013    0.022    0.076    0.033    0.066
## 310  CEO human capital                         CEO long-term incentive pay                  2.000   6933.000 -0.077  0.032   -0.077  0.032   -0.127   -0.027   -0.118   -0.036
## 311  CEO human capital                         CEO managerial ability                       1.000    520.000  0.045           0.045          -0.041    0.131    0.045    0.045
## 312  CEO human capital                         CEO nationality                              1.000    520.000 -0.040          -0.040          -0.126    0.046   -0.040   -0.040
## 313  CEO human capital                         CEO power                                    3.000   7247.000  0.146  0.059    0.146  0.059    0.076    0.216    0.070    0.221
## 314  CEO human capital                         CEO self-concept                             1.000    520.000  0.030           0.030          -0.056    0.116    0.030    0.030
## 315  CEO human capital                         CEO social capital                           2.000    980.000  0.038  0.000    0.038  0.000    0.015    0.060    0.038    0.038
## 316  CEO human capital                         CEO total pay                                2.000   6933.000 -0.030  0.000   -0.030  0.000   -0.041   -0.018   -0.030   -0.030
## 317  CEO human capital                         Environment turbulence                       1.000    460.000  0.070           0.070          -0.021    0.161    0.070    0.070
## 318  CEO human capital                         External supervision                         1.000   6413.000 -0.004          -0.004          -0.028    0.020   -0.004   -0.004
## 319  CEO human capital                         Financial performance                        3.000   7247.000  0.020  0.015    0.020  0.015   -0.008    0.048    0.001    0.039
## 320  CEO human capital                         Firm risk taking                             3.000   7393.000 -0.047  0.031   -0.047  0.031   -0.088   -0.005   -0.086   -0.007
## 321  CEO human capital                         Firms Characteristics (Firm prestige)        4.000   7767.000  0.015  0.095    0.015  0.095   -0.081    0.111   -0.107    0.137
## 322  CEO human capital                         Industry Performance                         1.000    460.000 -0.110          -0.110          -0.200   -0.020   -0.110   -0.110
## 323  CEO human capital                         Institution                                  1.000    374.000 -0.210          -0.210          -0.307   -0.113   -0.210   -0.210
## 324  CEO human capital                         Operational performance                      2.000   6933.000  0.031  0.011    0.031  0.011    0.003    0.059    0.017    0.045
## 325  CEO human capital                         Ownership concentration                      1.000    374.000  0.080           0.080          -0.021    0.181    0.080    0.080
## 326  CEO human capital                         Religion                                     1.000    520.000 -0.010          -0.010          -0.096    0.076   -0.010   -0.010
## 327  CEO human capital                         State/public-owned                           1.000    520.000 -0.050          -0.050          -0.136    0.036   -0.050   -0.050
## 328  CEO human capital                         Tax Performance                              1.000    520.000 -0.050          -0.050          -0.136    0.036   -0.050   -0.050
## 329  CEO human capital                         X                                            1.000    520.000  0.020           0.020          -0.066    0.106    0.020    0.020
## 330  CEO long-term incentive pay               Board power                                107.000 238664.000  0.052  0.120    0.052  0.120    0.029    0.075   -0.102    0.206
## 331  CEO long-term incentive pay               Board, TMT & Employee career success        17.000  54011.000  0.059  0.099    0.059  0.099    0.011    0.107   -0.068    0.186
## 332  CEO long-term incentive pay               Board, TMT & Employee human capital         79.000 218580.000  0.054  0.113    0.054  0.113    0.029    0.079   -0.091    0.199
## 333  CEO long-term incentive pay               CEO long-term incentive pay                127.000 443666.547  0.267  0.251    0.267  0.251    0.223    0.311   -0.054    0.588
## 334  CEO long-term incentive pay               CEO managerial ability                      10.000  18995.000  0.022  0.047    0.022  0.047   -0.011    0.054   -0.038    0.082
## 335  CEO long-term incentive pay               CEO nationality                              2.000    627.000 -0.022  0.089   -0.022  0.089   -0.169    0.124   -0.137    0.092
## 336  CEO long-term incentive pay               CEO perquisites                              1.000    793.000  0.130           0.130           0.062    0.199    0.130    0.130
## 337  CEO long-term incentive pay               CEO power                                  143.000 445621.000  0.007  0.117    0.007  0.117   -0.012    0.027   -0.143    0.158
## 338  CEO long-term incentive pay               CEO prior career experience and expertise   47.000 106808.211  0.025  0.058    0.025  0.058    0.007    0.042   -0.050    0.099
## 339  CEO long-term incentive pay               CEO self-concept                            36.000  99255.000  0.203  0.204    0.203  0.204    0.136    0.270   -0.059    0.465
## 340  CEO long-term incentive pay               CEO social capital                          13.000  27273.000  0.015  0.054    0.015  0.054   -0.017    0.046   -0.055    0.084
## 341  CEO long-term incentive pay               CEO succession                               6.000   5418.000  0.002  0.174    0.002  0.174   -0.140    0.144   -0.221    0.225
## 342  CEO long-term incentive pay               CEO tenure                                 134.000 422500.117  0.051  0.135    0.051  0.135    0.028    0.074   -0.122    0.224
## 343  CEO long-term incentive pay               CEO total pay                              148.000 393215.166  0.167  0.257    0.167  0.257    0.126    0.209   -0.162    0.497
## 344  CEO long-term incentive pay               Certification awards and Social reputation   9.000   4684.000  0.089  0.000    0.089  0.000    0.064    0.115    0.089    0.089
## 345  CEO long-term incentive pay               Chairman power                               1.000    277.000 -0.050          -0.050          -0.168    0.068   -0.050   -0.050
## 346  CEO long-term incentive pay               Compensation committee monitoring           36.000 217690.000  0.299  0.200    0.299  0.200    0.234    0.364    0.043    0.555
## 347  CEO long-term incentive pay               Consultant influence                         5.000   3104.000  0.091  0.071    0.091  0.071    0.020    0.162    0.000    0.182
## 348  CEO long-term incentive pay               Country's socio-economic level              10.000   7224.000 -0.081  0.083   -0.081  0.083   -0.138   -0.025   -0.188    0.025
## 349  CEO long-term incentive pay               Demographic similarity (CEO VS TMT)          4.000   5739.000 -0.021  0.041   -0.021  0.041   -0.069    0.027   -0.074    0.032
## 350  CEO long-term incentive pay               Employee and manager performance             1.000    406.000  0.010           0.010          -0.087    0.107    0.010    0.010
## 351  CEO long-term incentive pay               Environment turbulence                      29.000 122814.000 -0.010  0.034   -0.010  0.034   -0.024    0.003   -0.054    0.033
## 352  CEO long-term incentive pay               External supervision                        43.000 434251.000  0.070  0.110    0.070  0.110    0.036    0.103   -0.072    0.211
## 353  CEO long-term incentive pay               Financial performance                      204.000 854009.683  0.040  0.094    0.040  0.094    0.027    0.053   -0.080    0.161
## 354  CEO long-term incentive pay               Firm risk taking                           225.000 925262.250 -0.019  0.078   -0.019  0.078   -0.029   -0.008   -0.119    0.081
## 355  CEO long-term incentive pay               Firms Characteristics (Firm prestige)      224.000 909748.975  0.048  0.169    0.048  0.169    0.026    0.071   -0.168    0.264
## 356  CEO long-term incentive pay               General performance                         35.000  80144.000  0.054  0.066    0.054  0.066    0.031    0.077   -0.031    0.138
## 357  CEO long-term incentive pay               Industry Performance                        37.000 104187.000  0.065  0.056    0.065  0.056    0.046    0.084   -0.006    0.137
## 358  CEO long-term incentive pay               Insider power                               20.000  41160.000  0.014  0.158    0.014  0.158   -0.056    0.083   -0.188    0.216
## 359  CEO long-term incentive pay               Institution                                 14.000  27635.000  0.172  0.157    0.172  0.157    0.089    0.255   -0.029    0.373
## 360  CEO long-term incentive pay               Institutional investor power                65.000 190560.000  0.013  0.136    0.013  0.136   -0.020    0.046   -0.161    0.187
## 361  CEO long-term incentive pay               Labor market                                 2.000   1747.000  0.022  0.000    0.022  0.000   -0.009    0.054    0.022    0.022
## 362  CEO long-term incentive pay               Labor union power                            1.000    170.000 -0.181          -0.181          -0.326   -0.035   -0.181   -0.181
## 363  CEO long-term incentive pay               Large owners power                          32.000  35834.000 -0.028  0.050   -0.028  0.050   -0.049   -0.008   -0.093    0.036
## 364  CEO long-term incentive pay               M                                            8.000   5725.000  0.016  0.045    0.016  0.045   -0.025    0.057   -0.042    0.074
## 365  CEO long-term incentive pay               Nominating committee power                   1.000    355.000  0.040           0.040          -0.064    0.144    0.040    0.040
## 366  CEO long-term incentive pay               Operational performance                     81.000 236334.927  0.027  0.078    0.027  0.078    0.009    0.044   -0.073    0.126
## 367  CEO long-term incentive pay               Ownership concentration                      5.000   2954.000 -0.041  0.049   -0.041  0.049   -0.097    0.015   -0.103    0.021
## 368  CEO long-term incentive pay               Peer-group control                           1.000    280.000  0.013           0.013          -0.105    0.130    0.013    0.013
## 369  CEO long-term incentive pay               Region                                       2.000   3622.000  0.071  0.038    0.071  0.038    0.009    0.133    0.022    0.119
## 370  CEO long-term incentive pay               Religion                                     1.000    520.000 -0.015          -0.015          -0.101    0.071   -0.015   -0.015
## 371  CEO long-term incentive pay               Shareholder power                           15.000  44774.000 -0.009  0.079   -0.009  0.079   -0.050    0.032   -0.110    0.092
## 372  CEO long-term incentive pay               State/public-owned                           4.000  12148.000 -0.025  0.000   -0.025  0.000   -0.037   -0.013   -0.025   -0.025
## 373  CEO long-term incentive pay               Subjective performance                       1.000    793.000 -0.050          -0.050          -0.120    0.019   -0.050   -0.050
## 374  CEO long-term incentive pay               Tax Performance                              9.000  19544.000  0.011  0.057    0.011  0.057   -0.029    0.050   -0.062    0.084
## 375  CEO long-term incentive pay               Voting rights                                1.000    267.000  0.003           0.003          -0.117    0.123    0.003    0.003
## 376  CEO long-term incentive pay               X                                           60.000 109324.000  0.014  0.088    0.014  0.088   -0.009    0.037   -0.099    0.127
## 377  CEO managerial ability                    Board power                                 15.000  27321.000  0.028  0.050    0.028  0.050    0.000    0.056   -0.036    0.093
## 378  CEO managerial ability                    Board, TMT & Employee career success         9.000  12082.000  0.051  0.059    0.051  0.059    0.009    0.093   -0.024    0.126
## 379  CEO managerial ability                    Board, TMT & Employee human capital         14.000  21439.000  0.020  0.036    0.020  0.037   -0.003    0.044   -0.027    0.068
## 380  CEO managerial ability                    CEO managerial ability                      10.000  49504.000  0.283  0.205    0.285  0.204    0.159    0.412    0.024    0.547
## 381  CEO managerial ability                    CEO nationality                              1.000    520.000  0.005           0.005          -0.081    0.091    0.005    0.005
## 382  CEO managerial ability                    CEO power                                   11.000  19098.000 -0.012  0.065   -0.014  0.066   -0.055    0.028   -0.099    0.071
## 383  CEO managerial ability                    CEO prior career experience and expertise   13.000   9110.000 -0.003  0.061   -0.003  0.061   -0.042    0.036   -0.081    0.075
## 384  CEO managerial ability                    CEO self-concept                            14.000   6797.000  0.027  0.136    0.025  0.139   -0.051    0.102   -0.152    0.203
## 385  CEO managerial ability                    CEO social capital                           8.000   9388.000  0.044  0.049    0.044  0.050    0.004    0.084   -0.020    0.108
## 386  CEO managerial ability                    CEO succession                               5.000   5600.000  0.011  0.087    0.011  0.087   -0.070    0.092   -0.102    0.123
## 387  CEO managerial ability                    CEO tenure                                  13.000   7644.000  0.018  0.036    0.018  0.036   -0.012    0.048   -0.028    0.065
## 388  CEO managerial ability                    CEO total pay                                8.000   5788.000  0.072  0.000    0.072  0.000    0.049    0.095    0.072    0.072
## 389  CEO managerial ability                    Certification awards and Social reputation   5.000   9520.000  0.049  0.022    0.049  0.023    0.021    0.078    0.020    0.079
## 390  CEO managerial ability                    Compensation committee monitoring            5.000  20747.000  0.035  0.079    0.035  0.079   -0.036    0.105   -0.067    0.136
## 391  CEO managerial ability                    Demographic similarity (CEO VS TMT)          4.000   6505.000  0.024  0.000    0.025  0.000    0.010    0.039    0.025    0.025
## 392  CEO managerial ability                    Employee and manager performance             1.000   3895.000 -0.010          -0.011          -0.044    0.023   -0.011   -0.011
## 393  CEO managerial ability                    Environment turbulence                       8.000  18617.000 -0.117  0.153   -0.118  0.153   -0.225   -0.010   -0.314    0.079
## 394  CEO managerial ability                    External supervision                         7.000  23646.000  0.053  0.106    0.053  0.106   -0.027    0.132   -0.083    0.188
## 395  CEO managerial ability                    Financial performance                       24.000  72903.000  0.039  0.074    0.039  0.074    0.009    0.070   -0.055    0.134
## 396  CEO managerial ability                    Firm risk taking                            29.000  74889.000  0.003  0.044    0.003  0.044   -0.014    0.021   -0.052    0.059
## 397  CEO managerial ability                    Firms Characteristics (Firm prestige)       33.000  41966.000  0.078  0.122    0.078  0.123    0.035    0.121   -0.079    0.235
## 398  CEO managerial ability                    General performance                          6.000   5575.000 -0.004  0.119   -0.004  0.120   -0.104    0.095   -0.158    0.149
## 399  CEO managerial ability                    Industry Performance                         5.000   2135.000  0.024  0.062    0.025  0.062   -0.044    0.094   -0.054    0.104
## 400  CEO managerial ability                    Insider power                                3.000  15103.000  0.068  0.018    0.068  0.018    0.042    0.094    0.045    0.092
## 401  CEO managerial ability                    Institution                                  2.000    542.000 -0.037  0.000   -0.036  0.000   -0.089    0.017   -0.036   -0.036
## 402  CEO managerial ability                    Institutional investor power                 5.000  16219.000  0.057  0.000    0.057  0.000    0.042    0.071    0.057    0.057
## 403  CEO managerial ability                    Large owners power                           3.000   6446.000 -0.018  0.000   -0.018  0.000   -0.025   -0.011   -0.018   -0.018
## 404  CEO managerial ability                    M                                            5.000   6958.000 -0.031  0.061   -0.030  0.061   -0.089    0.028   -0.108    0.048
## 405  CEO managerial ability                    Operational performance                     11.000  38165.000  0.079  0.107    0.079  0.107    0.015    0.143   -0.058    0.217
## 406  CEO managerial ability                    Region                                       2.000    264.000  0.004  0.000    0.005  0.000   -0.024    0.033    0.005    0.005
## 407  CEO managerial ability                    Religion                                     1.000    520.000  0.000           0.000          -0.086    0.086    0.000    0.000
## 408  CEO managerial ability                    Shareholder power                            1.000   1500.000  0.080           0.080           0.030    0.130    0.080    0.080
## 409  CEO managerial ability                    State/public-owned                           2.000   6278.000  0.074  0.008    0.074  0.008    0.047    0.101    0.065    0.084
## 410  CEO managerial ability                    Subjective performance                       7.000   6363.000  0.088  0.070    0.087  0.072    0.029    0.146   -0.005    0.180
## 411  CEO managerial ability                    Tax Performance                              5.000   8194.000 -0.043  0.000   -0.043  0.000   -0.059   -0.026   -0.043   -0.043
## 412  CEO managerial ability                    X                                           14.000  21085.000  0.020  0.064    0.019  0.066   -0.018    0.056   -0.066    0.103
## 413  CEO nationality                           Board power                                  2.000   2605.000  0.008  0.107    0.008  0.107   -0.145    0.161   -0.129    0.145
## 414  CEO nationality                           Board, TMT & Employee career success         1.000    520.000  0.008           0.008          -0.079    0.094    0.008    0.008
## 415  CEO nationality                           Board, TMT & Employee human capital          6.000   4586.000  0.057  0.129    0.057  0.129   -0.050    0.164   -0.108    0.222
## 416  CEO nationality                           CEO nationality                              1.000    309.000 -0.491          -0.491          -0.576   -0.406   -0.491   -0.491
## 417  CEO nationality                           CEO power                                    4.000   1947.000 -0.034  0.095   -0.034  0.095   -0.137    0.069   -0.156    0.088
## 418  CEO nationality                           CEO prior career experience and expertise    4.000   1528.000 -0.194  0.250   -0.194  0.250   -0.444    0.055   -0.514    0.126
## 419  CEO nationality                           CEO self-concept                             2.000    620.000 -0.015  0.000   -0.015  0.000   -0.032    0.003   -0.015   -0.015
## 420  CEO nationality                           CEO social capital                           1.000    520.000 -0.023          -0.023          -0.109    0.063   -0.023   -0.023
## 421  CEO nationality                           CEO tenure                                   7.000   3426.000 -0.076  0.069   -0.076  0.069   -0.137   -0.015   -0.165    0.013
## 422  CEO nationality                           CEO total pay                                3.000    851.000  0.124  0.159    0.124  0.159   -0.068    0.316   -0.080    0.328
## 423  CEO nationality                           Compensation committee monitoring            1.000   1070.000  0.060           0.060           0.000    0.120    0.060    0.060
## 424  CEO nationality                           Environment turbulence                       1.000    277.000  0.070           0.070          -0.047    0.188    0.070    0.070
## 425  CEO nationality                           Financial performance                        6.000   4173.000  0.008  0.030    0.008  0.030   -0.031    0.047   -0.030    0.046
## 426  CEO nationality                           Firm risk taking                             9.000   5083.000  0.040  0.040    0.040  0.040    0.002    0.078   -0.011    0.091
## 427  CEO nationality                           Firms Characteristics (Firm prestige)        9.000   4906.000  0.064  0.052    0.064  0.052    0.020    0.108   -0.003    0.131
## 428  CEO nationality                           General performance                          1.000     81.000 -0.211          -0.211          -0.421   -0.002   -0.211   -0.211
## 429  CEO nationality                           Institution                                  1.000    277.000 -0.180          -0.180          -0.294   -0.066   -0.180   -0.180
## 430  CEO nationality                           Operational performance                      2.000    601.000 -0.015  0.000   -0.015  0.000   -0.069    0.039   -0.015   -0.015
## 431  CEO nationality                           Ownership concentration                      1.000    107.000  0.040           0.040          -0.150    0.230    0.040    0.040
## 432  CEO nationality                           Religion                                     1.000    520.000  0.120           0.120           0.035    0.205    0.120    0.120
## 433  CEO nationality                           State/public-owned                           1.000    520.000  0.050           0.050          -0.036    0.136    0.050    0.050
## 434  CEO nationality                           Tax Performance                              1.000    520.000  0.020           0.020          -0.066    0.106    0.020    0.020
## 435  CEO nationality                           X                                            3.000   1867.000  0.222  0.254    0.222  0.254   -0.069    0.512   -0.104    0.547
## 436  CEO perquisites                           Board power                                  1.000    793.000  0.100           0.100           0.031    0.169    0.100    0.100
## 437  CEO perquisites                           CEO power                                    1.000    793.000  0.120           0.120           0.051    0.189    0.120    0.120
## 438  CEO perquisites                           CEO self-concept                             1.000    793.000  0.140           0.145           0.074    0.215    0.145    0.145
## 439  CEO perquisites                           CEO tenure                                   1.000    793.000  0.090           0.090           0.021    0.159    0.090    0.090
## 440  CEO perquisites                           CEO total pay                                1.000    793.000  0.090           0.090           0.021    0.159    0.090    0.090
## 441  CEO perquisites                           Firm risk taking                             1.000    793.000  0.290           0.290           0.226    0.354    0.290    0.290
## 442  CEO perquisites                           Firms Characteristics (Firm prestige)        1.000    793.000  0.370           0.370           0.310    0.430    0.370    0.370
## 443  CEO perquisites                           Institutional investor power                 1.000    793.000  0.040           0.040          -0.030    0.110    0.040    0.040
## 444  CEO perquisites                           Large owners power                           1.000    793.000 -0.050          -0.050          -0.120    0.019   -0.050   -0.050
## 445  CEO perquisites                           Shareholder power                            1.000    793.000  0.070           0.070           0.001    0.139    0.070    0.070
## 446  CEO perquisites                           Subjective performance                       1.000    793.000  0.120           0.120           0.051    0.189    0.120    0.120
## 447  CEO perquisites                           X                                            1.000    793.000  0.340           0.340           0.279    0.402    0.340    0.340
## 448  CEO power                                 Board power                                198.000 330557.000 -0.031  0.131   -0.031  0.131   -0.050   -0.013   -0.200    0.137
## 449  CEO power                                 Board, TMT & Employee career success        29.000  48936.000  0.013  0.061    0.013  0.061   -0.011    0.037   -0.065    0.091
## 450  CEO power                                 Board, TMT & Employee human capital        179.000 408311.985 -0.022  0.087   -0.022  0.087   -0.035   -0.009   -0.133    0.089
## 451  CEO power                                 CEO power                                  136.000 341412.507  0.139  0.232    0.139  0.232    0.100    0.178   -0.158    0.436
## 452  CEO power                                 CEO prior career experience and expertise  126.000 138122.000 -0.022  0.122   -0.022  0.122   -0.043    0.000   -0.178    0.135
## 453  CEO power                                 CEO self-concept                            71.000  97763.000  0.019  0.067    0.019  0.067    0.002    0.036   -0.067    0.105
## 454  CEO power                                 CEO social capital                          40.000  68919.000  0.054  0.220    0.054  0.220   -0.014    0.123   -0.227    0.336
## 455  CEO power                                 CEO succession                              16.000  25497.000 -0.026  0.065   -0.026  0.065   -0.061    0.008   -0.110    0.057
## 456  CEO power                                 CEO tenure                                 233.000 437162.784  0.218  0.168    0.218  0.168    0.197    0.240    0.004    0.433
## 457  CEO power                                 CEO total pay                              142.000 299359.000 -0.011  0.131   -0.011  0.131   -0.033    0.010   -0.179    0.156
## 458  CEO power                                 Certification awards and Social reputation  26.000  19201.000  0.009  0.070    0.010  0.071   -0.021    0.040   -0.081    0.100
## 459  CEO power                                 Chairman power                               3.000    792.000 -0.005  0.119   -0.005  0.119   -0.157    0.147   -0.158    0.148
## 460  CEO power                                 Compensation committee monitoring           46.000  99755.000 -0.004  0.156   -0.004  0.156   -0.050    0.041   -0.204    0.196
## 461  CEO power                                 Consultant influence                         3.000    777.000 -0.041  0.080   -0.041  0.080   -0.155    0.073   -0.143    0.061
## 462  CEO power                                 Country governance quality                   2.000    782.000  0.010  0.000    0.010  0.000   -0.038    0.058    0.010    0.010
## 463  CEO power                                 Country's socio-economic level               9.000  11087.000  0.054  0.078    0.054  0.078    0.000    0.108   -0.045    0.154
## 464  CEO power                                 Demographic similarity (CEO VS TMT)         15.000  16442.000  0.015  0.049    0.015  0.050   -0.015    0.044   -0.050    0.079
## 465  CEO power                                 Employee and manager performance             4.000   6725.000  0.015  0.028    0.018  0.030   -0.022    0.057   -0.021    0.056
## 466  CEO power                                 Environment turbulence                      67.000 211097.000 -0.001  0.021   -0.001  0.021   -0.008    0.006   -0.028    0.026
## 467  CEO power                                 External supervision                        53.000 277875.000 -0.018  0.144   -0.018  0.144   -0.057    0.020   -0.202    0.166
## 468  CEO power                                 Financial performance                      307.000 752352.985  0.013  0.041    0.013  0.041    0.008    0.018   -0.039    0.066
## 469  CEO power                                 Firm risk taking                           349.000 906749.817 -0.002  0.060   -0.002  0.060   -0.009    0.004   -0.079    0.075
## 470  CEO power                                 Firms Characteristics (Firm prestige)      369.000 912823.739 -0.037  0.105   -0.037  0.105   -0.048   -0.027   -0.172    0.097
## 471  CEO power                                 General performance                         62.000  77737.000 -0.002  0.057   -0.002  0.057   -0.018    0.013   -0.076    0.071
## 472  CEO power                                 Industry Performance                        63.000 126306.000  0.002  0.030    0.002  0.030   -0.007    0.011   -0.036    0.040
## 473  CEO power                                 Insider power                               25.000  36199.000  0.163  0.121    0.163  0.121    0.115    0.212    0.008    0.318
## 474  CEO power                                 Institution                                 30.000  66847.000 -0.008  0.065   -0.009  0.065   -0.033    0.016   -0.092    0.075
## 475  CEO power                                 Institutional investor power                81.000 220228.000 -0.095  0.095   -0.095  0.095   -0.116   -0.074   -0.216    0.026
## 476  CEO power                                 Labor market                                 5.000  16763.000  0.025  0.022    0.025  0.022    0.000    0.049   -0.003    0.052
## 477  CEO power                                 Labor union power                            1.000     93.000 -0.121          -0.121          -0.322    0.081   -0.121   -0.121
## 478  CEO power                                 Large owners power                          47.000  64092.000 -0.012  0.097   -0.012  0.097   -0.041    0.017   -0.136    0.112
## 479  CEO power                                 M                                           33.000  34058.000 -0.049  0.148   -0.049  0.148   -0.101    0.002   -0.239    0.140
## 480  CEO power                                 Minority CEO                                 3.000   4476.000 -0.025  0.000   -0.025  0.000   -0.031   -0.020   -0.025   -0.025
## 481  CEO power                                 Nominating committee power                   3.000   1193.000 -0.117  0.000   -0.117  0.000   -0.152   -0.081   -0.117   -0.117
## 482  CEO power                                 Operational performance                     95.000 304020.000 -0.013  0.050   -0.013  0.050   -0.023   -0.002   -0.077    0.052
## 483  CEO power                                 Ownership concentration                     24.000  29546.000 -0.093  0.063   -0.093  0.063   -0.121   -0.065   -0.174   -0.012
## 484  CEO power                                 Region                                      14.000   9899.000  0.022  0.022    0.022  0.022   -0.000    0.045   -0.006    0.051
## 485  CEO power                                 Shareholder power                           15.000  52848.000 -0.105  0.087   -0.105  0.087   -0.149   -0.060   -0.216    0.006
## 486  CEO power                                 State/public-owned                          26.000 188333.000 -0.022  0.176   -0.022  0.176   -0.090    0.045   -0.247    0.203
## 487  CEO power                                 Subjective performance                      10.000  13427.000  0.017  0.057    0.017  0.057   -0.022    0.056   -0.056    0.090
## 488  CEO power                                 Tax Performance                              5.000   7534.000 -0.014  0.042   -0.014  0.042   -0.058    0.029   -0.069    0.040
## 489  CEO power                                 Voting rights                                1.000    267.000 -0.077          -0.077          -0.197    0.042   -0.077   -0.077
## 490  CEO power                                 X                                          113.000 265385.731  0.005  0.148    0.005  0.149   -0.023    0.033   -0.185    0.195
## 491  CEO prior career experience and expertise Board power                                 98.000 101661.000  0.007  0.066    0.007  0.066   -0.007    0.021   -0.077    0.091
## 492  CEO prior career experience and expertise Board, TMT & Employee career success        18.000  27405.000  0.005  0.067    0.005  0.067   -0.029    0.038   -0.081    0.090
## 493  CEO prior career experience and expertise Board, TMT & Employee human capital         90.000 107951.000  0.050  0.087    0.050  0.087    0.031    0.069   -0.061    0.162
## 494  CEO prior career experience and expertise CEO prior career experience and expertise  114.000 105926.481  0.036  0.223    0.036  0.223   -0.005    0.077   -0.250    0.322
## 495  CEO prior career experience and expertise CEO self-concept                            48.000  36917.000  0.078  0.079    0.078  0.079    0.054    0.103   -0.023    0.180
## 496  CEO prior career experience and expertise CEO social capital                          31.000  48320.000 -0.005  0.072   -0.005  0.072   -0.032    0.022   -0.098    0.088
## 497  CEO prior career experience and expertise CEO succession                              26.000  17911.000 -0.040  0.123   -0.040  0.123   -0.090    0.010   -0.198    0.118
## 498  CEO prior career experience and expertise CEO tenure                                 142.000 181432.793  0.038  0.168    0.038  0.168    0.010    0.066   -0.178    0.253
## 499  CEO prior career experience and expertise CEO total pay                               62.000 103944.000  0.045  0.109    0.045  0.109    0.017    0.072   -0.095    0.184
## 500  CEO prior career experience and expertise Certification awards and Social reputation  26.000  16250.000  0.041  0.058    0.041  0.058    0.014    0.068   -0.033    0.115
## 501  CEO prior career experience and expertise Compensation committee monitoring           16.000  16995.000  0.031  0.038    0.031  0.038    0.007    0.055   -0.018    0.079
## 502  CEO prior career experience and expertise Consultant influence                         2.000    248.000  0.022  0.000    0.022  0.000   -0.034    0.078    0.022    0.022
## 503  CEO prior career experience and expertise Country governance quality                   3.000    877.000  0.036  0.054    0.036  0.054   -0.053    0.126   -0.032    0.105
## 504  CEO prior career experience and expertise Country's socio-economic level               7.000   3262.000  0.028  0.000    0.028  0.000   -0.001    0.057    0.028    0.028
## 505  CEO prior career experience and expertise Demographic similarity (CEO VS TMT)         15.000  14734.000  0.067  0.045    0.068  0.045    0.040    0.095    0.010    0.125
## 506  CEO prior career experience and expertise Employee and manager performance             1.000   2101.000  0.000           0.000          -0.045    0.045    0.000    0.000
## 507  CEO prior career experience and expertise Environment turbulence                      62.000  54531.746  0.010  0.064    0.010  0.064   -0.008    0.028   -0.072    0.092
## 508  CEO prior career experience and expertise External supervision                        24.000  19692.000  0.102  0.105    0.102  0.105    0.058    0.146   -0.033    0.237
## 509  CEO prior career experience and expertise Financial performance                      167.000 208780.560  0.011  0.046    0.011  0.046    0.003    0.019   -0.049    0.070
## 510  CEO prior career experience and expertise Firm risk taking                           195.000 213210.920  0.024  0.052    0.024  0.052    0.015    0.032   -0.043    0.091
## 511  CEO prior career experience and expertise Firms Characteristics (Firm prestige)      227.000 238150.041  0.053  0.125    0.053  0.125    0.036    0.070   -0.108    0.214
## 512  CEO prior career experience and expertise General performance                         30.000  20911.000 -0.002  0.058   -0.002  0.058   -0.027    0.023   -0.077    0.073
## 513  CEO prior career experience and expertise Industry Performance                        50.000  48702.746  0.001  0.026    0.001  0.026   -0.010    0.013   -0.032    0.035
## 514  CEO prior career experience and expertise Insider power                               15.000  14411.000 -0.027  0.073   -0.027  0.073   -0.068    0.013   -0.121    0.066
## 515  CEO prior career experience and expertise Institution                                 18.000  21018.000 -0.025  0.060   -0.025  0.060   -0.055    0.006   -0.102    0.053
## 516  CEO prior career experience and expertise Institutional investor power                37.000  38230.000  0.015  0.028    0.015  0.028    0.002    0.029   -0.021    0.052
## 517  CEO prior career experience and expertise Labor market                                 2.000   1747.000  0.068  0.000    0.068  0.000    0.023    0.113    0.068    0.068
## 518  CEO prior career experience and expertise Large owners power                          17.000  20803.000 -0.002  0.026   -0.002  0.026   -0.021    0.017   -0.036    0.032
## 519  CEO prior career experience and expertise M                                           21.000  17646.000  0.037  0.073    0.037  0.073    0.003    0.072   -0.057    0.131
## 520  CEO prior career experience and expertise Minority CEO                                 4.000   4976.000  0.051  0.043    0.051  0.043    0.001    0.102   -0.004    0.106
## 521  CEO prior career experience and expertise Nominating committee power                   1.000    304.000  0.093           0.093          -0.018    0.205    0.093    0.093
## 522  CEO prior career experience and expertise Operational performance                     54.000  77326.000  0.047  0.063    0.047  0.063    0.029    0.066   -0.034    0.128
## 523  CEO prior career experience and expertise Ownership concentration                     12.000   9826.000  0.002  0.053    0.002  0.053   -0.034    0.038   -0.066    0.070
## 524  CEO prior career experience and expertise Region                                       9.000   5601.000 -0.022  0.044   -0.022  0.044   -0.061    0.017   -0.078    0.035
## 525  CEO prior career experience and expertise Shareholder power                            3.000    746.000  0.063  0.133    0.063  0.133   -0.104    0.230   -0.108    0.234
## 526  CEO prior career experience and expertise State/public-owned                          12.000  30168.000 -0.023  0.062   -0.023  0.062   -0.060    0.013   -0.103    0.056
## 527  CEO prior career experience and expertise Subjective performance                       7.000   2393.000  0.015  0.099    0.015  0.099   -0.069    0.099   -0.112    0.142
## 528  CEO prior career experience and expertise Tax Performance                              1.000     40.000  0.020           0.020          -0.293    0.334    0.020    0.020
## 529  CEO prior career experience and expertise X                                           73.000  51236.000  0.043  0.111    0.043  0.111    0.016    0.070   -0.100    0.185
## 530  CEO self-concept                          Board power                                 38.000  37422.000  0.044  0.086    0.045  0.087    0.015    0.074   -0.066    0.156
## 531  CEO self-concept                          Board, TMT & Employee career success         7.000   5023.000  0.017  0.018    0.017  0.019   -0.015    0.049   -0.007    0.041
## 532  CEO self-concept                          Board, TMT & Employee human capital         70.000  86128.000  0.065  0.132    0.065  0.133    0.033    0.097   -0.105    0.236
## 533  CEO self-concept                          CEO self-concept                           113.000 100717.000  0.191  0.200    0.197  0.203    0.159    0.235   -0.063    0.457
## 534  CEO self-concept                          CEO social capital                          16.000  14926.000  0.046  0.095    0.045  0.098   -0.006    0.095   -0.080    0.170
## 535  CEO self-concept                          CEO succession                               6.000   1100.000  0.057  0.023    0.057  0.023   -0.005    0.118    0.027    0.086
## 536  CEO self-concept                          CEO tenure                                  85.000 100586.000  0.007  0.085    0.007  0.085   -0.012    0.026   -0.102    0.116
## 537  CEO self-concept                          CEO total pay                               28.000  83259.000  0.039  0.321    0.040  0.322   -0.080    0.159   -0.374    0.453
## 538  CEO self-concept                          Certification awards and Social reputation  19.000  12178.000  0.105  0.126    0.105  0.127    0.046    0.165   -0.057    0.268
## 539  CEO self-concept                          Compensation committee monitoring           12.000  16426.000  0.028  0.021    0.028  0.022    0.009    0.048    0.001    0.056
## 540  CEO self-concept                          Consultant influence                         1.000     97.000  0.123           0.132          -0.080    0.344    0.132    0.132
## 541  CEO self-concept                          Country's socio-economic level               4.000  11318.000 -0.028  0.054   -0.028  0.054   -0.083    0.028   -0.097    0.041
## 542  CEO self-concept                          Demographic similarity (CEO VS TMT)          4.000   2913.000 -0.056  0.000   -0.057  0.000   -0.079   -0.035   -0.057   -0.057
## 543  CEO self-concept                          Employee and manager performance             5.000   3219.000  0.178  0.108    0.207  0.115    0.099    0.315    0.059    0.354
## 544  CEO self-concept                          Environment turbulence                      48.000  50744.000  0.023  0.138    0.017  0.143   -0.025    0.058   -0.167    0.200
## 545  CEO self-concept                          External supervision                        28.000  68920.000  0.095  0.158    0.092  0.163    0.032    0.153   -0.117    0.302
## 546  CEO self-concept                          Financial performance                      108.000 146415.000  0.028  0.140    0.028  0.141    0.001    0.055   -0.152    0.209
## 547  CEO self-concept                          Firm risk taking                           140.000 191114.000  0.032  0.097    0.030  0.099    0.013    0.047   -0.096    0.157
## 548  CEO self-concept                          Firms Characteristics (Firm prestige)      184.000 256955.413  0.055  0.124    0.053  0.126    0.034    0.072   -0.109    0.215
## 549  CEO self-concept                          General performance                         42.000  34123.098  0.003  0.132    0.001  0.133   -0.040    0.043   -0.170    0.172
## 550  CEO self-concept                          Industry Performance                        29.000  31714.000  0.017  0.097    0.011  0.100   -0.027    0.049   -0.117    0.139
## 551  CEO self-concept                          Insider power                                6.000   2252.000 -0.060  0.061   -0.060  0.061   -0.124    0.004   -0.137    0.018
## 552  CEO self-concept                          Institution                                  7.000  17043.000  0.248  0.242    0.248  0.242    0.068    0.428   -0.062    0.558
## 553  CEO self-concept                          Institutional investor power                21.000  52601.000  0.025  0.052    0.026  0.052    0.002    0.050   -0.042    0.093
## 554  CEO self-concept                          Labor union power                            1.000    190.000 -0.150          -0.159          -0.305   -0.012   -0.159   -0.159
## 555  CEO self-concept                          Large owners power                           5.000   3240.000 -0.064  0.043   -0.065  0.043   -0.116   -0.014   -0.120   -0.011
## 556  CEO self-concept                          M                                           24.000  17469.000  0.036  0.126    0.025  0.138   -0.032    0.083   -0.152    0.202
## 557  CEO self-concept                          Minority CEO                                 3.000   4476.000 -0.019  0.000   -0.020  0.000   -0.039   -0.001   -0.020   -0.020
## 558  CEO self-concept                          Operational performance                     53.000  72639.000  0.138  0.126    0.137  0.133    0.100    0.173   -0.034    0.307
## 559  CEO self-concept                          Ownership concentration                      3.000    746.000 -0.089  0.049   -0.089  0.049   -0.179    0.001   -0.152   -0.027
## 560  CEO self-concept                          Region                                       6.000   7630.000  0.065  0.092    0.065  0.093   -0.012    0.143   -0.054    0.184
## 561  CEO self-concept                          Religion                                     1.000    520.000  0.010           0.010          -0.076    0.096    0.010    0.010
## 562  CEO self-concept                          Shareholder power                            3.000   2333.000  0.006  0.000    0.006  0.000   -0.033    0.045    0.006    0.006
## 563  CEO self-concept                          State/public-owned                           6.000   9324.000 -0.065  0.016   -0.066  0.014   -0.089   -0.042   -0.084   -0.047
## 564  CEO self-concept                          Subjective performance                      11.000   4448.000  0.128  0.157    0.140  0.168    0.036    0.245   -0.075    0.356
## 565  CEO self-concept                          Tax Performance                              5.000  15374.000 -0.014  0.000   -0.014  0.000   -0.024   -0.003   -0.014   -0.014
## 566  CEO self-concept                          X                                           62.000  38287.000  0.033  0.081    0.031  0.085    0.007    0.054   -0.078    0.139
## 567  CEO social capital                        Board power                                 40.000  72876.000  0.007  0.062    0.007  0.062   -0.013    0.028   -0.073    0.087
## 568  CEO social capital                        Board, TMT & Employee career success         3.000   2871.000 -0.002  0.000   -0.002  0.000   -0.016    0.011   -0.002   -0.002
## 569  CEO social capital                        Board, TMT & Employee human capital         40.000  69213.000  0.074  0.079    0.074  0.079    0.048    0.099   -0.028    0.175
## 570  CEO social capital                        CEO social capital                          26.000  35981.000  0.125  0.137    0.125  0.137    0.071    0.179   -0.051    0.301
## 571  CEO social capital                        CEO succession                               2.000  17898.000  0.001  0.019    0.001  0.019   -0.029    0.032   -0.024    0.026
## 572  CEO social capital                        CEO tenure                                  35.000  58632.000  0.080  0.127    0.081  0.127    0.038    0.123   -0.082    0.243
## 573  CEO social capital                        CEO total pay                               13.000  28361.000  0.064  0.026    0.064  0.026    0.046    0.082    0.030    0.097
## 574  CEO social capital                        Certification awards and Social reputation   8.000   8749.000  0.049  0.135    0.049  0.135   -0.047    0.144   -0.124    0.221
## 575  CEO social capital                        Chairman power                               1.000     61.000  0.168           0.168          -0.078    0.414    0.168    0.168
## 576  CEO social capital                        Compensation committee monitoring            5.000  14710.000  0.005  0.025    0.005  0.025   -0.022    0.032   -0.027    0.037
## 577  CEO social capital                        Country governance quality                   1.000    337.000 -0.180          -0.180          -0.284   -0.077   -0.180   -0.180
## 578  CEO social capital                        Country's socio-economic level               2.000   8322.000 -0.005  0.000   -0.005  0.000   -0.009   -0.001   -0.005   -0.005
## 579  CEO social capital                        Demographic similarity (CEO VS TMT)          9.000   6852.000  0.042  0.045    0.041  0.048    0.001    0.081   -0.021    0.103
## 580  CEO social capital                        Employee and manager performance             1.000   2101.000  0.145           0.154           0.109    0.198    0.154    0.154
## 581  CEO social capital                        Environment turbulence                      14.000  10822.000 -0.019  0.028   -0.019  0.027   -0.043    0.004   -0.055    0.016
## 582  CEO social capital                        External supervision                         5.000  12310.000  0.056  0.030    0.056  0.030    0.024    0.087    0.017    0.094
## 583  CEO social capital                        Financial performance                       48.000  87360.000 -0.003  0.036   -0.003  0.036   -0.015    0.010   -0.049    0.044
## 584  CEO social capital                        Firm risk taking                            60.000 105579.000 -0.010  0.047   -0.010  0.047   -0.023    0.004   -0.070    0.050
## 585  CEO social capital                        Firms Characteristics (Firm prestige)       70.000 114476.000  0.059  0.103    0.059  0.103    0.034    0.084   -0.074    0.191
## 586  CEO social capital                        General performance                         11.000  14028.000 -0.043  0.113   -0.043  0.113   -0.112    0.026   -0.189    0.102
## 587  CEO social capital                        Industry Performance                         8.000   4933.000 -0.027  0.000   -0.027  0.000   -0.054   -0.000   -0.027   -0.027
## 588  CEO social capital                        Insider power                                3.000   3808.000  0.178  0.051    0.178  0.051    0.113    0.243    0.113    0.243
## 589  CEO social capital                        Institution                                  3.000   9784.000 -0.001  0.000   -0.001  0.000   -0.017    0.014   -0.001   -0.001
## 590  CEO social capital                        Institutional investor power                 8.000  14602.000  0.035  0.061    0.035  0.061   -0.010    0.080   -0.043    0.113
## 591  CEO social capital                        Labor market                                 1.000  14250.000  0.410           0.410           0.396    0.424    0.410    0.410
## 592  CEO social capital                        Large owners power                           4.000  13530.000 -0.037  0.034   -0.037  0.034   -0.075   -0.000   -0.081    0.006
## 593  CEO social capital                        M                                            6.000   7766.000 -0.005  0.059   -0.005  0.059   -0.057    0.047   -0.080    0.071
## 594  CEO social capital                        Minority CEO                                 2.000   3451.000 -0.046  0.038   -0.046  0.038   -0.109    0.016   -0.095    0.003
## 595  CEO social capital                        Nominating committee power                   1.000    534.000  0.212           0.212           0.131    0.293    0.212    0.212
## 596  CEO social capital                        Operational performance                     16.000  17683.000 -0.013  0.082   -0.013  0.082   -0.056    0.030   -0.119    0.092
## 597  CEO social capital                        Ownership concentration                      5.000  22173.000 -0.050  0.084   -0.050  0.084   -0.124    0.025   -0.157    0.058
## 598  CEO social capital                        Region                                       6.000   7747.000  0.004  0.068    0.004  0.068   -0.055    0.063   -0.083    0.092
## 599  CEO social capital                        Religion                                     1.000    520.000 -0.000          -0.000          -0.086    0.086   -0.000   -0.000
## 600  CEO social capital                        Shareholder power                            1.000   2340.000  0.028           0.028          -0.012    0.069    0.028    0.028
## 601  CEO social capital                        State/public-owned                          14.000  38297.000  0.081  0.185    0.081  0.185   -0.016    0.179   -0.156    0.319
## 602  CEO social capital                        Tax Performance                              1.000    520.000 -0.015          -0.015          -0.101    0.071   -0.015   -0.015
## 603  CEO social capital                        Voting rights                                1.000   1277.000  0.070           0.070           0.015    0.125    0.070    0.070
## 604  CEO social capital                        X                                           19.000  28983.000 -0.032  0.104   -0.032  0.104   -0.081    0.016   -0.166    0.102
## 605  CEO succession                            Board power                                 20.000  10521.000 -0.049  0.087   -0.049  0.087   -0.092   -0.007   -0.160    0.062
## 606  CEO succession                            Board, TMT & Employee career success         5.000   1211.000  0.091  0.000    0.091  0.000    0.061    0.120    0.091    0.091
## 607  CEO succession                            Board, TMT & Employee human capital         11.000   8788.000 -0.027  0.020   -0.027  0.020   -0.051   -0.003   -0.053   -0.001
## 608  CEO succession                            CEO succession                               9.000   8091.000  0.287  0.243    0.287  0.243    0.127    0.447   -0.024    0.599
## 609  CEO succession                            CEO tenure                                  24.000  16638.000 -0.191  0.157   -0.191  0.157   -0.255   -0.126   -0.392    0.010
## 610  CEO succession                            CEO total pay                                8.000   8483.000 -0.037  0.038   -0.037  0.038   -0.071   -0.003   -0.086    0.012
## 611  CEO succession                            Certification awards and Social reputation  10.000   7515.000  0.007  0.050    0.007  0.050   -0.032    0.046   -0.058    0.072
## 612  CEO succession                            Compensation committee monitoring            1.000    663.000 -0.064          -0.064          -0.139    0.012   -0.064   -0.064
## 613  CEO succession                            Demographic similarity (CEO VS TMT)          2.000    314.000  0.050  0.000    0.050  0.000    0.032    0.068    0.050    0.050
## 614  CEO succession                            Environment turbulence                      12.000   5856.000  0.053  0.019    0.053  0.019    0.025    0.081    0.028    0.078
## 615  CEO succession                            External supervision                         3.000    864.000 -0.028  0.028   -0.028  0.028   -0.102    0.046   -0.064    0.008
## 616  CEO succession                            Financial performance                       28.000  21946.000 -0.002  0.044   -0.002  0.044   -0.023    0.019   -0.059    0.054
## 617  CEO succession                            Firm risk taking                            37.000  45583.000  0.060  0.082    0.060  0.082    0.032    0.088   -0.046    0.166
## 618  CEO succession                            Firms Characteristics (Firm prestige)       39.000  44168.000 -0.041  0.065   -0.041  0.065   -0.063   -0.019   -0.124    0.042
## 619  CEO succession                            General performance                          6.000   7578.000  0.013  0.025    0.013  0.025   -0.018    0.043   -0.020    0.045
## 620  CEO succession                            Industry Performance                         9.000   8184.000  0.037  0.006    0.037  0.006    0.015    0.059    0.029    0.044
## 621  CEO succession                            Insider power                                1.000    375.000  0.080           0.080          -0.021    0.181    0.080    0.080
## 622  CEO succession                            Institution                                  6.000   6566.000  0.083  0.036    0.083  0.036    0.045    0.121    0.037    0.129
## 623  CEO succession                            Institutional investor power                 9.000   5424.000 -0.003  0.036   -0.003  0.036   -0.038    0.033   -0.048    0.043
## 624  CEO succession                            Labor market                                 1.000  14250.000  0.040           0.040           0.024    0.056    0.040    0.040
## 625  CEO succession                            Large owners power                           3.000   4032.000  0.077  0.013    0.077  0.013    0.043    0.111    0.061    0.093
## 626  CEO succession                            M                                            5.000   5271.000 -0.046  0.080   -0.046  0.080   -0.121    0.029   -0.149    0.057
## 627  CEO succession                            Operational performance                      3.000    475.000  0.082  0.000    0.082  0.000    0.013    0.152    0.082    0.082
## 628  CEO succession                            Ownership concentration                      4.000    659.000 -0.087  0.000   -0.087  0.000   -0.147   -0.027   -0.087   -0.087
## 629  CEO succession                            Shareholder power                            1.000   1830.000  0.010           0.010          -0.036    0.055    0.010    0.010
## 630  CEO succession                            State/public-owned                           2.000   3427.000 -0.003  0.000   -0.003  0.000   -0.030    0.023   -0.003   -0.003
## 631  CEO succession                            Subjective performance                       1.000    438.000 -0.050          -0.050          -0.144    0.043   -0.050   -0.050
## 632  CEO succession                            X                                           17.000  17866.000  0.044  0.123    0.044  0.123   -0.016    0.104   -0.113    0.202
## 633  CEO tenure                                Board power                                200.000 327673.174 -0.018  0.103   -0.018  0.103   -0.033   -0.003   -0.151    0.114
## 634  CEO tenure                                Board, TMT & Employee career success        25.000  41724.000 -0.114  0.148   -0.114  0.148   -0.173   -0.056   -0.304    0.076
## 635  CEO tenure                                Board, TMT & Employee human capital        190.000 292953.135 -0.015  0.085   -0.015  0.085   -0.028   -0.003   -0.124    0.093
## 636  CEO tenure                                CEO tenure                                  37.000  87906.000  0.298  0.239    0.298  0.239    0.221    0.375   -0.009    0.605
## 637  CEO tenure                                CEO total pay                              154.000 411863.147  0.008  0.076    0.008  0.076   -0.004    0.021   -0.090    0.106
## 638  CEO tenure                                Certification awards and Social reputation  24.000  19775.000  0.028  0.095    0.028  0.095   -0.013    0.068   -0.094    0.149
## 639  CEO tenure                                Chairman power                               2.000    191.000 -0.061  0.103   -0.061  0.103   -0.263    0.140   -0.193    0.071
## 640  CEO tenure                                Compensation committee monitoring           36.000  89422.000  0.038  0.088    0.038  0.088    0.009    0.067   -0.074    0.150
## 641  CEO tenure                                Consultant influence                         5.000   1335.000 -0.060  0.000   -0.060  0.000   -0.099   -0.020   -0.060   -0.060
## 642  CEO tenure                                Country governance quality                   3.000    877.000  0.133  0.000    0.133  0.000    0.115    0.151    0.133    0.133
## 643  CEO tenure                                Country's socio-economic level              16.000  18798.000  0.056  0.103    0.056  0.103    0.004    0.108   -0.076    0.188
## 644  CEO tenure                                Demographic similarity (CEO VS TMT)          9.000   3980.000 -0.034  0.069   -0.034  0.069   -0.089    0.021   -0.123    0.055
## 645  CEO tenure                                Employee and manager performance             2.000   2507.000  0.019  0.000    0.020  0.000    0.007    0.033    0.020    0.020
## 646  CEO tenure                                Environment turbulence                      88.000 141958.000 -0.001  0.042   -0.001  0.042   -0.011    0.009   -0.055    0.053
## 647  CEO tenure                                External supervision                        44.000 169360.000 -0.008  0.044   -0.008  0.044   -0.022    0.006   -0.064    0.048
## 648  CEO tenure                                Financial performance                      339.000 747773.376  0.013  0.037    0.013  0.037    0.008    0.017   -0.035    0.060
## 649  CEO tenure                                Firm risk taking                           365.000 776151.529 -0.021  0.047   -0.021  0.047   -0.026   -0.016   -0.081    0.039
## 650  CEO tenure                                Firms Characteristics (Firm prestige)      420.000 767699.533  0.008  0.087    0.008  0.087   -0.001    0.016   -0.104    0.120
## 651  CEO tenure                                General performance                         76.000 111275.000 -0.022  0.042   -0.022  0.042   -0.033   -0.011   -0.075    0.032
## 652  CEO tenure                                Industry Performance                        88.000 155044.000  0.008  0.023    0.008  0.023    0.002    0.015   -0.021    0.038
## 653  CEO tenure                                Insider power                               34.000  43072.000  0.169  0.158    0.169  0.158    0.115    0.223   -0.034    0.371
## 654  CEO tenure                                Institution                                 38.000  84963.000 -0.017  0.039   -0.017  0.039   -0.031   -0.003   -0.066    0.033
## 655  CEO tenure                                Institutional investor power                88.000 242255.000 -0.014  0.042   -0.014  0.042   -0.024   -0.004   -0.067    0.039
## 656  CEO tenure                                Labor market                                 3.000   1962.000 -0.004  0.000   -0.004  0.000   -0.027    0.019   -0.004   -0.004
## 657  CEO tenure                                Labor union power                            1.000    170.000 -0.171          -0.171          -0.317   -0.024   -0.171   -0.171
## 658  CEO tenure                                Large owners power                          48.000  52077.000 -0.005  0.061   -0.005  0.061   -0.024    0.015   -0.083    0.074
## 659  CEO tenure                                M                                           22.000  17080.000  0.080  0.138    0.080  0.138    0.020    0.140   -0.098    0.257
## 660  CEO tenure                                Minority CEO                                 5.000  15036.000 -0.039  0.031   -0.039  0.031   -0.070   -0.007   -0.078    0.001
## 661  CEO tenure                                Nominating committee power                   3.000   1999.000 -0.022  0.073   -0.022  0.073   -0.115    0.071   -0.115    0.071
## 662  CEO tenure                                Operational performance                    106.000 205329.000 -0.006  0.047   -0.006  0.047   -0.016    0.004   -0.067    0.055
## 663  CEO tenure                                Ownership concentration                     22.000  42649.000 -0.048  0.049   -0.048  0.049   -0.071   -0.026   -0.111    0.014
## 664  CEO tenure                                Peer-group control                           1.000    280.000 -0.038          -0.038          -0.155    0.080   -0.038   -0.038
## 665  CEO tenure                                Region                                      11.000  14149.000 -0.003  0.023   -0.003  0.023   -0.024    0.018   -0.032    0.026
## 666  CEO tenure                                Shareholder power                           17.000  59243.000 -0.050  0.025   -0.050  0.025   -0.064   -0.036   -0.081   -0.018
## 667  CEO tenure                                State/public-owned                          19.000  70756.000 -0.023  0.079   -0.023  0.079   -0.059    0.013   -0.124    0.078
## 668  CEO tenure                                Subjective performance                      12.000   6574.000  0.047  0.048    0.048  0.050    0.010    0.085   -0.016    0.112
## 669  CEO tenure                                Tax Performance                              5.000  12884.000  0.010  0.000    0.010  0.000   -0.005    0.025    0.010    0.010
## 670  CEO tenure                                Voting rights                                1.000    267.000 -0.073          -0.073          -0.193    0.046   -0.073   -0.073
## 671  CEO tenure                                X                                          122.000 213207.915 -0.007  0.072   -0.007  0.072   -0.020    0.006   -0.099    0.085
## 672  CEO total pay                             Board power                                131.000 265244.000  0.049  0.118    0.049  0.118    0.029    0.070   -0.102    0.201
## 673  CEO total pay                             Board, TMT & Employee career success        26.000  64292.000  0.054  0.128    0.054  0.128    0.005    0.104   -0.109    0.218
## 674  CEO total pay                             Board, TMT & Employee human capital        115.000 283072.620  0.115  0.160    0.115  0.160    0.086    0.145   -0.090    0.321
## 675  CEO total pay                             CEO total pay                               88.000 237704.000  0.278  0.321    0.278  0.321    0.211    0.345   -0.134    0.690
## 676  CEO total pay                             Certification awards and Social reputation  22.000  16284.000  0.121  0.130    0.121  0.130    0.064    0.177   -0.046    0.287
## 677  CEO total pay                             Chairman power                               2.000    446.000  0.015  0.000    0.015  0.000    0.006    0.025    0.015    0.015
## 678  CEO total pay                             Compensation committee monitoring           38.000 120129.000  0.146  0.258    0.146  0.258    0.064    0.228   -0.184    0.476
## 679  CEO total pay                             Consultant influence                         4.000   2806.000  0.129  0.045    0.129  0.045    0.072    0.186    0.072    0.187
## 680  CEO total pay                             Country's socio-economic level              11.000  23166.000  0.020  0.190    0.020  0.190   -0.093    0.133   -0.223    0.263
## 681  CEO total pay                             Demographic similarity (CEO VS TMT)          6.000   4256.000  0.005  0.023    0.005  0.023   -0.030    0.041   -0.025    0.035
## 682  CEO total pay                             Employee and manager performance             2.000    675.000 -0.028  0.000   -0.028  0.000   -0.048   -0.008   -0.028   -0.028
## 683  CEO total pay                             Environment turbulence                      31.000 104161.000 -0.016  0.046   -0.016  0.046   -0.033    0.001   -0.075    0.042
## 684  CEO total pay                             External supervision                        44.000 207881.000  0.022  0.092    0.022  0.092   -0.006    0.049   -0.096    0.139
## 685  CEO total pay                             Financial performance                      229.000 573844.747  0.048  0.090    0.048  0.090    0.036    0.060   -0.068    0.163
## 686  CEO total pay                             Firm risk taking                           227.000 589855.486  0.021  0.088    0.021  0.088    0.010    0.033   -0.091    0.134
## 687  CEO total pay                             Firms Characteristics (Firm prestige)      235.000 584542.933  0.169  0.226    0.169  0.226    0.140    0.198   -0.120    0.459
## 688  CEO total pay                             General performance                         34.000  53824.000  0.051  0.082    0.051  0.082    0.023    0.080   -0.054    0.157
## 689  CEO total pay                             Industry Performance                        37.000  64639.000  0.063  0.125    0.063  0.125    0.022    0.104   -0.097    0.223
## 690  CEO total pay                             Insider power                               27.000  24370.000 -0.083  0.031   -0.083  0.031   -0.101   -0.066   -0.123   -0.044
## 691  CEO total pay                             Institution                                 18.000  52073.000 -0.051  0.291   -0.051  0.291   -0.185    0.084   -0.423    0.321
## 692  CEO total pay                             Institutional investor power                68.000 140072.000 -0.003  0.177   -0.003  0.177   -0.045    0.039   -0.230    0.223
## 693  CEO total pay                             Labor market                                 2.000   1256.000  0.119  0.000    0.119  0.000    0.117    0.121    0.119    0.119
## 694  CEO total pay                             Labor union power                            2.000    263.000 -0.196  0.000   -0.196  0.000   -0.242   -0.150   -0.196   -0.196
## 695  CEO total pay                             Large owners power                          38.000  59777.000 -0.050  0.061   -0.050  0.061   -0.071   -0.028   -0.128    0.029
## 696  CEO total pay                             M                                           16.000  11902.000  0.062  0.113    0.062  0.113    0.004    0.120   -0.083    0.207
## 697  CEO total pay                             Minority CEO                                 1.000  10060.000  0.040           0.040           0.020    0.060    0.040    0.040
## 698  CEO total pay                             Nominating committee power                   1.000   1110.000  0.010           0.010          -0.049    0.069    0.010    0.010
## 699  CEO total pay                             Operational performance                     66.000 158700.000 -0.013  0.097   -0.013  0.097   -0.037    0.011   -0.138    0.111
## 700  CEO total pay                             Ownership concentration                     14.000  11340.000 -0.013  0.072   -0.013  0.072   -0.055    0.028   -0.105    0.078
## 701  CEO total pay                             Peer-group control                           1.000    280.000  0.075           0.075          -0.042    0.192    0.075    0.075
## 702  CEO total pay                             Region                                      10.000  13292.000  0.043  0.074    0.043  0.074   -0.006    0.092   -0.052    0.138
## 703  CEO total pay                             Religion                                     1.000    520.000 -0.015          -0.015          -0.101    0.071   -0.015   -0.015
## 704  CEO total pay                             Shareholder power                           16.000  44100.000  0.035  0.061    0.035  0.061    0.004    0.067   -0.043    0.114
## 705  CEO total pay                             State/public-owned                          14.000  52745.000 -0.028  0.096   -0.028  0.096   -0.079    0.023   -0.151    0.095
## 706  CEO total pay                             Subjective performance                       2.000   1265.000  0.057  0.056    0.057  0.056   -0.039    0.152   -0.015    0.129
## 707  CEO total pay                             Tax Performance                              8.000  16444.000 -0.004  0.064   -0.004  0.064   -0.051    0.042   -0.086    0.077
## 708  CEO total pay                             X                                           70.000 159485.000  0.023  0.081    0.023  0.081    0.003    0.042   -0.081    0.126
## 709  CEO total pay                             firms Characteristics (Firm prestige)        1.000     63.000  0.520           0.520           0.339    0.702    0.520    0.520
## 710  Demographic similarity (CEO VS TMT)       Board power                                 12.000   6984.000  0.060  0.078    0.059  0.081    0.007    0.111   -0.045    0.164
## 711  Demographic similarity (CEO VS TMT)       Board, TMT & Employee career success         6.000  20815.000  0.030  0.022    0.030  0.022    0.008    0.053    0.002    0.059
## 712  Demographic similarity (CEO VS TMT)       Board, TMT & Employee human capital         19.000  29705.000  0.156  0.165    0.160  0.165    0.084    0.235   -0.052    0.371
## 713  Demographic similarity (CEO VS TMT)       Certification awards and Social reputation   3.000   5622.000 -0.101  0.040   -0.101  0.040   -0.153   -0.048   -0.153   -0.049
## 714  Demographic similarity (CEO VS TMT)       Chairman power                               1.000     61.000  0.013           0.013          -0.240    0.266    0.013    0.013
## 715  Demographic similarity (CEO VS TMT)       Compensation committee monitoring            3.000    424.000 -0.018  0.000   -0.018  0.000   -0.046    0.009   -0.018   -0.018
## 716  Demographic similarity (CEO VS TMT)       Demographic similarity (CEO VS TMT)         15.000  10833.000  0.101  0.161    0.100  0.167    0.013    0.186   -0.114    0.314
## 717  Demographic similarity (CEO VS TMT)       Employee and manager performance             2.000   5996.000  0.020  0.079    0.020  0.084   -0.098    0.139   -0.087    0.128
## 718  Demographic similarity (CEO VS TMT)       Environment turbulence                       7.000   1572.000  0.074  0.000    0.074  0.000    0.034    0.114    0.074    0.074
## 719  Demographic similarity (CEO VS TMT)       External supervision                         2.000    228.000  0.150  0.000    0.150  0.000    0.109    0.190    0.150    0.150
## 720  Demographic similarity (CEO VS TMT)       Financial performance                       22.000  16847.000 -0.015  0.030   -0.015  0.030   -0.034    0.005   -0.053    0.023
## 721  Demographic similarity (CEO VS TMT)       Firm risk taking                            18.000  14119.000 -0.003  0.051   -0.003  0.051   -0.032    0.026   -0.068    0.063
## 722  Demographic similarity (CEO VS TMT)       Firms Characteristics (Firm prestige)       24.000  14641.000  0.021  0.056    0.021  0.056   -0.007    0.049   -0.051    0.093
## 723  Demographic similarity (CEO VS TMT)       General performance                          6.000   7861.000  0.010  0.000    0.010  0.000   -0.007    0.026    0.010    0.010
## 724  Demographic similarity (CEO VS TMT)       Industry Performance                         2.000    435.000  0.047  0.000    0.047  0.000   -0.011    0.104    0.047    0.047
## 725  Demographic similarity (CEO VS TMT)       Insider power                                1.000    413.000  0.018           0.018          -0.079    0.115    0.018    0.018
## 726  Demographic similarity (CEO VS TMT)       Institution                                  2.000    456.000 -0.286  0.000   -0.286  0.000   -0.297   -0.275   -0.286   -0.286
## 727  Demographic similarity (CEO VS TMT)       Institutional investor power                 2.000   1727.000 -0.023  0.000   -0.023  0.000   -0.027   -0.020   -0.023   -0.023
## 728  Demographic similarity (CEO VS TMT)       M                                            4.000   4005.000 -0.071  0.153   -0.071  0.153   -0.224    0.082   -0.266    0.125
## 729  Demographic similarity (CEO VS TMT)       Minority CEO                                 1.000   2101.000 -0.020          -0.020          -0.063    0.023   -0.020   -0.020
## 730  Demographic similarity (CEO VS TMT)       State/public-owned                           1.000    129.000 -0.030          -0.030          -0.203    0.143   -0.030   -0.030
## 731  Demographic similarity (CEO VS TMT)       Subjective performance                       1.000    129.000  0.033           0.033          -0.140    0.207    0.033    0.033
## 732  Demographic similarity (CEO VS TMT)       X                                            9.000   9928.000 -0.022  0.105   -0.024  0.109   -0.098    0.050   -0.163    0.115
## 733  Minority CEO                              Board power                                  2.000  11410.000  0.023  0.033    0.023  0.033   -0.026    0.072   -0.019    0.065
## 734  Minority CEO                              Board, TMT & Employee career success         2.000   3126.000  0.000  0.000    0.000  0.000    0.000    0.000    0.000    0.000
## 735  Minority CEO                              Board, TMT & Employee human capital          4.000  14536.000 -0.039  0.042   -0.039  0.042   -0.083    0.006   -0.093    0.015
## 736  Minority CEO                              Certification awards and Social reputation   1.000   1350.000  0.040           0.040          -0.013    0.093    0.040    0.040
## 737  Minority CEO                              Employee and manager performance             1.000   2101.000 -0.020          -0.021          -0.067    0.024   -0.021   -0.021
## 738  Minority CEO                              Financial performance                        3.000  13186.000 -0.020  0.000   -0.020  0.000   -0.020   -0.020   -0.020   -0.020
## 739  Minority CEO                              Firm risk taking                             4.000  14536.000  0.013  0.008    0.013  0.008   -0.005    0.031    0.003    0.023
## 740  Minority CEO                              Firms Characteristics (Firm prestige)        5.000  15036.000 -0.016  0.026   -0.016  0.026   -0.044    0.011   -0.049    0.017
## 741  Minority CEO                              General performance                          2.000   3126.000 -0.020  0.000   -0.020  0.000   -0.020   -0.020   -0.020   -0.020
## 742  Minority CEO                              Institution                                  2.000  11410.000  0.029  0.026    0.029  0.026   -0.011    0.070   -0.004    0.063
## 743  Minority CEO                              Institutional investor power                 1.000  10060.000  0.030           0.030           0.010    0.050    0.030    0.030
## 744  Minority CEO                              M                                            2.000   3126.000  0.035  0.000    0.035  0.000    0.025    0.045    0.035    0.035
## 745  Minority CEO                              X                                            2.000   1850.000  0.028  0.000    0.028  0.000    0.022    0.034    0.028    0.028
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────

3 MULTIGROUP META-ANALYSIS AND DIFFERENCE TESTS

#Freq(FullResults$HI1VC2HC3VI4)
Contrast <- FullResults[HI1VC2HC3VI4<3]%>%
  .[, cc("construct_x,construct_y,analysis_id") := NULL]
#Contrast <- FullResults[Culture != "All Levels", !("construct_x"), with = FALSE]

Contrast <- cHS.ESRowDif(
  Contrast,         # 输入数据
  mean_r, # 效应大小列
  TwoGroup = F,
  title = "",
  SE)             # 标准误列
#  TableESDif = TRUE,   # 打印结果表
#  note = TRUE,         # 显示英文说明
#  Cnote = FALSE        # 不显示中文说明
#)
print_table(Contrast[, setdiff(1:(ncol(Contrast) - 3), which(names(Contrast) %in% c("construct_x", "analysis_id", "SE"))), with = FALSE]
,title = "TABLE 2. Cross-countries meta-analysis based on difference tests of effect sizes")#,file = "T2.doc",row.names = F)
## TABLE 2. Cross-countries meta-analysis based on difference tests of effect sizes
## ─────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                               X                                          Y HI1VC2HC3VI4       k          N mean_r sd_res mean_rho sd_rho CI_LL_95 CI_UL_95 CR_LL_80 CR_UL_80    Dif       Z  DifP
## ─────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## 1     CEO Ethnicity                             Board power                                           1   1.000    339.000  0.090           0.090          -0.016    0.196    0.090    0.090  0.210              
## 2     CEO Ethnicity                             Board, TMT & Employee human capital                   1   1.000    339.000 -0.120          -0.120          -0.225   -0.015   -0.120   -0.120 -0.200              
## 3     CEO Ethnicity                             CEO gender                                            1   1.000    339.000  0.080           0.080          -0.026    0.186    0.080    0.080  0.084              
## 4     CEO Ethnicity                             CEO power                                             1   1.000    339.000 -0.004          -0.004          -0.111    0.103   -0.004   -0.004 -0.024              
## 5     CEO Ethnicity                             CEO prior career experience and expertise             1   1.000    339.000  0.020           0.020          -0.087    0.127    0.020    0.020  0.030              
## 6     CEO Ethnicity                             CEO social capital                                    1   1.000    339.000 -0.010          -0.010          -0.117    0.097   -0.010   -0.010  0.040              
## 7     CEO Ethnicity                             CEO tenure                                            1   1.000    339.000 -0.050          -0.050          -0.156    0.056   -0.050   -0.050 -0.080              
## 8     CEO Ethnicity                             Environment turbulence                                1   1.000    339.000  0.030           0.030          -0.076    0.137    0.030    0.030  0.020              
## 9     CEO Ethnicity                             Firm risk taking                                      1   1.000    339.000  0.010           0.010          -0.097    0.117    0.010    0.010 -0.030              
## 10    CEO Ethnicity                             Firms Characteristics (Firm prestige)                 1   1.000    339.000  0.040           0.040          -0.066    0.146    0.040    0.040  0.110              
## 11    CEO Ethnicity                             X                                                     1   1.000    339.000 -0.070          -0.070          -0.176    0.036   -0.070   -0.070 -0.067              
## 12    CEO Leadership behavior                   Board power                                           1   6.000  14513.000 -0.004  0.056   -0.004  0.057   -0.053    0.044   -0.077    0.068 -0.005  -0.177 0.860
## 13    CEO Leadership behavior                   Board, TMT & Employee career success                  1   2.000   2206.000  0.001  0.000    0.002  0.000   -0.008    0.011    0.002    0.002 -0.423  -2.387 0.017
## 14    CEO Leadership behavior                   Board, TMT & Employee career success                  2   2.000    213.000  0.424  0.220    0.484  0.276    0.080    0.887    0.130    0.837  0.377   2.120 0.034
## 15    CEO Leadership behavior                   Board, TMT & Employee human capital                   1  13.000   5407.000  0.048  0.047    0.051  0.050    0.012    0.090   -0.013    0.115 -0.055  -1.831 0.067
## 16    CEO Leadership behavior                   Board, TMT & Employee human capital                   2  14.000   3726.000  0.102  0.093    0.108  0.102    0.045    0.172   -0.022    0.239 -0.233  -6.169 0.000
## 17    CEO Leadership behavior                   CEO Leadership behavior                               1  33.000  17726.000  0.335  0.130    0.403  0.166    0.344    0.461    0.190    0.615 -0.146  -3.025 0.002
## 18    CEO Leadership behavior                   CEO Leadership behavior                               2  13.000   3808.000  0.481  0.132    0.521  0.137    0.442    0.600    0.345    0.697  0.195   1.211 0.226
## 19    CEO Leadership behavior                   CEO long-term incentive pay                           1   3.000   1120.000  0.286  0.251    0.307  0.260    0.007    0.607   -0.026    0.640 -0.120  -0.713 0.476
## 20    CEO Leadership behavior                   CEO managerial ability                                1   3.000   2736.000  0.406  0.108    0.418  0.101    0.300    0.537    0.289    0.548  0.156              
## 21    CEO Leadership behavior                   CEO perquisites                                       1   1.000    793.000  0.250           0.267           0.197    0.336    0.267    0.267  0.233              
## 22    CEO Leadership behavior                   CEO power                                             1   7.000   3714.000  0.017  0.170    0.016  0.181   -0.122    0.155   -0.215    0.248 -0.042  -0.569 0.569
## 23    CEO Leadership behavior                   CEO power                                             2   3.000    950.000  0.059  0.067    0.061  0.069   -0.041    0.163   -0.027    0.150  0.014   0.283 0.777
## 24    CEO Leadership behavior                   CEO prior career experience and expertise             1   6.000   4763.000  0.045  0.063    0.048  0.064   -0.011    0.107   -0.034    0.130 -0.055              
## 25    CEO Leadership behavior                   CEO prior career experience and expertise             2   1.000    152.000  0.100           0.106          -0.061    0.272    0.106    0.106 -0.073              
## 26    CEO Leadership behavior                   CEO self-concept                                      1  34.000  18949.000  0.174  0.115    0.215  0.149    0.162    0.268    0.024    0.406  0.073   1.189 0.234
## 27    CEO Leadership behavior                   CEO self-concept                                      2   8.000   2437.000  0.100  0.147    0.110  0.168   -0.015    0.234   -0.106    0.325 -0.043  -0.700 0.484
## 28    CEO Leadership behavior                   CEO social capital                                    1   4.000   4837.000  0.144  0.047    0.151  0.054    0.091    0.211    0.082    0.220  0.135   4.192 0.000
## 29    CEO Leadership behavior                   CEO tenure                                            1  12.000   4933.000  0.008  0.069    0.009  0.072   -0.042    0.059   -0.084    0.101 -0.016  -0.763 0.446
## 30    CEO Leadership behavior                   CEO tenure                                            2  11.000   2253.000  0.024  0.000    0.027  0.000   -0.013    0.066    0.027    0.027 -0.218 -17.536 0.000
## 31    CEO Leadership behavior                   CEO total pay                                         1   3.000   1068.000  0.242  0.020    0.255  0.025    0.189    0.322    0.223    0.287  0.265              
## 32    CEO Leadership behavior                   Certification awards and Social reputation            1   1.000    367.000 -0.023          -0.023          -0.126    0.079   -0.023   -0.023 -0.500              
## 33    CEO Leadership behavior                   Compensation committee monitoring                     1   1.000    175.000  0.477           0.477           0.362    0.592    0.477    0.477  0.706              
## 34    CEO Leadership behavior                   Consultant influence                                  1   1.000    175.000 -0.229          -0.229          -0.369   -0.088   -0.229   -0.229 -0.314              
## 35    CEO Leadership behavior                   Demographic similarity (CEO VS TMT)                   1   3.000   4153.000  0.085  0.000    0.093  0.000    0.067    0.118    0.093    0.093  0.052              
## 36    CEO Leadership behavior                   Demographic similarity (CEO VS TMT)                   2   1.000    129.000  0.033           0.034          -0.142    0.211    0.034    0.034 -0.069              
## 37    CEO Leadership behavior                   Employee and manager performance                      1   3.000   2501.000  0.103  0.000    0.117  0.000    0.110    0.124    0.117    0.117 -0.069  -0.988 0.323
## 38    CEO Leadership behavior                   Employee and manager performance                      2   6.000   1569.000  0.172  0.152    0.193  0.175    0.043    0.343   -0.031    0.417  0.223   2.814 0.005
## 39    CEO Leadership behavior                   Environment turbulence                                1   5.000    643.000 -0.051  0.068   -0.063  0.066   -0.164    0.038   -0.147    0.021 -0.191  -2.950 0.003
## 40    CEO Leadership behavior                   Environment turbulence                                2   7.000    849.000  0.140  0.122    0.160  0.150    0.024    0.296   -0.032    0.353  0.149   2.821 0.005
## 41    CEO Leadership behavior                   External supervision                                  1   2.000  11176.000 -0.009  0.000   -0.009  0.000   -0.011   -0.006   -0.009   -0.009 -0.009              
## 42    CEO Leadership behavior                   External supervision                                  2   1.000    180.000  0.000           0.000          -0.149    0.149    0.000    0.000 -0.025              
## 43    CEO Leadership behavior                   Financial performance                                 1  11.000  15636.000  0.025  0.063    0.026  0.064   -0.016    0.067   -0.057    0.108 -0.156  -3.116 0.002
## 44    CEO Leadership behavior                   Financial performance                                 2   5.000   1658.000  0.181  0.088    0.212  0.103    0.107    0.317    0.081    0.343  0.151   3.021 0.003
## 45    CEO Leadership behavior                   Firm risk taking                                      1  15.000  17488.000  0.030  0.072    0.031  0.074   -0.009    0.071   -0.064    0.125 -0.218  -1.650 0.099
## 46    CEO Leadership behavior                   Firm risk taking                                      2   3.000    600.000  0.249  0.220    0.257  0.228   -0.013    0.526   -0.035    0.549  0.206   1.558 0.119
## 47    CEO Leadership behavior                   Firms Characteristics (Firm prestige)                 1  27.000  21441.000  0.042  0.147    0.030  0.161   -0.032    0.092   -0.176    0.236 -0.060  -1.578 0.115
## 48    CEO Leadership behavior                   Firms Characteristics (Firm prestige)                 2  25.000   5871.000  0.103  0.149    0.112  0.153    0.046    0.178   -0.085    0.309  0.027   0.365 0.715
## 49    CEO Leadership behavior                   General performance                                   1   4.000   2441.000  0.076  0.119    0.084  0.125   -0.046    0.214   -0.077    0.244 -0.215  -2.712 0.007
## 50    CEO Leadership behavior                   General performance                                   2   7.000   1023.000  0.290  0.107    0.319  0.128    0.206    0.432    0.155    0.482  0.072   1.436 0.151
## 51    CEO Leadership behavior                   Industry Performance                                  1  10.000   5614.000  0.218  0.058    0.283  0.081    0.224    0.343    0.180    0.387  0.208              
## 52    CEO Leadership behavior                   Institutional investor power                          1   1.000    793.000  0.010           0.011          -0.064    0.085    0.011    0.011 -0.030              
## 53    CEO Leadership behavior                   Large owners power                                    1   1.000    793.000  0.040           0.043          -0.031    0.117    0.043    0.043 -0.158              
## 54    CEO Leadership behavior                   M                                                     1  17.000  11721.000  0.198  0.177    0.234  0.239    0.118    0.349   -0.073    0.540 -0.143              
## 55    CEO Leadership behavior                   M                                                     2   1.000    297.000  0.341           0.445           0.314    0.577    0.445    0.445  0.361              
## 56    CEO Leadership behavior                   Minority CEO                                          1   1.000   2101.000 -0.020          -0.022          -0.068    0.025   -0.022   -0.022 -0.212              
## 57    CEO Leadership behavior                   Operational performance                               1   2.000    258.000  0.192  0.251    0.224  0.302   -0.218    0.666   -0.163    0.612 -0.039  -0.182 0.856
## 58    CEO Leadership behavior                   Operational performance                               2   8.000   1774.000  0.231  0.115    0.258  0.105    0.171    0.345    0.123    0.393  0.152              
## 59    CEO Leadership behavior                   Region                                                1   1.000     69.000  0.079           0.079          -0.158    0.315    0.079    0.079  0.079              
## 60    CEO Leadership behavior                   Region                                                2   1.000    242.000 -0.000          -0.000          -0.131    0.131   -0.000   -0.000 -0.183              
## 61    CEO Leadership behavior                   Shareholder power                                     1   2.000    968.000  0.183  0.192    0.197  0.197   -0.083    0.478   -0.055    0.450  0.175   1.190 0.234
## 62    CEO Leadership behavior                   State/public-owned                                    2   3.000    576.000  0.008  0.000    0.008  0.000   -0.026    0.043    0.008    0.008 -0.082  -1.290 0.197
## 63    CEO Leadership behavior                   Subjective performance                                1   3.000   1008.000  0.090  0.101    0.098  0.103   -0.036    0.231   -0.035    0.230 -0.162  -1.740 0.082
## 64    CEO Leadership behavior                   Subjective performance                                2   3.000    944.000  0.251  0.107    0.274  0.124    0.119    0.430    0.115    0.434  0.012   0.157 0.875
## 65    CEO Leadership behavior                   X                                                     1  14.000   7701.000  0.239  0.133    0.276  0.183    0.176    0.375    0.041    0.510  0.104   1.513 0.130
## 66    CEO Leadership behavior                   X                                                     2   9.000   2348.000  0.134  0.158    0.142  0.175    0.019    0.264   -0.083    0.366  0.184   3.248 0.001
## 67    CEO age                                   Board power                                           1  67.000  81945.000 -0.049  0.087   -0.049  0.087   -0.071   -0.027   -0.160    0.062 -0.063  -3.726 0.000
## 68    CEO age                                   Board power                                           2  15.000  40291.000  0.014  0.051    0.014  0.051   -0.014    0.042   -0.052    0.080 -0.022  -0.785 0.433
## 69    CEO age                                   Board, TMT & Employee career success                  1   8.000  18051.000  0.037  0.071    0.037  0.071   -0.015    0.088   -0.055    0.128  0.081   3.226 0.001
## 70    CEO age                                   Board, TMT & Employee career success                  2   2.000   3363.000 -0.045  0.000   -0.045  0.000   -0.046   -0.044   -0.045   -0.045 -0.091  -9.777 0.000
## 71    CEO age                                   Board, TMT & Employee human capital                   1  66.000  90485.000  0.046  0.076    0.046  0.076    0.027    0.066   -0.051    0.143 -0.003  -0.193 0.847
## 72    CEO age                                   Board, TMT & Employee human capital                   2  21.000  30172.000  0.049  0.047    0.049  0.047    0.026    0.072   -0.012    0.110  0.089              
## 73    CEO age                                   CEO Ethnicity                                         1   1.000    339.000 -0.040          -0.040          -0.146    0.066   -0.040   -0.040 -0.054              
## 74    CEO age                                   CEO Leadership behavior                               1   4.000    725.000  0.014  0.000    0.013  0.000   -0.043    0.069    0.013    0.013  0.027     Inf 0.000
## 75    CEO age                                   CEO Leadership behavior                               2  11.000   1949.000 -0.013  0.000   -0.012  0.000   -0.042    0.017   -0.012   -0.012 -0.134  -1.990 0.047
## 76    CEO age                                   CEO age                                               1  10.000  17220.000  0.121  0.212    0.121  0.212   -0.012    0.253   -0.152    0.393 -0.334  -1.277 0.201
## 77    CEO age                                   CEO age                                               2   3.000   8278.000  0.455  0.438    0.455  0.438   -0.041    0.951   -0.106    1.016  0.309   1.220 0.223
## 78    CEO age                                   CEO duality                                           1  77.000 120533.000  0.146  0.134    0.146  0.134    0.116    0.176   -0.025    0.317  0.059   2.271 0.023
## 79    CEO age                                   CEO duality                                           2  20.000  54701.000  0.087  0.094    0.087  0.094    0.045    0.129   -0.034    0.208  0.111   4.555 0.000
## 80    CEO age                                   CEO education level                                   1  30.000  27224.000 -0.024  0.067   -0.024  0.067   -0.050    0.003   -0.109    0.062  0.005   0.226 0.822
## 81    CEO age                                   CEO education level                                   2  28.000  26199.000 -0.029  0.106   -0.029  0.106   -0.070    0.012   -0.164    0.106 -0.013  -0.664 0.507
## 82    CEO age                                   CEO elite education                                   1   3.000   1434.000 -0.016  0.000   -0.016  0.000   -0.050    0.018   -0.016   -0.016  0.031     Inf 0.000
## 83    CEO age                                   CEO elite education                                   2   2.000   7746.000 -0.047  0.000   -0.047  0.000   -0.059   -0.034   -0.047   -0.047 -0.134  -7.023 0.000
## 84    CEO age                                   CEO family characteristic                             1   3.000  11161.000  0.087  0.033    0.087  0.033    0.046    0.129    0.045    0.130  0.066              
## 85    CEO age                                   CEO family characteristic                             2   1.000     67.000  0.021           0.021          -0.220    0.263    0.021    0.021  0.027              
## 86    CEO age                                   CEO gender                                            1  33.000  63233.000 -0.006  0.053   -0.006  0.053   -0.025    0.014   -0.073    0.062 -0.015  -0.972 0.331
## 87    CEO age                                   CEO gender                                            2  16.000  21868.000  0.009  0.048    0.009  0.048   -0.018    0.036   -0.053    0.071  0.005   0.270 0.787
## 88    CEO age                                   CEO long-term incentive pay                           1  44.000 104060.000  0.005  0.080    0.005  0.080   -0.020    0.029   -0.098    0.107 -0.104              
## 89    CEO age                                   CEO long-term incentive pay                           2   1.000     60.000  0.108           0.108          -0.144    0.361    0.108    0.108  0.112              
## 90    CEO age                                   CEO managerial ability                                1   6.000   5883.000 -0.003  0.121   -0.003  0.121   -0.103    0.097   -0.158    0.152  0.067              
## 91    CEO age                                   CEO nationality                                       1   1.000     81.000 -0.070          -0.070          -0.288    0.148   -0.070   -0.070 -0.084              
## 92    CEO age                                   CEO nationality                                       2   1.000    309.000  0.013           0.013          -0.098    0.125    0.013    0.013 -0.063              
## 93    CEO age                                   CEO power                                             1  76.000 131542.000  0.076  0.091    0.076  0.091    0.055    0.097   -0.040    0.193  0.085   4.669 0.000
## 94    CEO age                                   CEO power                                             2  17.000  38086.000 -0.009  0.062   -0.009  0.062   -0.040    0.022   -0.088    0.070 -0.026  -1.377 0.169
## 95    CEO age                                   CEO prior career experience and expertise             1  65.000  83425.000  0.017  0.095    0.017  0.095   -0.007    0.041   -0.104    0.138 -0.015  -0.820 0.412
## 96    CEO age                                   CEO prior career experience and expertise             2  13.000  29749.000  0.033  0.053    0.033  0.053    0.002    0.063   -0.035    0.100  0.050   3.052 0.002
## 97    CEO age                                   CEO self-concept                                      1  34.000  21828.000 -0.018  0.045   -0.018  0.045   -0.038    0.002   -0.075    0.040 -0.060  -6.085 0.000
## 98    CEO age                                   CEO self-concept                                      2  13.000  14646.000  0.042  0.023    0.043  0.023    0.022    0.063    0.014    0.072 -0.035  -2.079 0.038
## 99    CEO age                                   CEO social capital                                    1  13.000  17845.000  0.077  0.056    0.077  0.056    0.044    0.111    0.006    0.148  0.000   0.011 0.991
## 100   CEO age                                   CEO social capital                                    2   7.000  22789.000  0.077  0.022    0.077  0.022    0.056    0.098    0.048    0.105  0.087   1.576 0.115
## 101   CEO age                                   CEO succession                                        1   8.000  12833.000 -0.010  0.154   -0.010  0.154   -0.118    0.098   -0.208    0.188  0.152              
## 102   CEO age                                   CEO succession                                        2   1.000   3360.000 -0.162          -0.162          -0.195   -0.129   -0.162   -0.162 -0.427              
## 103   CEO age                                   CEO tenure                                            1 100.000 138332.000  0.265  0.182    0.265  0.182    0.229    0.301    0.031    0.498  0.109   4.699 0.000
## 104   CEO age                                   CEO tenure                                            2  31.000  38469.000  0.156  0.080    0.156  0.080    0.126    0.185    0.053    0.258  0.112   6.183 0.000
## 105   CEO age                                   CEO total pay                                         1  46.000  77124.000  0.043  0.076    0.043  0.076    0.020    0.066   -0.054    0.140 -0.009  -0.440 0.660
## 106   CEO age                                   CEO total pay                                         2   8.000  17128.000  0.053  0.051    0.053  0.051    0.015    0.091   -0.012    0.117  0.037   1.854 0.064
## 107   CEO age                                   Certification awards and Social reputation            1  12.000  14939.000  0.015  0.033    0.015  0.033   -0.009    0.040   -0.026    0.057 -0.099  -4.741 0.000
## 108   CEO age                                   Compensation committee monitoring                     1   8.000   7135.000  0.115  0.053    0.115  0.053    0.071    0.158    0.047    0.183  0.024   0.698 0.485
## 109   CEO age                                   Compensation committee monitoring                     2   2.000   7415.000  0.091  0.040    0.091  0.040    0.031    0.151    0.039    0.142  0.018              
## 110   CEO age                                   Consultant influence                                  1   1.000    232.000  0.072           0.072          -0.056    0.201    0.072    0.072 -0.069              
## 111   CEO age                                   Country governance quality                            1   1.000     95.000  0.142           0.142          -0.056    0.340    0.142    0.142  0.232              
## 112   CEO age                                   Country governance quality                            2   1.000    445.000 -0.090          -0.090          -0.182    0.002   -0.090   -0.090  0.087              
## 113   CEO age                                   Country's socio-economic level                        1   2.000   2633.000 -0.177  0.106   -0.177  0.106   -0.329   -0.025   -0.313   -0.041 -0.097              
## 114   CEO age                                   Country's socio-economic level                        2   1.000    445.000 -0.080          -0.080          -0.173    0.012   -0.080   -0.080 -0.351              
## 115   CEO age                                   Demographic similarity (CEO VS TMT)                   1   2.000    440.000  0.271  0.195    0.271  0.195   -0.012    0.555    0.022    0.521  0.251   1.819 0.069
## 116   CEO age                                   Demographic similarity (CEO VS TMT)                   2   2.000   7692.000  0.021  0.000    0.021  0.000    0.003    0.039    0.021    0.021 -0.049              
## 117   CEO age                                   Employee and manager performance                      2   1.000    262.000  0.070           0.076          -0.055    0.206    0.076    0.076  0.116              
## 118   CEO age                                   Environment turbulence                                1  36.000  43762.000 -0.046  0.080   -0.046  0.080   -0.074   -0.018   -0.148    0.056 -0.044  -3.292 0.001
## 119   CEO age                                   Environment turbulence                                2  13.000  17816.000 -0.002  0.000   -0.002  0.000   -0.012    0.008   -0.002   -0.002  0.017   0.543 0.587
## 120   CEO age                                   External supervision                                  1  11.000   5007.000 -0.019  0.106   -0.019  0.106   -0.088    0.049   -0.155    0.116 -0.091              
## 121   CEO age                                   External supervision                                  2   1.000   8006.000  0.072           0.072           0.050    0.094    0.072    0.072  0.066              
## 122   CEO age                                   Financial performance                                 1  99.000 159698.417  0.006  0.046    0.006  0.046   -0.005    0.016   -0.054    0.065 -0.007  -0.906 0.365
## 123   CEO age                                   Financial performance                                 2  27.000  46688.000  0.013  0.032    0.013  0.032   -0.002    0.028   -0.029    0.054  0.007   0.739 0.460
## 124   CEO age                                   Firm risk taking                                      1 123.000 174071.700  0.006  0.071    0.006  0.071   -0.007    0.020   -0.084    0.097  0.001   0.183 0.854
## 125   CEO age                                   Firm risk taking                                      2  34.000  59742.000  0.005  0.024    0.005  0.024   -0.007    0.016   -0.026    0.036 -0.083  -9.964 0.000
## 126   CEO age                                   Firms Characteristics (Firm prestige)                 1 138.000 180064.000  0.088  0.085    0.088  0.085    0.073    0.103   -0.021    0.197 -0.001  -0.057 0.954
## 127   CEO age                                   Firms Characteristics (Firm prestige)                 2  48.000  64961.000  0.088  0.050    0.089  0.050    0.072    0.105    0.025    0.152  0.121  11.038 0.000
## 128   CEO age                                   General performance                                   1  25.000  27087.000 -0.032  0.041   -0.032  0.041   -0.052   -0.012   -0.085    0.021 -0.050  -2.443 0.015
## 129   CEO age                                   General performance                                   2  11.000  14917.000  0.017  0.060    0.018  0.060   -0.022    0.057   -0.060    0.095  0.050   2.244 0.025
## 130   CEO age                                   Industry Performance                                  1  25.000  40728.000 -0.032  0.061   -0.032  0.061   -0.058   -0.007   -0.111    0.046 -0.024  -1.066 0.286
## 131   CEO age                                   Insider power                                         1   9.000  10959.000 -0.008  0.057   -0.008  0.057   -0.050    0.033   -0.081    0.064 -0.159  -5.368 0.000
## 132   CEO age                                   Insider power                                         2   2.000   3500.000  0.151  0.032    0.151  0.032    0.096    0.206    0.109    0.192  0.163   6.904 0.000
## 133   CEO age                                   Institution                                           1   8.000  19215.000 -0.012  0.016   -0.012  0.016   -0.029    0.006   -0.032    0.009 -0.003  -0.571 0.568
## 134   CEO age                                   Institution                                           2   3.000   8634.000 -0.008  0.004   -0.008  0.004   -0.030    0.013   -0.013   -0.004  0.034   2.131 0.033
## 135   CEO age                                   Institutional investor power                          1  24.000  63336.000 -0.043  0.079   -0.043  0.079   -0.075   -0.010   -0.143    0.058 -0.143  -4.485 0.000
## 136   CEO age                                   Institutional investor power                          2   4.000  10757.000  0.100  0.055    0.100  0.055    0.043    0.157    0.030    0.170  0.044   1.040 0.298
## 137   CEO age                                   Labor market                                          1   2.000   1256.000  0.056  0.046    0.056  0.046   -0.029    0.140   -0.004    0.115 -0.020              
## 138   CEO age                                   Labor market                                          2   1.000     67.000  0.076           0.076          -0.164    0.315    0.076    0.076  0.086              
## 139   CEO age                                   Large owners power                                    1  13.000   9299.000 -0.010  0.042   -0.010  0.042   -0.041    0.020   -0.065    0.044 -0.030  -2.545 0.011
## 140   CEO age                                   Large owners power                                    2   5.000  12881.000  0.019  0.000    0.019  0.000    0.004    0.035    0.019    0.019 -0.034  -1.150 0.250
## 141   CEO age                                   M                                                     1   3.000   4908.000  0.053  0.051    0.053  0.051   -0.011    0.117   -0.012    0.118 -0.024  -0.666 0.505
## 142   CEO age                                   M                                                     2   5.000  10924.000  0.077  0.047    0.077  0.047    0.032    0.123    0.017    0.138  0.007              
## 143   CEO age                                   Minority CEO                                          1   1.000   1350.000  0.070           0.070           0.017    0.123    0.070    0.070  0.081              
## 144   CEO age                                   Nominating committee power                            1   1.000    304.000 -0.011          -0.011          -0.124    0.102   -0.011   -0.011  0.044              
## 145   CEO age                                   Operational performance                               1  30.000  61582.000 -0.055  0.068   -0.055  0.068   -0.081   -0.030   -0.142    0.031 -0.076  -5.669 0.000
## 146   CEO age                                   Operational performance                               2  18.000  18426.000  0.021  0.022    0.021  0.022    0.003    0.039   -0.007    0.049 -0.001  -0.050 0.960
## 147   CEO age                                   Ownership concentration                               1   5.000   1296.000  0.022  0.041    0.022  0.041   -0.044    0.087   -0.031    0.074  0.023   1.241 0.214
## 148   CEO age                                   Ownership concentration                               2   4.000   9248.000 -0.001  0.000   -0.001  0.000   -0.016    0.014   -0.001   -0.001  0.001     Inf 0.000
## 149   CEO age                                   Region                                                1   4.000   3924.000 -0.002  0.000   -0.002  0.000   -0.022    0.018   -0.002   -0.002 -0.036  -3.684 0.000
## 150   CEO age                                   Shareholder power                                     1   5.000   5661.000  0.034  0.022    0.034  0.022    0.002    0.066    0.006    0.062 -0.010  -0.701 0.483
## 151   CEO age                                   State/public-owned                                    2  15.000  41703.000  0.044  0.042    0.044  0.042    0.021    0.068   -0.010    0.099 -0.032  -0.760 0.447
## 152   CEO age                                   Subjective performance                                1   4.000   1791.000  0.076  0.081    0.076  0.081   -0.016    0.167   -0.027    0.179  0.121              
## 153   CEO age                                   Subjective performance                                2   1.000    129.000 -0.045          -0.045          -0.218    0.128   -0.045   -0.045 -0.160              
## 154   CEO age                                   Tax Performance                                       1   2.000    111.000  0.115  0.000    0.115  0.000    0.038    0.193    0.115    0.115  0.121              
## 155   CEO age                                   Voting rights                                         1   1.000    267.000 -0.006          -0.006          -0.126    0.114   -0.006   -0.006 -0.008              
## 156   CEO age                                   X                                                     1  41.000  40645.000  0.002  0.075    0.002  0.076   -0.024    0.027   -0.095    0.098 -0.037  -3.150 0.002
## 157   CEO age                                   X                                                     2  14.000  16304.000  0.039  0.000    0.039  0.000    0.025    0.053    0.039    0.039  0.012   0.958 0.338
## 158   CEO duality                               Board power                                           1  89.000 127867.000  0.027  0.119    0.027  0.119    0.001    0.052   -0.125    0.179 -0.009  -0.502 0.616
## 159   CEO duality                               Board power                                           2  44.000 114106.000  0.036  0.094    0.036  0.094    0.008    0.065   -0.084    0.156  0.028   1.892 0.059
## 160   CEO duality                               Board, TMT & Employee career success                  1  13.000  17378.000  0.008  0.017    0.008  0.017   -0.009    0.026   -0.014    0.030  0.048   3.800 0.000
## 161   CEO duality                               Board, TMT & Employee career success                  2   3.000   9242.000 -0.040  0.020   -0.040  0.020   -0.071   -0.009   -0.066   -0.014 -0.093  -5.223 0.000
## 162   CEO duality                               Board, TMT & Employee human capital                   1  75.000 139373.000  0.053  0.115    0.053  0.115    0.026    0.079   -0.095    0.200  0.102   5.832 0.000
## 163   CEO duality                               Board, TMT & Employee human capital                   2  32.000  77062.000 -0.049  0.064   -0.049  0.064   -0.073   -0.026   -0.132    0.033  0.021              
## 164   CEO duality                               CEO Leadership behavior                               1   1.000    367.000 -0.070          -0.070          -0.172    0.032   -0.070   -0.070  0.358              
## 165   CEO duality                               CEO duality                                           1   4.000   3475.000 -0.428  0.304   -0.428  0.304   -0.727   -0.129   -0.817   -0.039 -0.452  -2.955 0.003
## 166   CEO duality                               CEO education level                                   1  11.000   5122.000  0.024  0.061    0.024  0.061   -0.022    0.069   -0.055    0.103 -0.001  -0.018 0.985
## 167   CEO duality                               CEO education level                                   2  13.000  42137.000  0.024  0.080    0.024  0.080   -0.020    0.069   -0.078    0.127  0.073   2.233 0.026
## 168   CEO duality                               CEO elite education                                   1   5.000   1835.000 -0.049  0.054   -0.049  0.054   -0.115    0.017   -0.118    0.021 -0.063  -2.621 0.009
## 169   CEO duality                               CEO elite education                                   2   2.000   7746.000  0.015  0.000    0.015  0.000    0.011    0.018    0.015    0.015 -0.002  -0.133 0.894
## 170   CEO duality                               CEO gender                                            1  16.000  49315.000  0.017  0.062    0.017  0.062   -0.015    0.048   -0.063    0.097 -0.023  -0.947 0.344
## 171   CEO duality                               CEO gender                                            2  11.000  41468.000  0.040  0.064    0.040  0.064    0.001    0.079   -0.042    0.122 -0.024  -1.008 0.313
## 172   CEO duality                               CEO long-term incentive pay                           1  63.000 149637.000  0.064  0.110    0.064  0.110    0.037    0.092   -0.076    0.205  0.051   1.112 0.266
## 173   CEO duality                               CEO long-term incentive pay                           2   3.000  10874.000  0.013  0.076    0.013  0.076   -0.076    0.101   -0.085    0.111  0.059   1.077 0.281
## 174   CEO duality                               CEO managerial ability                                1   7.000   6205.000 -0.046  0.084   -0.046  0.084   -0.113    0.021   -0.154    0.062 -0.046              
## 175   CEO duality                               CEO managerial ability                                2   1.000   5758.000  0.000           0.000          -0.026    0.026    0.000    0.000 -0.111              
## 176   CEO duality                               CEO nationality                                       1   1.000     81.000  0.111           0.111          -0.106    0.327    0.111    0.111  0.038              
## 177   CEO duality                               CEO power                                             1  97.000 167868.000  0.073  0.096    0.073  0.096    0.053    0.093   -0.049    0.196 -0.077  -2.401 0.016
## 178   CEO duality                               CEO power                                             2  34.000  90556.000  0.150  0.177    0.150  0.177    0.090    0.210   -0.078    0.377  0.196   5.856 0.000
## 179   CEO duality                               CEO prior career experience and expertise             1  55.000  92541.000 -0.047  0.105   -0.047  0.105   -0.075   -0.018   -0.181    0.087 -0.081  -4.644 0.000
## 180   CEO duality                               CEO prior career experience and expertise             2  14.000  38458.000  0.035  0.039    0.035  0.039    0.012    0.057   -0.015    0.085 -0.018  -1.212 0.226
## 181   CEO duality                               CEO self-concept                                      1  26.000  43851.000  0.053  0.053    0.053  0.053    0.030    0.075   -0.016    0.121 -0.008  -0.320 0.749
## 182   CEO duality                               CEO self-concept                                      2   5.000  14286.000  0.060  0.048    0.060  0.048    0.015    0.105   -0.001    0.122 -0.178  -2.943 0.003
## 183   CEO duality                               CEO social capital                                    1  10.000  12512.000  0.238  0.179    0.238  0.179    0.126    0.351    0.009    0.468  0.105   1.256 0.209
## 184   CEO duality                               CEO social capital                                    2  12.000  49101.000  0.134  0.212    0.134  0.212    0.014    0.254   -0.138    0.405  0.145   2.027 0.043
## 185   CEO duality                               CEO succession                                        1   4.000   4439.000 -0.011  0.074   -0.011  0.074   -0.089    0.067   -0.106    0.084  0.014              
## 186   CEO duality                               CEO succession                                        2   1.000    164.000 -0.025          -0.025          -0.178    0.128   -0.025   -0.025 -0.174              
## 187   CEO duality                               CEO tenure                                            1  98.000 167274.000  0.149  0.138    0.149  0.138    0.121    0.176   -0.028    0.325  0.046   2.360 0.018
## 188   CEO duality                               CEO tenure                                            2  30.000  90508.000  0.103  0.075    0.103  0.075    0.075    0.130    0.007    0.198  0.034   1.938 0.053
## 189   CEO duality                               CEO total pay                                         1  63.000 134695.000  0.068  0.089    0.068  0.089    0.046    0.091   -0.046    0.182  0.039   3.025 0.002
## 190   CEO duality                               CEO total pay                                         2  19.000  63552.000  0.029  0.029    0.029  0.029    0.014    0.044   -0.008    0.066 -0.015  -1.233 0.218
## 191   CEO duality                               Certification awards and Social reputation            1  12.000  10100.000  0.044  0.035    0.044  0.035    0.016    0.072   -0.001    0.089 -0.042              
## 192   CEO duality                               Certification awards and Social reputation            2   1.000    164.000  0.086           0.086          -0.066    0.239    0.086    0.086  0.270              
## 193   CEO duality                               Chairman power                                        2   1.000    385.000 -0.183          -0.183          -0.280   -0.087   -0.183   -0.183 -0.182              
## 194   CEO duality                               Compensation committee monitoring                     1  16.000  23265.000 -0.001  0.081   -0.001  0.081   -0.043    0.041   -0.104    0.102  0.053   1.844 0.065
## 195   CEO duality                               Compensation committee monitoring                     2   9.000  54440.000 -0.054  0.061   -0.054  0.061   -0.095   -0.013   -0.133    0.025 -0.009              
## 196   CEO duality                               Consultant influence                                  1   1.000    232.000 -0.045          -0.045          -0.174    0.083   -0.045   -0.045 -0.042              
## 197   CEO duality                               Country governance quality                            2   2.000    782.000 -0.003  0.000   -0.003  0.000   -0.072    0.066   -0.003   -0.003  0.094   5.977 0.000
## 198   CEO duality                               Country's socio-economic level                        1   2.000    927.000 -0.097  0.022   -0.097  0.022   -0.168   -0.026   -0.126   -0.069 -0.211 -11.148 0.000
## 199   CEO duality                               Country's socio-economic level                        2   4.000   9062.000  0.114  0.021    0.114  0.021    0.085    0.142    0.087    0.140  0.083   3.146 0.002
## 200   CEO duality                               Demographic similarity (CEO VS TMT)                   1   3.000   5000.000  0.031  0.042    0.031  0.042   -0.024    0.086   -0.023    0.084  0.080              
## 201   CEO duality                               Demographic similarity (CEO VS TMT)                   2   1.000   7563.000 -0.049          -0.049          -0.071   -0.027   -0.049   -0.049 -0.035              
## 202   CEO duality                               Environment turbulence                                1  26.000  58692.000 -0.014  0.035   -0.014  0.035   -0.030    0.002   -0.059    0.031 -0.020  -2.843 0.004
## 203   CEO duality                               Environment turbulence                                2  12.000  17801.000  0.006  0.000    0.006  0.000   -0.006    0.018    0.006    0.006  0.017   1.179 0.239
## 204   CEO duality                               External supervision                                  1  21.000  29517.000 -0.011  0.065   -0.011  0.065   -0.041    0.019   -0.094    0.072 -0.029  -1.533 0.125
## 205   CEO duality                               External supervision                                  2   4.000  23189.000  0.018  0.025    0.018  0.025   -0.010    0.045   -0.014    0.049  0.013   1.016 0.310
## 206   CEO duality                               Financial performance                                 1 117.000 192938.000  0.005  0.035    0.005  0.035   -0.003    0.013   -0.039    0.049 -0.009  -0.982 0.326
## 207   CEO duality                               Financial performance                                 2  48.000 124283.000  0.014  0.060    0.014  0.060   -0.004    0.032   -0.063    0.091  0.007   0.680 0.497
## 208   CEO duality                               Firm risk taking                                      1 135.000 216317.000  0.007  0.047    0.007  0.047   -0.002    0.017   -0.053    0.068  0.022   3.097 0.002
## 209   CEO duality                               Firm risk taking                                      2  47.000 135272.000 -0.015  0.040   -0.015  0.040   -0.027   -0.002   -0.066    0.037 -0.119  -9.233 0.000
## 210   CEO duality                               Firms Characteristics (Firm prestige)                 1 132.000 227894.000  0.104  0.132    0.104  0.132    0.081    0.127   -0.065    0.273  0.176  11.656 0.000
## 211   CEO duality                               Firms Characteristics (Firm prestige)                 2  57.000 132041.000 -0.072  0.075   -0.072  0.075   -0.092   -0.052   -0.168    0.023 -0.104  -7.549 0.000
## 212   CEO duality                               General performance                                   1  21.000  26161.000  0.032  0.044    0.032  0.044    0.009    0.054   -0.025    0.088  0.054   3.346 0.001
## 213   CEO duality                               General performance                                   2   8.000  20761.000 -0.022  0.036   -0.022  0.036   -0.051    0.007   -0.069    0.025 -0.025  -1.810 0.070
## 214   CEO duality                               Industry Performance                                  1  24.000  61583.000  0.002  0.021    0.002  0.021   -0.009    0.014   -0.024    0.029 -0.004  -0.924 0.355
## 215   CEO duality                               Industry Performance                                  2   2.000   7740.000  0.006  0.000    0.006  0.000   -0.004    0.017    0.006    0.006  0.014   0.695 0.487
## 216   CEO duality                               Insider power                                         1  20.000  16479.000 -0.007  0.088   -0.007  0.088   -0.049    0.034   -0.120    0.106 -0.324  -7.401 0.000
## 217   CEO duality                               Insider power                                         2   6.000   4889.000  0.316  0.096    0.316  0.096    0.236    0.397    0.194    0.439  0.297   7.169 0.000
## 218   CEO duality                               Institution                                           1  11.000   8702.000  0.019  0.046    0.019  0.046   -0.015    0.054   -0.040    0.078  0.057   4.082 0.000
## 219   CEO duality                               Institution                                           2   4.000   9165.000 -0.038  0.000   -0.038  0.000   -0.055   -0.021   -0.038   -0.038 -0.090  -3.945 0.000
## 220   CEO duality                               Institutional investor power                          1  37.000  74251.000  0.052  0.138    0.052  0.138    0.007    0.097   -0.125    0.229  0.045   1.713 0.087
## 221   CEO duality                               Institutional investor power                          2   7.000  24581.000  0.007  0.035    0.007  0.035   -0.022    0.036   -0.039    0.052 -0.044              
## 222   CEO duality                               Labor market                                          1   1.000    870.000  0.050           0.050          -0.016    0.116    0.050    0.050  0.048              
## 223   CEO duality                               Large owners power                                    1  25.000  25854.000  0.002  0.059    0.002  0.059   -0.025    0.028   -0.075    0.078  0.068   3.182 0.001
## 224   CEO duality                               Large owners power                                    2  14.000  38302.000 -0.066  0.063   -0.066  0.063   -0.101   -0.031   -0.147    0.015 -0.067  -2.208 0.027
## 225   CEO duality                               M                                                     1   7.000   6292.000  0.001  0.067    0.001  0.067   -0.054    0.056   -0.085    0.087  0.075   1.480 0.139
## 226   CEO duality                               M                                                     2  11.000  14961.000 -0.074  0.146   -0.074  0.146   -0.162    0.014   -0.261    0.113 -0.064  -1.460 0.144
## 227   CEO duality                               Nominating committee power                            1   2.000    838.000 -0.010  0.000   -0.010  0.000   -0.068    0.049   -0.010   -0.010  0.010   0.823 0.410
## 228   CEO duality                               Operational performance                               1  29.000  93075.000 -0.020  0.065   -0.020  0.065   -0.044    0.005   -0.103    0.064 -0.042  -3.438 0.001
## 229   CEO duality                               Operational performance                               2   8.000  14561.000  0.022  0.000    0.022  0.000    0.012    0.032    0.022    0.022  0.015   0.632 0.527
## 230   CEO duality                               Ownership concentration                               1   5.000   3307.000  0.006  0.054    0.006  0.054   -0.052    0.065   -0.063    0.076  0.066   2.499 0.012
## 231   CEO duality                               Ownership concentration                               2  11.000  43074.000 -0.059  0.033   -0.059  0.033   -0.081   -0.038   -0.102   -0.017 -0.068  -6.797 0.000
## 232   CEO duality                               Region                                                1   2.000   1515.000  0.009  0.000    0.009  0.000   -0.014    0.031    0.009    0.009  0.039   3.531 0.000
## 233   CEO duality                               Region                                                2   2.000   3570.000 -0.030  0.015   -0.030  0.015   -0.069    0.009   -0.050   -0.010 -0.101  -5.318 0.000
## 234   CEO duality                               Shareholder power                                     1   7.000  18506.000  0.071  0.041    0.071  0.041    0.037    0.104    0.018    0.123  0.096   2.628 0.009
## 235   CEO duality                               State/public-owned                                    2  25.000 105536.000 -0.026  0.166   -0.026  0.166   -0.091    0.040   -0.238    0.187 -0.102  -2.668 0.008
## 236   CEO duality                               Subjective performance                                1   3.000    654.000  0.076  0.032    0.078  0.029   -0.005    0.162    0.041    0.115  0.086   4.544 0.000
## 237   CEO duality                               Subjective performance                                2   2.000   3295.000 -0.010  0.000   -0.010  0.000   -0.013   -0.007   -0.010   -0.010 -0.075    -Inf 0.000
## 238   CEO duality                               Tax Performance                                       1   5.000   2691.000  0.065  0.000    0.065  0.000    0.034    0.097    0.065    0.065  0.115              
## 239   CEO duality                               Tax Performance                                       2   1.000    295.000 -0.050          -0.050          -0.164    0.064   -0.050   -0.050  0.160              
## 240   CEO duality                               Voting rights                                         2   1.000    564.000 -0.210          -0.210          -0.289   -0.131   -0.210   -0.210 -0.208              
## 241   CEO duality                               X                                                     1  32.000  40664.000 -0.002  0.047   -0.002  0.047   -0.021    0.017   -0.062    0.058  0.106   3.994 0.000
## 242   CEO duality                               X                                                     2  13.000  43632.000 -0.108  0.091   -0.108  0.091   -0.158   -0.058   -0.224    0.008 -0.111  -3.618 0.000
## 243   CEO education level                       Board power                                           1  12.000   6525.000  0.003  0.061    0.003  0.061   -0.039    0.045   -0.075    0.081 -0.032  -0.785 0.432
## 244   CEO education level                       Board power                                           2   9.000  30669.000  0.035  0.108    0.035  0.108   -0.037    0.106   -0.104    0.173  0.009   0.254 0.799
## 245   CEO education level                       Board, TMT & Employee career success                  1   4.000  14712.000  0.026  0.000    0.026  0.000    0.012    0.039    0.026    0.026  0.036              
## 246   CEO education level                       Board, TMT & Employee career success                  2   1.000     43.000 -0.010          -0.010          -0.313    0.292   -0.010   -0.010 -0.112              
## 247   CEO education level                       Board, TMT & Employee human capital                   1  22.000  22175.000  0.102  0.148    0.102  0.148    0.039    0.165   -0.088    0.291  0.112   3.477 0.001
## 248   CEO education level                       Board, TMT & Employee human capital                   2  18.000  22875.000 -0.010  0.026   -0.010  0.026   -0.028    0.007   -0.044    0.023  0.010              
## 249   CEO education level                       CEO Ethnicity                                         1   1.000    339.000 -0.020          -0.020          -0.127    0.087   -0.020   -0.020  0.121              
## 250   CEO education level                       CEO Leadership behavior                               1   1.000    105.000 -0.141          -0.141          -0.329    0.048   -0.141   -0.141 -0.205              
## 251   CEO education level                       CEO Leadership behavior                               2  15.000   3610.000  0.064  0.105    0.067  0.111    0.001    0.133   -0.075    0.209  0.110   1.617 0.106
## 252   CEO education level                       CEO education level                                   1  16.000  22772.000 -0.045  0.247   -0.045  0.247   -0.167    0.076   -0.362    0.271  0.259   1.999 0.046
## 253   CEO education level                       CEO education level                                   2   3.000    484.000 -0.304  0.197   -0.304  0.197   -0.542   -0.067   -0.557   -0.052 -0.361  -3.117 0.002
## 254   CEO education level                       CEO elite education                                   1   5.000   2812.000  0.057  0.047    0.057  0.047    0.001    0.112   -0.004    0.117 -0.060  -2.845 0.004
## 255   CEO education level                       CEO elite education                                   2   2.000   7746.000  0.117  0.000    0.117  0.000    0.101    0.133    0.117    0.117  0.107   3.483 0.000
## 256   CEO education level                       CEO family characteristic                             1   3.000  11286.000  0.010  0.053    0.010  0.053   -0.053    0.073   -0.059    0.078  0.028   0.896 0.370
## 257   CEO education level                       CEO gender                                            1  13.000  15068.000 -0.018  0.007   -0.018  0.007   -0.034   -0.001   -0.027   -0.009 -0.019  -2.516 0.012
## 258   CEO education level                       CEO gender                                            2  20.000  41436.000  0.001  0.032    0.001  0.032   -0.016    0.018   -0.040    0.041  0.001              
## 259   CEO education level                       CEO human capital                                     1   1.000    520.000  0.000           0.000          -0.086    0.086    0.000    0.000 -0.033              
## 260   CEO education level                       CEO long-term incentive pay                           1  12.000   8020.000  0.033  0.026    0.033  0.026    0.006    0.059   -0.000    0.066 -0.012  -0.534 0.593
## 261   CEO education level                       CEO long-term incentive pay                           2   2.000  13521.000  0.044  0.029    0.044  0.029    0.001    0.088    0.007    0.082 -0.254  -3.212 0.001
## 262   CEO education level                       CEO managerial ability                                1   2.000   4168.000  0.299  0.108    0.299  0.108    0.146    0.451    0.160    0.437  0.550              
## 263   CEO education level                       CEO managerial ability                                2   1.000    130.000 -0.251          -0.251          -0.413   -0.089   -0.251   -0.251 -0.221              
## 264   CEO education level                       CEO nationality                                       1   4.000    808.000 -0.030  0.000   -0.030  0.000   -0.062    0.001   -0.030   -0.030 -0.065              
## 265   CEO education level                       CEO nationality                                       2   1.000    309.000  0.035           0.035          -0.077    0.146    0.035    0.035  0.016              
## 266   CEO education level                       CEO power                                             1  20.000  10422.000  0.018  0.044    0.018  0.044   -0.009    0.045   -0.039    0.075 -0.017  -0.363 0.716
## 267   CEO education level                       CEO power                                             2  11.000  18245.000  0.035  0.152    0.035  0.152   -0.056    0.126   -0.160    0.230  0.009   0.185 0.853
## 268   CEO education level                       CEO prior career experience and expertise             1  39.000  31606.000  0.026  0.072    0.026  0.072    0.001    0.052   -0.066    0.119 -0.020  -0.988 0.323
## 269   CEO education level                       CEO prior career experience and expertise             2  15.000  31826.000  0.047  0.067    0.047  0.067    0.011    0.082   -0.039    0.132  0.043   1.616 0.106
## 270   CEO education level                       CEO self-concept                                      1  15.000   7068.000  0.004  0.079    0.004  0.079   -0.043    0.050   -0.098    0.106 -0.202  -3.203 0.001
## 271   CEO education level                       CEO self-concept                                      2  13.000   5518.000  0.206  0.205    0.216  0.206    0.101    0.331   -0.048    0.480  0.127   2.026 0.043
## 272   CEO education level                       CEO social capital                                    1  11.000   6478.000  0.079  0.063    0.079  0.063    0.034    0.123   -0.002    0.160  0.053   2.383 0.017
## 273   CEO education level                       CEO social capital                                    2   6.000  24464.000  0.025  0.029    0.025  0.029   -0.001    0.052   -0.012    0.063  0.025              
## 274   CEO education level                       CEO succession                                        1   1.000   3648.000  0.000           0.000          -0.032    0.032    0.000    0.000  0.010              
## 275   CEO education level                       CEO succession                                        2   1.000    130.000 -0.010          -0.010          -0.183    0.163   -0.010   -0.010  0.021              
## 276   CEO education level                       CEO tenure                                            1  29.000  24397.000 -0.031  0.065   -0.031  0.065   -0.057   -0.004   -0.114    0.053  0.009   0.434 0.664
## 277   CEO education level                       CEO tenure                                            2  28.000  29227.000 -0.039  0.088   -0.039  0.088   -0.074   -0.005   -0.152    0.073 -0.156  -6.045 0.000
## 278   CEO education level                       CEO total pay                                         1  14.000  22163.000  0.116  0.074    0.116  0.074    0.075    0.157    0.022    0.211  0.042   1.799 0.072
## 279   CEO education level                       CEO total pay                                         2   5.000  22432.000  0.074  0.028    0.074  0.028    0.046    0.102    0.038    0.110  0.034              
## 280   CEO education level                       Certification awards and Social reputation            1   1.000   3648.000  0.040           0.040           0.008    0.072    0.040    0.040 -0.051              
## 281   CEO education level                       Certification awards and Social reputation            2   1.000    303.000  0.091           0.091          -0.021    0.203    0.091    0.091  0.051              
## 282   CEO education level                       Compensation committee monitoring                     1   1.000    650.000  0.040           0.040          -0.037    0.117    0.040    0.040 -0.025              
## 283   CEO education level                       Compensation committee monitoring                     2   4.000  21707.000  0.065  0.027    0.065  0.027    0.036    0.094    0.031    0.099  0.191  14.366 0.000
## 284   CEO education level                       Consultant influence                                  2   2.000    170.000 -0.126  0.000   -0.126  0.000   -0.198   -0.055   -0.126   -0.126 -0.206              
## 285   CEO education level                       Country governance quality                            2   1.000    445.000  0.080           0.080          -0.012    0.173    0.080    0.080 -0.058              
## 286   CEO education level                       Country's socio-economic level                        1   2.000    411.000  0.138  0.000    0.138  0.000    0.050    0.226    0.138    0.138  0.132   7.492 0.000
## 287   CEO education level                       Country's socio-economic level                        2   2.000   2832.000  0.006  0.025    0.006  0.025   -0.045    0.056   -0.026    0.038 -0.188  -2.048 0.041
## 288   CEO education level                       Demographic similarity (CEO VS TMT)                   1   3.000    989.000  0.194  0.156    0.194  0.156    0.007    0.381   -0.006    0.395  0.267              
## 289   CEO education level                       Demographic similarity (CEO VS TMT)                   2   1.000   7563.000 -0.073          -0.073          -0.095   -0.051   -0.073   -0.073 -0.094              
## 290   CEO education level                       Employee and manager performance                      2   3.000    704.000  0.021  0.000    0.023  0.000   -0.008    0.053    0.023    0.023  0.023     Inf 0.000
## 291   CEO education level                       Environment turbulence                                1  14.000   4221.000 -0.002  0.000   -0.002  0.000   -0.025    0.022   -0.002   -0.002  0.051  16.663 0.000
## 292   CEO education level                       Environment turbulence                                2  13.000   9683.000 -0.053  0.011   -0.053  0.011   -0.074   -0.032   -0.067   -0.040 -0.108              
## 293   CEO education level                       External supervision                                  1   1.000    704.000  0.055           0.055          -0.019    0.129    0.055    0.055  0.048              
## 294   CEO education level                       External supervision                                  2   6.000  25996.000  0.007  0.047    0.007  0.047   -0.033    0.047   -0.054    0.068 -0.019  -0.893 0.372
## 295   CEO education level                       Financial performance                                 1  28.000  24341.000  0.026  0.047    0.026  0.047    0.004    0.048   -0.035    0.087 -0.006  -0.615 0.538
## 296   CEO education level                       Financial performance                                 2  21.000  45510.000  0.032  0.015    0.032  0.015    0.021    0.043    0.012    0.051 -0.008  -0.893 0.372
## 297   CEO education level                       Firm risk taking                                      1  39.000  23355.000  0.040  0.052    0.040  0.052    0.019    0.060   -0.026    0.106  0.021   1.605 0.109
## 298   CEO education level                       Firm risk taking                                      2  25.000  47811.000  0.019  0.052    0.019  0.052   -0.004    0.041   -0.048    0.085 -0.029  -2.168 0.030
## 299   CEO education level                       Firms Characteristics (Firm prestige)                 1  52.000  35248.000  0.047  0.060    0.047  0.060    0.028    0.067   -0.030    0.124  0.015   1.010 0.313
## 300   CEO education level                       Firms Characteristics (Firm prestige)                 2  43.000  46694.000  0.033  0.078    0.033  0.078    0.008    0.058   -0.067    0.133  0.020   1.715 0.086
## 301   CEO education level                       General performance                                   1  16.000   7062.000  0.012  0.000    0.012  0.000   -0.007    0.031    0.012    0.012  0.001   0.112 0.911
## 302   CEO education level                       General performance                                   2   7.000   3674.000  0.011  0.031    0.010  0.032   -0.031    0.051   -0.031    0.051 -0.020  -1.231 0.218
## 303   CEO education level                       Industry Performance                                  1   7.000   5169.000  0.031  0.034    0.031  0.034   -0.006    0.069   -0.012    0.075  0.022   1.709 0.088
## 304   CEO education level                       Insider power                                         1   3.000   1248.000  0.010  0.000    0.010  0.000   -0.035    0.054    0.010    0.010 -0.061              
## 305   CEO education level                       Insider power                                         2   1.000    250.000  0.070           0.070          -0.053    0.194    0.070    0.070  0.202              
## 306   CEO education level                       Institution                                           1   2.000    936.000 -0.132  0.145   -0.132  0.145   -0.343    0.079   -0.318    0.054 -0.171  -1.627 0.104
## 307   CEO education level                       Institution                                           2   4.000   9165.000  0.039  0.040    0.039  0.040   -0.006    0.083   -0.013    0.090  0.053   2.654 0.008
## 308   CEO education level                       Institutional investor power                          1   4.000   4709.000 -0.015  0.000   -0.015  0.000   -0.033    0.004   -0.015   -0.015  0.176              
## 309   CEO education level                       Institutional investor power                          2   1.000    226.000 -0.190          -0.190          -0.316   -0.064   -0.190   -0.190 -0.045              
## 310   CEO education level                       Labor market                                          1   1.000    386.000 -0.145          -0.145          -0.243   -0.047   -0.145   -0.145 -0.145              
## 311   CEO education level                       Large owners power                                    2   3.000  13247.000 -0.000  0.000   -0.000  0.000   -0.015    0.015   -0.000   -0.000 -0.065  -9.392 0.000
## 312   CEO education level                       M                                                     1   2.000   3788.000  0.065  0.010    0.065  0.010    0.031    0.100    0.053    0.078 -0.078  -2.541 0.011
## 313   CEO education level                       M                                                     2   5.000   6080.000  0.143  0.066    0.145  0.064    0.083    0.206    0.063    0.227  0.132   4.266 0.000
## 314   CEO education level                       Operational performance                               1   9.000   1718.000  0.011  0.024    0.011  0.024   -0.039    0.061   -0.020    0.042 -0.070  -3.647 0.000
## 315   CEO education level                       Operational performance                               2  16.000  11653.000  0.081  0.069    0.082  0.069    0.043    0.121   -0.007    0.171  0.192              
## 316   CEO education level                       Ownership concentration                               1   1.000    107.000 -0.111          -0.111          -0.299    0.078   -0.111   -0.111 -0.351              
## 317   CEO education level                       Ownership concentration                               2   1.000    445.000  0.240           0.240           0.153    0.328    0.240    0.240  0.220              
## 318   CEO education level                       Region                                                2   1.000   2387.000  0.020           0.020          -0.020    0.060    0.020    0.020  0.043              
## 319   CEO education level                       Religion                                              1   1.000    520.000 -0.023          -0.023          -0.109    0.063   -0.023   -0.023 -0.023              
## 320   CEO education level                       Shareholder power                                     1   1.000    589.000  0.000           0.000          -0.081    0.081    0.000    0.000 -0.000              
## 321   CEO education level                       State/public-owned                                    1   1.000    520.000  0.000           0.000          -0.086    0.086    0.000    0.000  0.004              
## 322   CEO education level                       State/public-owned                                    2  11.000  42545.000 -0.004  0.082   -0.004  0.082   -0.054    0.045   -0.110    0.101 -0.155  -6.257 0.000
## 323   CEO education level                       Subjective performance                                2   2.000    776.000  0.151  0.000    0.159  0.000    0.090    0.227    0.159    0.159  0.131              
## 324   CEO education level                       Tax Performance                                       1   1.000    520.000  0.020           0.020          -0.066    0.106    0.020    0.020  0.030              
## 325   CEO education level                       X                                                     1  15.000  10251.000 -0.010  0.000   -0.010  0.000   -0.027    0.006   -0.010   -0.010 -0.092  -4.443 0.000
## 326   CEO education level                       X                                                     2   9.000   2152.000  0.082  0.059    0.087  0.059    0.028    0.146    0.011    0.163  0.107              
## 327   CEO elite education                       Board power                                           1   1.000   1478.000 -0.025          -0.025          -0.076    0.026   -0.025   -0.025 -0.052              
## 328   CEO elite education                       Board, TMT & Employee human capital                   1   2.000   1794.000  0.027  0.027    0.027  0.027   -0.033    0.087   -0.008    0.062 -0.065  -1.329 0.184
## 329   CEO elite education                       CEO elite education                                   1   2.000   2182.000  0.092  0.063    0.092  0.063   -0.006    0.189    0.010    0.173  0.102              
## 330   CEO elite education                       CEO gender                                            1   1.000    130.000 -0.010          -0.010          -0.183    0.163   -0.010   -0.010 -0.013              
## 331   CEO elite education                       CEO long-term incentive pay                           1   2.000    500.000  0.003  0.000    0.003  0.000   -0.027    0.034    0.003    0.003  0.003              
## 332   CEO elite education                       CEO managerial ability                                1   1.000   1120.000  0.000           0.000          -0.059    0.059    0.000    0.000 -0.051              
## 333   CEO elite education                       CEO power                                             1   6.000   4303.000  0.051  0.029    0.051  0.029    0.013    0.089    0.014    0.089  0.060   3.245 0.001
## 334   CEO elite education                       CEO prior career experience and expertise             1   7.000   4433.000 -0.009  0.038   -0.009  0.038   -0.050    0.031   -0.058    0.039 -0.041  -2.410 0.016
## 335   CEO elite education                       CEO prior career experience and expertise             2   2.000   7746.000  0.031  0.013    0.031  0.013    0.003    0.060    0.015    0.048 -0.013  -0.913 0.361
## 336   CEO elite education                       CEO self-concept                                      1   2.000   1979.000  0.044  0.016    0.044  0.016   -0.005    0.093    0.025    0.064  0.074              
## 337   CEO elite education                       CEO succession                                        1   1.000   1120.000 -0.030          -0.030          -0.089    0.029   -0.030   -0.030 -0.070              
## 338   CEO elite education                       CEO tenure                                            1   3.000   2728.000  0.040  0.000    0.040  0.000    0.019    0.061    0.040    0.040  0.070              
## 339   CEO elite education                       CEO tenure                                            2   1.000    183.000 -0.030          -0.030          -0.175    0.115   -0.030   -0.030  0.059              
## 340   CEO elite education                       CEO total pay                                         1   1.000    184.000 -0.089          -0.089          -0.233    0.054   -0.089   -0.089 -0.039              
## 341   CEO elite education                       Certification awards and Social reputation            1   2.000   1621.000 -0.050  0.000   -0.050  0.000   -0.092   -0.008   -0.050   -0.050  0.032              
## 342   CEO elite education                       Demographic similarity (CEO VS TMT)                   2   1.000   7563.000 -0.082          -0.082          -0.104   -0.060   -0.082   -0.082 -0.133              
## 343   CEO elite education                       External supervision                                  1   2.000   1205.000  0.051  0.050    0.051  0.050   -0.038    0.140   -0.013    0.115  0.057   1.639 0.101
## 344   CEO elite education                       Financial performance                                 1   3.000   2163.000 -0.006  0.000   -0.006  0.000   -0.042    0.029   -0.006   -0.006  0.074              
## 345   CEO elite education                       Financial performance                                 2   1.000    183.000 -0.080          -0.080          -0.225    0.064   -0.080   -0.080 -0.129              
## 346   CEO elite education                       Firm risk taking                                      1   6.000   4117.000  0.048  0.075    0.048  0.075   -0.019    0.116   -0.048    0.145  0.008              
## 347   CEO elite education                       Firm risk taking                                      2   1.000    183.000  0.040           0.040          -0.105    0.185    0.040    0.040 -0.005              
## 348   CEO elite education                       Firms Characteristics (Firm prestige)                 1   6.000   3729.000  0.045  0.026    0.045  0.026    0.007    0.084    0.011    0.079 -0.035              
## 349   CEO elite education                       Firms Characteristics (Firm prestige)                 2   1.000    183.000  0.080           0.080          -0.064    0.225    0.080    0.080 -0.013              
## 350   CEO elite education                       General performance                                   1   1.000    316.000  0.093           0.093          -0.016    0.202    0.093    0.093  0.093              
## 351   CEO elite education                       Industry Performance                                  1   1.000   1120.000  0.000           0.000          -0.059    0.059    0.000    0.000  0.101              
## 352   CEO elite education                       Insider power                                         1   3.000   1389.000 -0.101  0.000   -0.101  0.000   -0.142   -0.060   -0.101   -0.101 -0.060  -0.846 0.397
## 353   CEO elite education                       M                                                     1   2.000   1621.000 -0.041  0.100   -0.041  0.100   -0.189    0.106   -0.170    0.088  0.009              
## 354   CEO elite education                       Operational performance                               2   1.000    183.000 -0.050          -0.050          -0.195    0.095   -0.050   -0.050 -0.044              
## 355   CEO elite education                       X                                                     1   3.000   2683.000 -0.006  0.000   -0.006  0.000   -0.025    0.014   -0.006   -0.006  0.005   0.541 0.589
## 356   CEO family characteristic                 Board power                                           1   2.000   2052.000 -0.010  0.012   -0.011  0.012   -0.059    0.037   -0.027    0.005  0.050              
## 357   CEO family characteristic                 Board power                                           2   1.000     67.000 -0.060          -0.060          -0.301    0.180   -0.060   -0.060 -0.067              
## 358   CEO family characteristic                 Board, TMT & Employee career success                  1   1.000  10655.000  0.006           0.006          -0.013    0.025    0.006    0.006 -0.042              
## 359   CEO family characteristic                 Board, TMT & Employee human capital                   1   4.000  12821.000  0.048  0.018    0.048  0.019    0.022    0.073    0.023    0.072  0.035              
## 360   CEO family characteristic                 Board, TMT & Employee human capital                   2   1.000     67.000  0.013           0.013          -0.229    0.254    0.013    0.013 -0.008              
## 361   CEO family characteristic                 CEO Leadership behavior                               1   2.000   2052.000  0.021  0.000    0.023  0.000   -0.008    0.053    0.023    0.023 -0.095  -4.322 0.000
## 362   CEO family characteristic                 CEO family characteristic                             1   5.000  13197.000  0.116  0.049    0.116  0.052    0.067    0.165    0.049    0.183 -0.175              
## 363   CEO family characteristic                 CEO family characteristic                             2   1.000     67.000  0.291           0.291           0.070    0.511    0.291    0.291  0.291              
## 364   CEO family characteristic                 CEO gender                                            1   3.000  11145.000 -0.000  0.000   -0.000  0.000   -0.018    0.018   -0.000   -0.000 -0.024    -Inf 0.000
## 365   CEO family characteristic                 CEO managerial ability                                1   3.000   2150.000  0.024  0.000    0.025  0.000    0.010    0.041    0.025    0.025 -0.215 -11.458 0.000
## 366   CEO family characteristic                 CEO power                                             1   3.000  14587.000  0.240  0.033    0.240  0.033    0.200    0.280    0.198    0.282  0.253              
## 367   CEO family characteristic                 CEO power                                             2   1.000     67.000 -0.013          -0.013          -0.255    0.228   -0.013   -0.013 -0.076              
## 368   CEO family characteristic                 CEO prior career experience and expertise             1   3.000  12225.000  0.063  0.021    0.063  0.021    0.034    0.092    0.037    0.090  0.089   2.709 0.007
## 369   CEO family characteristic                 CEO self-concept                                      1   3.000    451.000 -0.027  0.047   -0.030  0.047   -0.141    0.080   -0.091    0.030 -0.115  -3.633 0.000
## 370   CEO family characteristic                 CEO social capital                                    1   3.000  16302.000  0.088  0.014    0.089  0.011    0.070    0.109    0.075    0.104  0.058              
## 371   CEO family characteristic                 CEO succession                                        1   1.000  14250.000  0.030           0.030           0.014    0.046    0.030    0.030 -0.007              
## 372   CEO family characteristic                 CEO tenure                                            1   3.000  10992.000  0.037  0.043    0.037  0.043   -0.016    0.089   -0.019    0.092 -0.019              
## 373   CEO family characteristic                 CEO total pay                                         1   1.000  10655.000  0.055           0.055           0.037    0.074    0.055    0.055  0.049              
## 374   CEO family characteristic                 Demographic similarity (CEO VS TMT)                   1   2.000   2052.000  0.007  0.000    0.007  0.000    0.005    0.009    0.007    0.007  0.011   3.502 0.000
## 375   CEO family characteristic                 Financial performance                                 1   4.000  12617.000 -0.005  0.007   -0.004  0.007   -0.023    0.014   -0.013    0.004 -0.126              
## 376   CEO family characteristic                 Financial performance                                 2   1.000     67.000  0.121           0.121          -0.117    0.359    0.121    0.121  0.155              
## 377   CEO family characteristic                 Firm risk taking                                      1   3.000  15820.000 -0.034  0.013   -0.034  0.013   -0.055   -0.012   -0.051   -0.017  0.009              
## 378   CEO family characteristic                 Firm risk taking                                      2   1.000     67.000 -0.043          -0.043          -0.284    0.198   -0.043   -0.043 -0.067              
## 379   CEO family characteristic                 Firms Characteristics (Firm prestige)                 1   6.000  25748.000  0.025  0.000    0.025  0.000    0.015    0.034    0.025    0.025  0.093              
## 380   CEO family characteristic                 Firms Characteristics (Firm prestige)                 2   1.000     67.000 -0.068          -0.068          -0.308    0.172   -0.068   -0.068  0.103              
## 381   CEO family characteristic                 General performance                                   1   1.000     98.000 -0.171          -0.171          -0.364    0.022   -0.171   -0.171 -0.181              
## 382   CEO family characteristic                 Labor market                                          1   1.000  14250.000  0.010           0.010          -0.006    0.026    0.010    0.010  0.028              
## 383   CEO family characteristic                 Labor market                                          2   1.000     67.000 -0.018          -0.018          -0.259    0.224   -0.018   -0.018 -0.199              
## 384   CEO family characteristic                 M                                                     1   1.000     98.000  0.181           0.183          -0.012    0.377    0.183    0.183  0.171              
## 385   CEO family characteristic                 Operational performance                               1   1.000    114.000  0.010           0.011          -0.195    0.217    0.011    0.011 -0.003              
## 386   CEO family characteristic                 X                                                     1   2.000   1723.000  0.013  0.000    0.014  0.000   -0.003    0.030    0.014    0.014 -0.025  -3.349 0.001
## 387   CEO gender                                Board power                                           1  13.000   9435.000  0.038  0.027    0.038  0.027    0.013    0.063    0.004    0.073  0.031   1.953 0.051
## 388   CEO gender                                Board power                                           2  11.000  43444.000  0.007  0.047    0.007  0.047   -0.022    0.036   -0.053    0.067  0.002   0.095 0.925
## 389   CEO gender                                Board, TMT & Employee career success                  1   5.000  17519.000  0.005  0.026    0.005  0.026   -0.022    0.033   -0.028    0.039  0.012   1.042 0.297
## 390   CEO gender                                Board, TMT & Employee career success                  2   2.000   3363.000 -0.007  0.000   -0.007  0.000   -0.008   -0.006   -0.007   -0.007 -0.096  -2.211 0.027
## 391   CEO gender                                Board, TMT & Employee human capital                   1  27.000  35066.000  0.089  0.225    0.089  0.225    0.003    0.175   -0.200    0.378  0.091   1.979 0.048
## 392   CEO gender                                Board, TMT & Employee human capital                   2  19.000  30328.000 -0.002  0.063   -0.002  0.063   -0.033    0.029   -0.083    0.079  0.018   0.860 0.390
## 393   CEO gender                                CEO Leadership behavior                               1   3.000   2390.000 -0.020  0.024   -0.022  0.026   -0.074    0.031   -0.055    0.012 -0.001  -0.080 0.936
## 394   CEO gender                                CEO Leadership behavior                               2  11.000   2313.000 -0.019  0.000   -0.020  0.000   -0.052    0.012   -0.020   -0.020 -0.029              
## 395   CEO gender                                CEO gender                                            1   1.000    815.000  0.010           0.010          -0.059    0.079    0.010    0.010  0.047              
## 396   CEO gender                                CEO gender                                            2   1.000   3320.000 -0.037          -0.037          -0.071   -0.003   -0.037   -0.037 -0.007              
## 397   CEO gender                                CEO human capital                                     1   1.000    520.000 -0.030          -0.030          -0.116    0.056   -0.030   -0.030 -0.034              
## 398   CEO gender                                CEO long-term incentive pay                           1  14.000  39586.000  0.004  0.040    0.004  0.040   -0.019    0.027   -0.047    0.055  0.007              
## 399   CEO gender                                CEO long-term incentive pay                           2   1.000  10329.000 -0.003          -0.003          -0.022    0.016   -0.003   -0.003 -0.010              
## 400   CEO gender                                CEO managerial ability                                1   3.000   3836.000  0.007  0.000    0.007  0.000   -0.009    0.023    0.007    0.007  0.047              
## 401   CEO gender                                CEO nationality                                       1   1.000    520.000 -0.040          -0.040          -0.126    0.046   -0.040   -0.040 -0.040              
## 402   CEO gender                                CEO nationality                                       2   1.000    309.000  0.000           0.000          -0.112    0.112    0.000    0.000  0.001              
## 403   CEO gender                                CEO power                                             1  25.000  53136.000 -0.001  0.026   -0.001  0.026   -0.014    0.012   -0.035    0.033 -0.024  -0.457 0.647
## 404   CEO gender                                CEO power                                             2   8.000  19177.000  0.023  0.148    0.023  0.148   -0.081    0.127   -0.167    0.213  0.028   0.511 0.609
## 405   CEO gender                                CEO prior career experience and expertise             1  20.000  36491.000 -0.005  0.080   -0.005  0.080   -0.042    0.032   -0.108    0.098  0.005   0.289 0.772
## 406   CEO gender                                CEO prior career experience and expertise             2   4.000  22186.000 -0.011  0.011   -0.011  0.011   -0.027    0.006   -0.024    0.003 -0.037  -4.475 0.000
## 407   CEO gender                                CEO self-concept                                      1  19.000  13978.000  0.026  0.027    0.026  0.027    0.005    0.047   -0.009    0.061  0.003   0.252 0.801
## 408   CEO gender                                CEO self-concept                                      2  10.000   6620.000  0.023  0.027    0.023  0.027   -0.006    0.053   -0.011    0.058  0.071   4.170 0.000
## 409   CEO gender                                CEO social capital                                    1   5.000   4380.000 -0.048  0.033   -0.048  0.033   -0.089   -0.006   -0.090   -0.005 -0.055  -3.243 0.001
## 410   CEO gender                                CEO social capital                                    2   4.000  21757.000  0.007  0.016    0.007  0.016   -0.014    0.027   -0.014    0.027  0.037   3.883 0.000
## 411   CEO gender                                CEO tenure                                            1  29.000  65801.000 -0.030  0.028   -0.030  0.028   -0.043   -0.017   -0.066    0.006 -0.041  -2.459 0.014
## 412   CEO gender                                CEO tenure                                            2  19.000  35280.000  0.011  0.069    0.011  0.069   -0.022    0.044   -0.078    0.099  0.019   1.066 0.286
## 413   CEO gender                                CEO total pay                                         1  18.000  41769.000 -0.008  0.035   -0.008  0.035   -0.027    0.011   -0.053    0.036 -0.024  -2.393 0.017
## 414   CEO gender                                CEO total pay                                         2   7.000  30154.000  0.016  0.015    0.016  0.015   -0.000    0.032   -0.003    0.035 -0.017  -3.097 0.002
## 415   CEO gender                                Certification awards and Social reputation            1   4.000   7870.000  0.033  0.000    0.033  0.000    0.012    0.055    0.033    0.033  0.024   1.539 0.124
## 416   CEO gender                                Compensation committee monitoring                     1   2.000   5320.000  0.009  0.022    0.009  0.022   -0.032    0.050   -0.019    0.037  0.011   0.562 0.574
## 417   CEO gender                                Compensation committee monitoring                     2   5.000  24669.000 -0.002  0.028   -0.002  0.028   -0.030    0.025   -0.038    0.034 -0.012              
## 418   CEO gender                                Country's socio-economic level                        2   1.000   2387.000  0.010           0.010          -0.030    0.050    0.010    0.010  0.030              
## 419   CEO gender                                Demographic similarity (CEO VS TMT)                   1   1.000   2101.000 -0.020          -0.020          -0.063    0.023   -0.020   -0.020  0.022              
## 420   CEO gender                                Employee and manager performance                      1   2.000   2370.000 -0.042  0.000   -0.045  0.000   -0.074   -0.016   -0.045   -0.045  0.030     Inf 0.000
## 421   CEO gender                                Employee and manager performance                      2   2.000    524.000 -0.073  0.000   -0.078  0.000   -0.097   -0.060   -0.078   -0.078 -0.068  -5.301 0.000
## 422   CEO gender                                Environment turbulence                                1  15.000  29314.000 -0.005  0.053   -0.004  0.054   -0.034    0.025   -0.073    0.064 -0.004  -0.290 0.772
## 423   CEO gender                                Environment turbulence                                2   5.000    542.000 -0.001  0.000   -0.000  0.000   -0.035    0.035   -0.000   -0.000 -0.021    -Inf 0.000
## 424   CEO gender                                External supervision                                  1   3.000   1910.000  0.021  0.000    0.021  0.000    0.015    0.026    0.021    0.021  0.021   2.022 0.043
## 425   CEO gender                                External supervision                                  2   4.000  25719.000 -0.001  0.021   -0.001  0.021   -0.025    0.023   -0.027    0.026 -0.013  -1.249 0.212
## 426   CEO gender                                Financial performance                                 1  33.000  67901.000  0.013  0.012    0.013  0.012    0.004    0.021   -0.003    0.028  0.003   0.667 0.505
## 427   CEO gender                                Financial performance                                 2  17.000  51827.000  0.010  0.014    0.010  0.014   -0.001    0.021   -0.008    0.028  0.023   5.639 0.000
## 428   CEO gender                                Firm risk taking                                      1  37.000  66341.000 -0.013  0.013   -0.013  0.013   -0.022   -0.005   -0.030    0.003 -0.021  -5.297 0.000
## 429   CEO gender                                Firm risk taking                                      2  16.000  53652.000  0.008  0.014    0.008  0.014   -0.003    0.019   -0.010    0.026 -0.002  -0.333 0.739
## 430   CEO gender                                Firms Characteristics (Firm prestige)                 1  49.000  75608.000  0.011  0.045    0.011  0.045   -0.004    0.025   -0.047    0.068  0.007   0.751 0.452
## 431   CEO gender                                Firms Characteristics (Firm prestige)                 2  29.000  46707.000  0.004  0.035    0.004  0.035   -0.012    0.019   -0.041    0.049  0.004   0.351 0.726
## 432   CEO gender                                General performance                                   1  16.000  11136.000 -0.000  0.059   -0.000  0.059   -0.034    0.034   -0.075    0.075  0.034   1.851 0.064
## 433   CEO gender                                General performance                                   2   6.000   6138.000 -0.034  0.040   -0.034  0.039   -0.075    0.006   -0.085    0.016 -0.011  -0.701 0.483
## 434   CEO gender                                Industry Performance                                  1   6.000  16571.000 -0.023  0.003   -0.023  0.003   -0.038   -0.007   -0.027   -0.018 -0.003              
## 435   CEO gender                                Institution                                           1   1.000   1350.000 -0.020          -0.020          -0.073    0.033   -0.020   -0.020  0.003              
## 436   CEO gender                                Institution                                           2   2.000   8537.000 -0.023  0.000   -0.023  0.000   -0.040   -0.006   -0.023   -0.023 -0.016  -2.550 0.011
## 437   CEO gender                                Institutional investor power                          1   3.000  22255.000 -0.007  0.011   -0.007  0.011   -0.025    0.011   -0.021    0.007 -0.083  -4.365 0.000
## 438   CEO gender                                Labor market                                          1   2.000   1256.000  0.076  0.025    0.076  0.025    0.011    0.142    0.044    0.109  0.106              
## 439   CEO gender                                Labor union power                                     1   1.000    278.000 -0.030          -0.030          -0.148    0.088   -0.030   -0.030 -0.090              
## 440   CEO gender                                Large owners power                                    1   1.000    278.000  0.060           0.060          -0.057    0.177    0.060    0.060  0.094              
## 441   CEO gender                                Large owners power                                    2   4.000  15271.000 -0.034  0.019   -0.034  0.019   -0.058   -0.009   -0.058   -0.009 -0.057  -3.227 0.001
## 442   CEO gender                                M                                                     1   4.000   4039.000  0.023  0.030    0.023  0.030   -0.019    0.066   -0.014    0.061  0.034   1.463 0.144
## 443   CEO gender                                M                                                     2   4.000   6037.000 -0.010  0.033   -0.011  0.033   -0.052    0.030   -0.054    0.032 -0.018  -0.345 0.730
## 444   CEO gender                                Minority CEO                                          1   3.000   4476.000  0.007  0.083    0.007  0.083   -0.091    0.106   -0.099    0.114  0.025   0.508 0.612
## 445   CEO gender                                Operational performance                               1  10.000  35599.000 -0.017  0.013   -0.017  0.013   -0.030   -0.004   -0.034   -0.001 -0.059  -6.331 0.000
## 446   CEO gender                                Operational performance                               2   5.000   2623.000  0.042  0.018    0.043  0.018    0.001    0.085    0.019    0.066  0.042              
## 447   CEO gender                                Region                                                2   1.000   2387.000  0.000           0.000          -0.040    0.040    0.000    0.000 -0.060              
## 448   CEO gender                                Religion                                              1   1.000    520.000  0.060           0.060          -0.026    0.146    0.060    0.060  0.010              
## 449   CEO gender                                State/public-owned                                    1   1.000    520.000  0.050           0.050          -0.036    0.136    0.050    0.050  0.080              
## 450   CEO gender                                State/public-owned                                    2   8.000  40745.000 -0.030  0.028   -0.030  0.028   -0.051   -0.008   -0.066    0.007 -0.060  -2.224 0.026
## 451   CEO gender                                Subjective performance                                1   2.000   1407.000  0.030  0.036    0.030  0.040   -0.049    0.109   -0.021    0.082  0.351              
## 452   CEO gender                                Subjective performance                                2   1.000    645.000 -0.320          -0.343          -0.418   -0.269   -0.343   -0.343 -0.340              
## 453   CEO gender                                Tax Performance                                       1   1.000    520.000  0.020           0.020          -0.066    0.106    0.020    0.020 -0.011              
## 454   CEO gender                                X                                                     1  13.000   8854.000  0.031  0.036    0.031  0.036    0.002    0.059   -0.015    0.077  0.007   0.704 0.482
## 455   CEO gender                                X                                                     2   7.000   3395.000  0.024  0.000    0.024  0.000   -0.001    0.050    0.024    0.024  0.032              
## 456   CEO human capital                         Board, TMT & Employee career success                  1   1.000    520.000 -0.008          -0.008          -0.094    0.079   -0.008   -0.008  0.028              
## 457   CEO human capital                         Board, TMT & Employee human capital                   1   1.000    520.000 -0.035          -0.035          -0.121    0.051   -0.035   -0.035 -0.085              
## 458   CEO human capital                         CEO long-term incentive pay                           1   1.000    520.000  0.050           0.050          -0.036    0.136    0.050    0.050  0.005              
## 459   CEO human capital                         CEO managerial ability                                1   1.000    520.000  0.045           0.045          -0.041    0.131    0.045    0.045  0.085              
## 460   CEO human capital                         CEO nationality                                       1   1.000    520.000 -0.040          -0.040          -0.126    0.046   -0.040   -0.040 -0.080              
## 461   CEO human capital                         CEO power                                             1   1.000    460.000  0.040           0.040          -0.051    0.131    0.040    0.040  0.010              
## 462   CEO human capital                         CEO self-concept                                      1   1.000    520.000  0.030           0.030          -0.056    0.116    0.030    0.030 -0.008              
## 463   CEO human capital                         CEO social capital                                    1   2.000    980.000  0.038  0.000    0.038  0.000    0.015    0.060    0.038    0.038  0.038              
## 464   CEO human capital                         CEO total pay                                         1   1.000    520.000  0.000           0.000          -0.086    0.086    0.000    0.000 -0.070              
## 465   CEO human capital                         Environment turbulence                                1   1.000    460.000  0.070           0.070          -0.021    0.161    0.070    0.070 -0.010              
## 466   CEO human capital                         Financial performance                                 1   1.000    460.000  0.080           0.080          -0.011    0.171    0.080    0.080  0.047              
## 467   CEO human capital                         Firm risk taking                                      1   2.000    980.000  0.033  0.028    0.033  0.028   -0.040    0.107   -0.003    0.070  0.014   0.702 0.483
## 468   CEO human capital                         Firms Characteristics (Firm prestige)                 1   2.000    980.000  0.019  0.000    0.019  0.000    0.006    0.033    0.019    0.019  0.130              
## 469   CEO human capital                         Industry Performance                                  1   1.000    460.000 -0.110          -0.110          -0.200   -0.020   -0.110   -0.110 -0.070              
## 470   CEO human capital                         Operational performance                               1   1.000    520.000 -0.040          -0.040          -0.126    0.046   -0.040   -0.040 -0.030              
## 471   CEO human capital                         Religion                                              1   1.000    520.000 -0.010          -0.010          -0.096    0.076   -0.010   -0.010  0.040              
## 472   CEO human capital                         State/public-owned                                    1   1.000    520.000 -0.050          -0.050          -0.136    0.036   -0.050   -0.050  0.000              
## 473   CEO human capital                         Tax Performance                                       1   1.000    520.000 -0.050          -0.050          -0.136    0.036   -0.050   -0.050 -0.070              
## 474   CEO human capital                         X                                                     1   1.000    520.000  0.020           0.020          -0.066    0.106    0.020    0.020 -0.032              
## 475   CEO long-term incentive pay               Board power                                           1  60.000 111345.000  0.052  0.101    0.052  0.101    0.026    0.078   -0.077    0.181  0.041   1.116 0.265
## 476   CEO long-term incentive pay               Board power                                           2   4.000  11285.000  0.010  0.070    0.010  0.070   -0.061    0.081   -0.079    0.099 -0.129  -2.562 0.010
## 477   CEO long-term incentive pay               Board, TMT & Employee career success                  1  13.000  15515.000  0.139  0.131    0.139  0.131    0.066    0.212   -0.029    0.307  0.079   1.939 0.053
## 478   CEO long-term incentive pay               Board, TMT & Employee human capital                   1  44.000  97609.000  0.060  0.121    0.060  0.121    0.024    0.096   -0.094    0.215  0.076   2.468 0.014
## 479   CEO long-term incentive pay               Board, TMT & Employee human capital                   2   4.000  11285.000 -0.016  0.050   -0.016  0.050   -0.068    0.036   -0.079    0.048 -0.244  -5.412 0.000
## 480   CEO long-term incentive pay               CEO long-term incentive pay                           1  59.000 119084.621  0.228  0.289    0.228  0.289    0.154    0.302   -0.142    0.599 -0.092  -2.441 0.015
## 481   CEO long-term incentive pay               CEO long-term incentive pay                           2   2.000   3252.000  0.320  0.000    0.320  0.000    0.299    0.341    0.320    0.320  0.277  11.658 0.000
## 482   CEO long-term incentive pay               CEO managerial ability                                1   7.000   2718.000  0.043  0.063    0.043  0.063   -0.017    0.104   -0.038    0.125  0.065   0.968 0.333
## 483   CEO long-term incentive pay               CEO nationality                                       1   2.000    627.000 -0.022  0.089   -0.022  0.089   -0.169    0.124   -0.137    0.092 -0.152              
## 484   CEO long-term incentive pay               CEO perquisites                                       1   1.000    793.000  0.130           0.130           0.062    0.199    0.130    0.130  0.113              
## 485   CEO long-term incentive pay               CEO power                                             1  79.000 288229.000  0.017  0.126    0.017  0.126   -0.011    0.045   -0.144    0.178 -0.003  -0.192 0.848
## 486   CEO long-term incentive pay               CEO power                                             2   2.000   3252.000  0.020  0.000    0.020  0.000    0.017    0.023    0.020    0.020  0.009   1.134 0.257
## 487   CEO long-term incentive pay               CEO prior career experience and expertise             1  27.000  63466.000  0.010  0.043    0.010  0.043   -0.008    0.028   -0.046    0.066 -0.003  -0.114 0.909
## 488   CEO long-term incentive pay               CEO prior career experience and expertise             2   2.000  13521.000  0.013  0.033    0.013  0.033   -0.035    0.061   -0.029    0.055 -0.213  -4.147 0.000
## 489   CEO long-term incentive pay               CEO self-concept                                      1  24.000  38501.000  0.226  0.224    0.227  0.225    0.136    0.317   -0.061    0.515  0.194   3.774 0.000
## 490   CEO long-term incentive pay               CEO social capital                                    1  10.000  13635.000  0.032  0.074    0.032  0.074   -0.017    0.080   -0.063    0.126  0.035   1.487 0.137
## 491   CEO long-term incentive pay               CEO social capital                                    2   2.000  13521.000 -0.003  0.000   -0.003  0.000   -0.015    0.009   -0.003   -0.003 -0.005  -0.050 0.960
## 492   CEO long-term incentive pay               CEO succession                                        1   4.000   4697.000  0.002  0.188    0.002  0.188   -0.185    0.188   -0.240    0.243 -0.095  -0.996 0.319
## 493   CEO long-term incentive pay               CEO tenure                                            1  73.000 152458.621  0.097  0.154    0.097  0.154    0.061    0.133   -0.101    0.295  0.121   4.984 0.000
## 494   CEO long-term incentive pay               CEO tenure                                            2   5.000  14477.000 -0.024  0.036   -0.024  0.036   -0.060    0.012   -0.070    0.023 -0.313  -8.979 0.000
## 495   CEO long-term incentive pay               CEO total pay                                         1  76.000 124286.166  0.289  0.269    0.289  0.269    0.228    0.350   -0.056    0.634  0.298   9.535 0.000
## 496   CEO long-term incentive pay               CEO total pay                                         2   4.000  11285.000 -0.009  0.010   -0.009  0.010   -0.030    0.012   -0.022    0.004 -0.087 -16.894 0.000
## 497   CEO long-term incentive pay               Certification awards and Social reputation            1   6.000   3224.000  0.078  0.000    0.078  0.000    0.045    0.110    0.078    0.078  0.128              
## 498   CEO long-term incentive pay               Chairman power                                        1   1.000    277.000 -0.050          -0.050          -0.168    0.068   -0.050   -0.050 -0.164              
## 499   CEO long-term incentive pay               Compensation committee monitoring                     1  18.000  19523.000  0.114  0.140    0.114  0.140    0.048    0.180   -0.065    0.292  0.125              
## 500   CEO long-term incentive pay               Compensation committee monitoring                     2   1.000  10329.000 -0.011          -0.011          -0.030    0.008   -0.011   -0.011 -0.114              
## 501   CEO long-term incentive pay               Consultant influence                                  1   3.000   2502.000  0.103  0.080    0.103  0.080    0.004    0.201    0.000    0.205  0.193   3.705 0.000
## 502   CEO long-term incentive pay               Country's socio-economic level                        1   6.000   6040.000 -0.090  0.059   -0.090  0.059   -0.143   -0.036   -0.166   -0.014 -0.082  -3.417 0.001
## 503   CEO long-term incentive pay               Demographic similarity (CEO VS TMT)                   1   3.000   5326.000 -0.008  0.000   -0.008  0.000   -0.019    0.004   -0.008   -0.008 -0.007  -0.646 0.518
## 504   CEO long-term incentive pay               Environment turbulence                                1  15.000  45309.000 -0.000  0.043   -0.000  0.043   -0.024    0.023   -0.055    0.054 -0.005  -0.342 0.732
## 505   CEO long-term incentive pay               External supervision                                  1  15.000 153666.000  0.005  0.040    0.005  0.040   -0.016    0.026   -0.047    0.057 -0.037  -2.575 0.010
## 506   CEO long-term incentive pay               Financial performance                                 1 100.000 344084.905  0.041  0.097    0.041  0.097    0.022    0.061   -0.083    0.166  0.018   1.316 0.188
## 507   CEO long-term incentive pay               Financial performance                                 2   5.000  14477.000  0.024  0.020    0.024  0.020   -0.000    0.048   -0.002    0.050  0.043   3.630 0.000
## 508   CEO long-term incentive pay               Firm risk taking                                      1 118.000 363639.000 -0.019  0.083   -0.019  0.083   -0.035   -0.004   -0.125    0.087 -0.037  -3.699 0.000
## 509   CEO long-term incentive pay               Firm risk taking                                      2   4.000  11285.000  0.017  0.013    0.017  0.013   -0.005    0.040    0.001    0.033  0.011   0.485 0.628
## 510   CEO long-term incentive pay               Firms Characteristics (Firm prestige)                 1 114.000 362061.869  0.006  0.235    0.006  0.235   -0.037    0.049   -0.294    0.307  0.020   0.703 0.482
## 511   CEO long-term incentive pay               Firms Characteristics (Firm prestige)                 2   5.000  14477.000 -0.014  0.043   -0.014  0.043   -0.055    0.027   -0.069    0.040 -0.073  -3.111 0.002
## 512   CEO long-term incentive pay               General performance                                   1  24.000  62426.000  0.059  0.067    0.059  0.067    0.031    0.086   -0.027    0.144 -0.036  -1.969 0.049
## 513   CEO long-term incentive pay               Industry Performance                                  1  19.000  51301.000  0.094  0.052    0.094  0.052    0.069    0.119    0.028    0.160  0.191   3.782 0.000
## 514   CEO long-term incentive pay               Insider power                                         1   9.000   2396.000 -0.097  0.147   -0.097  0.147   -0.201    0.007   -0.286    0.092 -0.461  -9.397 0.000
## 515   CEO long-term incentive pay               Insider power                                         2   2.000    896.000  0.365  0.000    0.365  0.000    0.351    0.378    0.365    0.365  0.134   2.108 0.035
## 516   CEO long-term incentive pay               Institution                                           1   7.000  17850.000  0.231  0.168    0.231  0.168    0.106    0.356    0.016    0.446  0.243   3.494 0.000
## 517   CEO long-term incentive pay               Institutional investor power                          1  37.000  88384.000 -0.012  0.174   -0.012  0.174   -0.068    0.045   -0.235    0.212 -0.057              
## 518   CEO long-term incentive pay               Labor market                                          1   1.000    870.000  0.045           0.045          -0.021    0.111    0.045    0.045  0.079              
## 519   CEO long-term incentive pay               Large owners power                                    1  19.000  20132.000 -0.034  0.043   -0.034  0.043   -0.057   -0.010   -0.088    0.021 -0.001  -0.055 0.956
## 520   CEO long-term incentive pay               Large owners power                                    2   4.000  11285.000 -0.032  0.047   -0.032  0.047   -0.082    0.018   -0.093    0.029 -0.036  -0.517 0.605
## 521   CEO long-term incentive pay               M                                                     1   3.000   1165.000  0.004  0.113    0.004  0.113   -0.137    0.144   -0.141    0.148 -0.031  -0.467 0.641
## 522   CEO long-term incentive pay               Operational performance                               1  41.000 113391.000  0.035  0.078    0.035  0.078    0.010    0.059   -0.066    0.135 -0.014              
## 523   CEO long-term incentive pay               Operational performance                               2   1.000   3192.000  0.049           0.049           0.014    0.083    0.049    0.049  0.109              
## 524   CEO long-term incentive pay               Ownership concentration                               1   3.000   2590.000 -0.061  0.000   -0.061  0.000   -0.081   -0.040   -0.061   -0.061 -0.099              
## 525   CEO long-term incentive pay               Region                                                1   1.000   2340.000  0.038           0.038          -0.002    0.078    0.038    0.038  0.053              
## 526   CEO long-term incentive pay               Religion                                              1   1.000    520.000 -0.015          -0.015          -0.101    0.071   -0.015   -0.015  0.043              
## 527   CEO long-term incentive pay               Shareholder power                                     1   8.000  19285.000 -0.058  0.085   -0.058  0.085   -0.119    0.003   -0.167    0.051 -0.037  -1.242 0.214
## 528   CEO long-term incentive pay               State/public-owned                                    1   2.000   1193.000 -0.021  0.000   -0.021  0.000   -0.069    0.028   -0.021   -0.021  0.003              
## 529   CEO long-term incentive pay               State/public-owned                                    2   1.000  10329.000 -0.024          -0.024          -0.043   -0.005   -0.024   -0.024  0.026              
## 530   CEO long-term incentive pay               Subjective performance                                1   1.000    793.000 -0.050          -0.050          -0.120    0.019   -0.050   -0.050 -0.104              
## 531   CEO long-term incentive pay               Tax Performance                                       1   5.000   4121.000  0.054  0.082    0.054  0.082   -0.024    0.132   -0.051    0.159  0.051              
## 532   CEO long-term incentive pay               Voting rights                                         1   1.000    267.000  0.003           0.003          -0.117    0.123    0.003    0.003 -0.036              
## 533   CEO long-term incentive pay               X                                                     1  28.000  36690.000  0.039  0.061    0.039  0.061    0.014    0.063   -0.040    0.117  0.044              
## 534   CEO long-term incentive pay               X                                                     2   1.000     60.000 -0.005          -0.005          -0.260    0.250   -0.005   -0.005  0.015              
## 535   CEO managerial ability                    Board power                                           1   9.000   6001.000 -0.020  0.081   -0.020  0.082   -0.079    0.039   -0.125    0.085 -0.037  -1.251 0.211
## 536   CEO managerial ability                    Board power                                           2   2.000   5888.000  0.016  0.017    0.016  0.017   -0.019    0.051   -0.005    0.038  0.005   0.190 0.849
## 537   CEO managerial ability                    Board, TMT & Employee career success                  1   6.000   5664.000  0.011  0.060    0.011  0.060   -0.043    0.065   -0.065    0.088 -0.079              
## 538   CEO managerial ability                    Board, TMT & Employee career success                  2   1.000   5758.000  0.090           0.090           0.064    0.116    0.090    0.090  0.078              
## 539   CEO managerial ability                    Board, TMT & Employee human capital                   1   9.000  11585.000  0.012  0.000    0.012  0.000   -0.006    0.030    0.012    0.012 -0.058              
## 540   CEO managerial ability                    Board, TMT & Employee human capital                   2   1.000   5758.000  0.070           0.070           0.044    0.096    0.070    0.070  0.036              
## 541   CEO managerial ability                    CEO managerial ability                                1   7.000   7166.000  0.034  0.121    0.036  0.123   -0.059    0.130   -0.122    0.194  0.029              
## 542   CEO managerial ability                    CEO nationality                                       1   1.000    520.000  0.005           0.005          -0.081    0.091    0.005    0.005 -0.034              
## 543   CEO managerial ability                    CEO power                                             1   6.000   6183.000  0.039  0.000    0.041  0.000    0.018    0.065    0.041    0.041  0.108     Inf 0.000
## 544   CEO managerial ability                    CEO power                                             2   2.000   5888.000 -0.069  0.000   -0.069  0.000   -0.082   -0.055   -0.069   -0.069 -0.064  -3.034 0.002
## 545   CEO managerial ability                    CEO prior career experience and expertise             1  10.000   8533.000 -0.005  0.064   -0.005  0.064   -0.050    0.040   -0.088    0.077 -0.105              
## 546   CEO managerial ability                    CEO prior career experience and expertise             2   1.000    130.000  0.100           0.100          -0.070    0.271    0.100    0.100  0.074              
## 547   CEO managerial ability                    CEO self-concept                                      1   7.000   2243.000  0.027  0.150    0.025  0.155   -0.097    0.148   -0.173    0.224 -0.020  -0.348 0.728
## 548   CEO managerial ability                    CEO social capital                                    1   7.000   8969.000  0.047  0.050    0.046  0.051    0.003    0.089   -0.019    0.111  0.032   0.683 0.494
## 549   CEO managerial ability                    CEO succession                                        1   4.000   5470.000  0.015  0.085    0.015  0.085   -0.073    0.102   -0.094    0.124  0.186              
## 550   CEO managerial ability                    CEO succession                                        2   1.000    130.000 -0.171          -0.171          -0.338   -0.003   -0.171   -0.171 -0.178              
## 551   CEO managerial ability                    CEO tenure                                            1   8.000   6320.000  0.007  0.032    0.008  0.032   -0.026    0.041   -0.033    0.048 -0.065  -5.219 0.000
## 552   CEO managerial ability                    CEO total pay                                         1   7.000   5674.000  0.072  0.000    0.072  0.000    0.047    0.097    0.072    0.072  0.020   1.802 0.071
## 553   CEO managerial ability                    Certification awards and Social reputation            1   4.000   9101.000  0.051  0.023    0.052  0.023    0.021    0.082    0.022    0.082  0.239   2.061 0.039
## 554   CEO managerial ability                    Compensation committee monitoring                     1   2.000    928.000 -0.187  0.163   -0.187  0.163   -0.422    0.047   -0.397    0.022 -0.211  -1.831 0.067
## 555   CEO managerial ability                    Demographic similarity (CEO VS TMT)                   1   4.000   6505.000  0.024  0.000    0.025  0.000    0.010    0.039    0.025    0.025  0.034              
## 556   CEO managerial ability                    Employee and manager performance                      1   1.000   3895.000 -0.010          -0.011          -0.044    0.023   -0.011   -0.011 -0.173              
## 557   CEO managerial ability                    Environment turbulence                                1   4.000   3941.000  0.163  0.052    0.163  0.052    0.104    0.223    0.097    0.230  0.126   2.367 0.018
## 558   CEO managerial ability                    External supervision                                  1   2.000   1116.000  0.037  0.066    0.037  0.066   -0.071    0.146   -0.047    0.121 -0.013              
## 559   CEO managerial ability                    External supervision                                  2   1.000   5758.000  0.050           0.050           0.024    0.076    0.050    0.050 -0.038              
## 560   CEO managerial ability                    Financial performance                                 1  12.000  12923.000  0.088  0.074    0.089  0.074    0.044    0.135   -0.005    0.184  0.128              
## 561   CEO managerial ability                    Financial performance                                 2   1.000   5758.000 -0.040          -0.040          -0.066   -0.014   -0.040   -0.040 -0.059              
## 562   CEO managerial ability                    Firm risk taking                                      1  17.000  15190.000  0.019  0.092    0.019  0.093   -0.028    0.066   -0.100    0.138 -0.005  -0.235 0.814
## 563   CEO managerial ability                    Firm risk taking                                      2   2.000   5888.000  0.024  0.000    0.024  0.000    0.017    0.031    0.024    0.024 -0.007  -0.204 0.839
## 564   CEO managerial ability                    Firms Characteristics (Firm prestige)                 1  20.000  14554.000  0.031  0.150    0.031  0.151   -0.037    0.099   -0.162    0.225 -0.194  -5.073 0.000
## 565   CEO managerial ability                    Firms Characteristics (Firm prestige)                 2   2.000   5888.000  0.225  0.025    0.225  0.025    0.183    0.268    0.193    0.258  0.230   3.530 0.000
## 566   CEO managerial ability                    General performance                                   1   5.000   5156.000 -0.004  0.125   -0.005  0.125   -0.118    0.108   -0.165    0.156 -0.027  -0.377 0.706
## 567   CEO managerial ability                    Industry Performance                                  1   4.000   1912.000  0.023  0.069    0.024  0.069   -0.057    0.106   -0.065    0.113  0.073              
## 568   CEO managerial ability                    Insider power                                         1   1.000    250.000 -0.050          -0.050          -0.174    0.074   -0.050   -0.050 -0.013              
## 569   CEO managerial ability                    Institution                                           1   2.000    542.000 -0.037  0.000   -0.036  0.000   -0.089    0.017   -0.036   -0.036 -0.090  -4.596 0.000
## 570   CEO managerial ability                    Institutional investor power                          1   3.000   1366.000  0.052  0.034    0.052  0.034   -0.013    0.117    0.009    0.095  0.054   2.780 0.005
## 571   CEO managerial ability                    Large owners power                                    1   2.000    688.000 -0.002  0.000   -0.002  0.000   -0.017    0.013   -0.002   -0.002  0.018              
## 572   CEO managerial ability                    Large owners power                                    2   1.000   5758.000 -0.020          -0.020          -0.046    0.006   -0.020   -0.020 -0.021              
## 573   CEO managerial ability                    M                                                     1   3.000   4866.000  0.001  0.046    0.002  0.046   -0.058    0.061   -0.058    0.061  0.021              
## 574   CEO managerial ability                    M                                                     2   1.000    130.000 -0.020          -0.020          -0.193    0.152   -0.020   -0.020  0.053              
## 575   CEO managerial ability                    Operational performance                               1   5.000   6187.000 -0.073  0.151   -0.073  0.151   -0.208    0.062   -0.266    0.121 -0.028              
## 576   CEO managerial ability                    Operational performance                               2   1.000    130.000 -0.045          -0.045          -0.217    0.127   -0.045   -0.045 -0.025              
## 577   CEO managerial ability                    Region                                                1   1.000    104.000 -0.020          -0.021          -0.225    0.182   -0.021   -0.021 -0.020              
## 578   CEO managerial ability                    Religion                                              1   1.000    520.000  0.000           0.000          -0.086    0.086    0.000    0.000 -0.010              
## 579   CEO managerial ability                    State/public-owned                                    1   1.000    520.000  0.010           0.010          -0.076    0.096    0.010    0.010 -0.070              
## 580   CEO managerial ability                    State/public-owned                                    2   1.000   5758.000  0.080           0.080           0.054    0.106    0.080    0.080  0.070              
## 581   CEO managerial ability                    Subjective performance                                1   2.000    494.000  0.010  0.091    0.010  0.091   -0.144    0.164   -0.107    0.126  0.016   0.255 0.799
## 582   CEO managerial ability                    Tax Performance                                       1   3.000   1238.000 -0.007  0.000   -0.007  0.000   -0.034    0.021   -0.007   -0.007 -0.035  -1.426 0.154
## 583   CEO managerial ability                    X                                                     1   8.000  10970.000  0.029  0.074    0.027  0.077   -0.030    0.084   -0.072    0.126 -0.021              
## 584   CEO managerial ability                    X                                                     2   1.000   5758.000  0.050           0.050           0.024    0.076    0.050    0.050  0.042              
## 585   CEO nationality                           Board, TMT & Employee career success                  1   1.000    520.000  0.008           0.008          -0.079    0.094    0.008    0.008  0.045              
## 586   CEO nationality                           Board, TMT & Employee human capital                   1   1.000    520.000 -0.038          -0.038          -0.123    0.048   -0.038   -0.038  0.453              
## 587   CEO nationality                           CEO nationality                                       2   1.000    309.000 -0.491          -0.491          -0.576   -0.406   -0.491   -0.491 -0.696              
## 588   CEO nationality                           CEO power                                             1   2.000    188.000  0.205  0.201    0.205  0.201   -0.106    0.516   -0.052    0.463 -0.087  -0.449 0.653
## 589   CEO nationality                           CEO prior career experience and expertise             1   2.000    181.000  0.292  0.185    0.292  0.185    0.003    0.581    0.055    0.528  0.307   2.352 0.019
## 590   CEO nationality                           CEO self-concept                                      1   2.000    620.000 -0.015  0.000   -0.015  0.000   -0.032    0.003   -0.015   -0.015  0.007              
## 591   CEO nationality                           CEO social capital                                    1   1.000    520.000 -0.023          -0.023          -0.109    0.063   -0.023   -0.023 -0.099              
## 592   CEO nationality                           CEO tenure                                            1   3.000    288.000  0.077  0.161    0.077  0.161   -0.139    0.293   -0.129    0.283  0.077              
## 593   CEO nationality                           CEO tenure                                            2   1.000    309.000  0.000           0.000          -0.112    0.112    0.000    0.000 -0.040              
## 594   CEO nationality                           CEO total pay                                         1   2.000    627.000  0.040  0.094    0.040  0.094   -0.112    0.192   -0.081    0.160 -0.008              
## 595   CEO nationality                           Financial performance                                 1   1.000    107.000  0.048           0.048          -0.142    0.238    0.048    0.048 -0.019              
## 596   CEO nationality                           Firm risk taking                                      1   3.000    708.000  0.067  0.000    0.067  0.000    0.018    0.115    0.067    0.067  0.067              
## 597   CEO nationality                           Firm risk taking                                      2   1.000    309.000  0.000           0.000          -0.112    0.112    0.000    0.000  0.004              
## 598   CEO nationality                           Firms Characteristics (Firm prestige)                 1   4.000    808.000 -0.004  0.110   -0.004  0.110   -0.132    0.124   -0.145    0.137 -0.006              
## 599   CEO nationality                           Firms Characteristics (Firm prestige)                 2   1.000    309.000  0.002           0.002          -0.110    0.113    0.002    0.002  0.213              
## 600   CEO nationality                           General performance                                   1   1.000     81.000 -0.211          -0.211          -0.421   -0.002   -0.211   -0.211 -0.197              
## 601   CEO nationality                           Operational performance                               1   2.000    601.000 -0.015  0.000   -0.015  0.000   -0.069    0.039   -0.015   -0.015 -0.055              
## 602   CEO nationality                           Ownership concentration                               1   1.000    107.000  0.040           0.040          -0.150    0.230    0.040    0.040 -0.080              
## 603   CEO nationality                           Religion                                              1   1.000    520.000  0.120           0.120           0.035    0.205    0.120    0.120  0.070              
## 604   CEO nationality                           State/public-owned                                    1   1.000    520.000  0.050           0.050          -0.036    0.136    0.050    0.050  0.030              
## 605   CEO nationality                           Tax Performance                                       1   1.000    520.000  0.020           0.020          -0.066    0.106    0.020    0.020  0.045              
## 606   CEO nationality                           X                                                     1   1.000    520.000 -0.025          -0.025          -0.111    0.061   -0.025   -0.025 -0.125              
## 607   CEO perquisites                           Board power                                           1   1.000    793.000  0.100           0.100           0.031    0.169    0.100    0.100 -0.020              
## 608   CEO perquisites                           CEO power                                             1   1.000    793.000  0.120           0.120           0.051    0.189    0.120    0.120 -0.020              
## 609   CEO perquisites                           CEO self-concept                                      1   1.000    793.000  0.140           0.145           0.074    0.215    0.145    0.145  0.050              
## 610   CEO perquisites                           CEO tenure                                            1   1.000    793.000  0.090           0.090           0.021    0.159    0.090    0.090  0.000              
## 611   CEO perquisites                           CEO total pay                                         1   1.000    793.000  0.090           0.090           0.021    0.159    0.090    0.090 -0.200              
## 612   CEO perquisites                           Firm risk taking                                      1   1.000    793.000  0.290           0.290           0.226    0.354    0.290    0.290 -0.080              
## 613   CEO perquisites                           Firms Characteristics (Firm prestige)                 1   1.000    793.000  0.370           0.370           0.310    0.430    0.370    0.370  0.330              
## 614   CEO perquisites                           Institutional investor power                          1   1.000    793.000  0.040           0.040          -0.030    0.110    0.040    0.040  0.090              
## 615   CEO perquisites                           Large owners power                                    1   1.000    793.000 -0.050          -0.050          -0.120    0.019   -0.050   -0.050 -0.120              
## 616   CEO perquisites                           Shareholder power                                     1   1.000    793.000  0.070           0.070           0.001    0.139    0.070    0.070 -0.050              
## 617   CEO perquisites                           Subjective performance                                1   1.000    793.000  0.120           0.120           0.051    0.189    0.120    0.120 -0.220              
## 618   CEO perquisites                           X                                                     1   1.000    793.000  0.340           0.340           0.279    0.402    0.340    0.340  0.365              
## 619   CEO power                                 Board power                                           1  93.000 127455.000 -0.025  0.139   -0.025  0.139   -0.054    0.004   -0.204    0.154 -0.054  -2.306 0.021
## 620   CEO power                                 Board power                                           2  32.000  78217.000  0.029  0.103    0.029  0.103   -0.008    0.065   -0.104    0.161 -0.006  -0.265 0.791
## 621   CEO power                                 Board, TMT & Employee career success                  1  15.000  20569.000  0.034  0.048    0.034  0.048    0.006    0.062   -0.027    0.096  0.006   0.306 0.760
## 622   CEO power                                 Board, TMT & Employee career success                  2   4.000   9405.000  0.028  0.030    0.028  0.030   -0.008    0.064   -0.010    0.067  0.027   1.565 0.118
## 623   CEO power                                 Board, TMT & Employee human capital                   1  83.000 234334.000  0.001  0.084    0.001  0.084   -0.018    0.020   -0.107    0.109  0.063   4.918 0.000
## 624   CEO power                                 Board, TMT & Employee human capital                   2  31.000  57834.000 -0.062  0.053   -0.062  0.053   -0.082   -0.042   -0.130    0.006 -0.208  -6.130 0.000
## 625   CEO power                                 CEO power                                             1  68.000 224841.000  0.146  0.269    0.146  0.269    0.082    0.210   -0.198    0.490  0.005   0.085 0.932
## 626   CEO power                                 CEO power                                             2  16.000  17889.000  0.141  0.185    0.141  0.185    0.050    0.233   -0.096    0.379  0.186   3.806 0.000
## 627   CEO power                                 CEO prior career experience and expertise             1  71.000  84928.000 -0.045  0.127   -0.045  0.127   -0.075   -0.014   -0.207    0.118 -0.070  -2.781 0.005
## 628   CEO power                                 CEO prior career experience and expertise             2  14.000  23967.000  0.026  0.075    0.026  0.075   -0.016    0.067   -0.071    0.122 -0.004  -0.158 0.874
## 629   CEO power                                 CEO self-concept                                      1  41.000  34902.000  0.029  0.091    0.029  0.092   -0.001    0.059   -0.089    0.147  0.026   1.869 0.062
## 630   CEO power                                 CEO self-concept                                      2   9.000  12156.000  0.003  0.000    0.003  0.000   -0.014    0.020    0.003    0.003 -0.132  -3.395 0.001
## 631   CEO power                                 CEO social capital                                    1  22.000  39016.000  0.135  0.182    0.135  0.182    0.058    0.211   -0.098    0.368  0.207   2.356 0.018
## 632   CEO power                                 CEO social capital                                    2   9.000  23072.000 -0.072  0.236   -0.072  0.236   -0.227    0.083   -0.375    0.230 -0.035  -0.443 0.657
## 633   CEO power                                 CEO succession                                        1   7.000  22661.000 -0.037  0.031   -0.037  0.031   -0.063   -0.010   -0.077    0.003  0.204   1.640 0.101
## 634   CEO power                                 CEO succession                                        2   2.000    294.000 -0.241  0.175   -0.241  0.175   -0.507    0.025   -0.466   -0.016 -0.468  -3.736 0.000
## 635   CEO power                                 CEO tenure                                            1 115.000 164098.799  0.227  0.183    0.227  0.183    0.193    0.260   -0.007    0.461  0.154   5.378 0.000
## 636   CEO power                                 CEO tenure                                            2  27.000  72839.000  0.072  0.120    0.072  0.120    0.026    0.118   -0.082    0.226  0.047   1.581 0.114
## 637   CEO power                                 CEO total pay                                         1  68.000 119115.000  0.026  0.152    0.026  0.152   -0.011    0.062   -0.169    0.220 -0.011  -0.291 0.771
## 638   CEO power                                 CEO total pay                                         2  13.000  33205.000  0.037  0.123    0.037  0.123   -0.031    0.105   -0.121    0.195  0.027   0.690 0.490
## 639   CEO power                                 Certification awards and Social reputation            1  14.000  13517.000  0.010  0.062    0.011  0.063   -0.026    0.048   -0.069    0.091  0.033   0.663 0.507
## 640   CEO power                                 Certification awards and Social reputation            2   4.000    763.000 -0.023  0.088   -0.024  0.088   -0.136    0.088   -0.137    0.089  0.046   0.399 0.690
## 641   CEO power                                 Chairman power                                        1   2.000    407.000 -0.068  0.148   -0.068  0.148   -0.295    0.159   -0.258    0.121 -0.131              
## 642   CEO power                                 Chairman power                                        2   1.000    385.000  0.063           0.063          -0.037    0.162    0.063    0.063 -0.003              
## 643   CEO power                                 Compensation committee monitoring                     1  17.000  23803.000  0.065  0.243    0.065  0.243   -0.051    0.182   -0.246    0.377  0.099   1.650 0.099
## 644   CEO power                                 Compensation committee monitoring                     2   6.000  33960.000 -0.034  0.030   -0.034  0.030   -0.060   -0.008   -0.072    0.004 -0.175              
## 645   CEO power                                 Consultant influence                                  1   1.000    175.000  0.141           0.141          -0.004    0.287    0.141    0.141  0.132              
## 646   CEO power                                 Country governance quality                            2   2.000    782.000  0.010  0.000    0.010  0.000   -0.038    0.058    0.010    0.010 -0.008  -0.249 0.803
## 647   CEO power                                 Country's socio-economic level                        1   3.000   2707.000  0.018  0.059    0.018  0.059   -0.058    0.095   -0.057    0.094 -0.133  -2.673 0.008
## 648   CEO power                                 Country's socio-economic level                        2   3.000   3127.000  0.151  0.063    0.151  0.063    0.072    0.230    0.071    0.232  0.128   3.346 0.001
## 649   CEO power                                 Demographic similarity (CEO VS TMT)                   1  10.000  14143.000  0.023  0.037    0.024  0.037   -0.005    0.052   -0.024    0.072  0.005   0.217 0.828
## 650   CEO power                                 Employee and manager performance                      1   3.000   6319.000  0.018  0.029    0.021  0.031   -0.023    0.066   -0.019    0.062  0.016   0.811 0.417
## 651   CEO power                                 Environment turbulence                                1  34.000 148808.000  0.002  0.018    0.002  0.018   -0.006    0.010   -0.021    0.026  0.016   1.948 0.051
## 652   CEO power                                 Environment turbulence                                2  11.000  17699.000 -0.014  0.025   -0.014  0.025   -0.035    0.007   -0.046    0.018  0.081   6.473 0.000
## 653   CEO power                                 External supervision                                  1  20.000 163151.000 -0.095  0.044   -0.095  0.044   -0.115   -0.075   -0.152   -0.038 -0.073  -7.304 0.000
## 654   CEO power                                 External supervision                                  2   3.000  21612.000 -0.023  0.000   -0.023  0.000   -0.033   -0.012   -0.023   -0.023 -0.037 -13.820 0.000
## 655   CEO power                                 Financial performance                                 1 142.000 357328.000  0.014  0.032    0.014  0.032    0.008    0.020   -0.026    0.054  0.003   0.234 0.815
## 656   CEO power                                 Financial performance                                 2  39.000  95464.000  0.011  0.068    0.011  0.068   -0.011    0.034   -0.075    0.098  0.009   0.820 0.412
## 657   CEO power                                 Firm risk taking                                      1 168.000 490887.801  0.002  0.055    0.002  0.055   -0.007    0.011   -0.069    0.073  0.002   0.198 0.843
## 658   CEO power                                 Firm risk taking                                      2  46.000 102386.000  0.000  0.071    0.000  0.071   -0.021    0.022   -0.091    0.092  0.018   1.690 0.091
## 659   CEO power                                 Firms Characteristics (Firm prestige)                 1 169.000 495177.649 -0.018  0.095   -0.018  0.095   -0.033   -0.004   -0.140    0.103  0.042   2.247 0.025
## 660   CEO power                                 Firms Characteristics (Firm prestige)                 2  56.000 111749.000 -0.060  0.129   -0.060  0.129   -0.095   -0.026   -0.226    0.105 -0.060  -3.138 0.002
## 661   CEO power                                 General performance                                   1  33.000  40495.000 -0.001  0.046   -0.001  0.046   -0.019    0.018   -0.060    0.059 -0.048  -1.865 0.062
## 662   CEO power                                 General performance                                   2  10.000   9516.000  0.047  0.076    0.047  0.076   -0.004    0.098   -0.051    0.145  0.029   1.154 0.249
## 663   CEO power                                 Industry Performance                                  1  31.000  52187.000  0.018  0.027    0.018  0.027    0.005    0.031   -0.017    0.053  0.008   1.584 0.113
## 664   CEO power                                 Industry Performance                                  2   3.000   7958.000  0.011  0.000    0.011  0.000    0.008    0.014    0.011    0.011 -0.081  -5.230 0.000
## 665   CEO power                                 Insider power                                         1  14.000  11670.000  0.092  0.058    0.092  0.058    0.056    0.127    0.017    0.166 -0.110  -2.630 0.009
## 666   CEO power                                 Insider power                                         2   2.000   3735.000  0.202  0.055    0.202  0.055    0.120    0.284    0.131    0.272  0.260   6.038 0.000
## 667   CEO power                                 Institution                                           1  14.000  22192.000 -0.058  0.070   -0.058  0.070   -0.097   -0.019   -0.147    0.031 -0.043              
## 668   CEO power                                 Institution                                           2   1.000   8006.000 -0.015          -0.015          -0.037    0.007   -0.015   -0.015  0.098              
## 669   CEO power                                 Institutional investor power                          1  36.000  73542.000 -0.113  0.104   -0.113  0.104   -0.148   -0.079   -0.246    0.020 -0.112  -4.510 0.000
## 670   CEO power                                 Institutional investor power                          2   7.000  24793.000 -0.001  0.048   -0.001  0.048   -0.038    0.037   -0.062    0.060 -0.024  -1.012 0.311
## 671   CEO power                                 Labor market                                          1   2.000  15120.000  0.024  0.023    0.024  0.023   -0.012    0.059   -0.006    0.053  0.057              
## 672   CEO power                                 Labor market                                          2   1.000     67.000 -0.034          -0.034          -0.275    0.207   -0.034   -0.034 -0.023              
## 673   CEO power                                 Large owners power                                    1  26.000  26163.000 -0.011  0.111   -0.011  0.111   -0.055    0.034   -0.153    0.132  0.025   1.056 0.291
## 674   CEO power                                 Large owners power                                    2  10.000  26033.000 -0.036  0.031   -0.036  0.031   -0.059   -0.013   -0.076    0.004 -0.031  -1.401 0.161
## 675   CEO power                                 M                                                     1  14.000  12921.000 -0.005  0.073   -0.005  0.073   -0.047    0.037   -0.099    0.089  0.142   1.643 0.100
## 676   CEO power                                 M                                                     2   6.000  10920.000 -0.147  0.206   -0.147  0.206   -0.312    0.019   -0.410    0.117 -0.122  -1.449 0.147
## 677   CEO power                                 Minority CEO                                          1   3.000   4476.000 -0.025  0.000   -0.025  0.000   -0.031   -0.020   -0.025   -0.025  0.111     Inf 0.000
## 678   CEO power                                 Nominating committee power                            1   2.000    838.000 -0.136  0.000   -0.136  0.000   -0.149   -0.124   -0.136   -0.136 -0.119 -17.846 0.000
## 679   CEO power                                 Operational performance                               1  43.000 184210.000 -0.017  0.044   -0.017  0.044   -0.031   -0.003   -0.073    0.039 -0.073  -5.047 0.000
## 680   CEO power                                 Operational performance                               2  17.000  29972.000  0.056  0.053    0.056  0.053    0.029    0.084   -0.012    0.124  0.067   1.112 0.266
## 681   CEO power                                 Ownership concentration                               1   7.000   2040.000 -0.010  0.155   -0.010  0.155   -0.133    0.112   -0.208    0.188  0.104   1.767 0.077
## 682   CEO power                                 Ownership concentration                               2   7.000  24331.000 -0.114  0.016   -0.114  0.016   -0.132   -0.097   -0.135   -0.093 -0.154 -24.787 0.000
## 683   CEO power                                 Region                                                1   3.000   2751.000  0.040  0.000    0.040  0.000    0.028    0.052    0.040    0.040  0.026     Inf 0.000
## 684   CEO power                                 Region                                                2   4.000   4010.000  0.015  0.000    0.015  0.000    0.001    0.028    0.015    0.015  0.013   0.287 0.774
## 685   CEO power                                 Shareholder power                                     1   9.000   9283.000  0.001  0.141    0.001  0.141   -0.093    0.095   -0.180    0.182 -0.021  -0.439 0.660
## 686   CEO power                                 State/public-owned                                    1   2.000 106108.000  0.022  0.009    0.022  0.009    0.008    0.035    0.011    0.033  0.107   1.907 0.057
## 687   CEO power                                 State/public-owned                                    2  21.000  79799.000 -0.085  0.256   -0.085  0.256   -0.195    0.024   -0.413    0.242 -0.085  -1.283 0.199
## 688   CEO power                                 Subjective performance                                1   4.000   2063.000 -0.001  0.070   -0.001  0.070   -0.082    0.081   -0.091    0.090  0.049   1.247 0.212
## 689   CEO power                                 Subjective performance                                2   3.000   3940.000 -0.049  0.029   -0.050  0.029   -0.096   -0.004   -0.087   -0.013 -0.099              
## 690   CEO power                                 Tax Performance                                       1   1.000   1621.000  0.050           0.050           0.001    0.099    0.050    0.050  0.077              
## 691   CEO power                                 Tax Performance                                       2   2.000    526.000 -0.027  0.000   -0.027  0.000   -0.048   -0.006   -0.027   -0.027  0.050              
## 692   CEO power                                 Voting rights                                         1   1.000    267.000 -0.077          -0.077          -0.197    0.042   -0.077   -0.077 -0.043              
## 693   CEO power                                 X                                                     1  52.000 153257.731 -0.034  0.084   -0.034  0.085   -0.058   -0.011   -0.143    0.074 -0.221  -3.303 0.001
## 694   CEO power                                 X                                                     2  12.000  36925.000  0.188  0.228    0.188  0.228    0.059    0.317   -0.104    0.480  0.198   2.987 0.003
## 695   CEO prior career experience and expertise Board power                                           1  57.000  55235.000 -0.010  0.043   -0.010  0.043   -0.024    0.004   -0.065    0.045 -0.039  -1.671 0.095
## 696   CEO prior career experience and expertise Board power                                           2  14.000  31521.000  0.029  0.085    0.029  0.085   -0.017    0.075   -0.080    0.137  0.009   0.363 0.716
## 697   CEO prior career experience and expertise Board, TMT & Employee career success                  1  10.000  22402.000  0.020  0.035    0.020  0.035   -0.006    0.045   -0.026    0.065  0.092   1.205 0.228
## 698   CEO prior career experience and expertise Board, TMT & Employee career success                  2   3.000   3586.000 -0.072  0.130   -0.072  0.130   -0.223    0.079   -0.239    0.095 -0.131  -1.708 0.088
## 699   CEO prior career experience and expertise Board, TMT & Employee human capital                   1  46.000  66586.000  0.059  0.096    0.059  0.096    0.030    0.088   -0.064    0.182  0.040   2.105 0.035
## 700   CEO prior career experience and expertise Board, TMT & Employee human capital                   2   9.000  24440.000  0.019  0.038    0.019  0.038   -0.009    0.047   -0.030    0.067 -0.042  -1.356 0.175
## 701   CEO prior career experience and expertise CEO prior career experience and expertise             1  53.000  47274.000  0.061  0.206    0.061  0.206    0.005    0.117   -0.203    0.325  0.119   1.976 0.048
## 702   CEO prior career experience and expertise CEO prior career experience and expertise             2   9.000  30346.000 -0.058  0.159   -0.058  0.159   -0.162    0.047   -0.262    0.146 -0.148  -2.696 0.007
## 703   CEO prior career experience and expertise CEO self-concept                                      1  32.000  29554.000  0.090  0.078    0.091  0.078    0.062    0.120   -0.008    0.191  0.082   5.810 0.000
## 704   CEO prior career experience and expertise CEO self-concept                                      2   3.000   1514.000  0.008  0.093    0.000  0.098   -0.122    0.123   -0.125    0.125  0.007   0.380 0.704
## 705   CEO prior career experience and expertise CEO social capital                                    1  14.000  11811.000  0.002  0.066    0.002  0.067   -0.038    0.041   -0.084    0.087  0.032   1.248 0.212
## 706   CEO prior career experience and expertise CEO social capital                                    2   8.000  25621.000 -0.031  0.053   -0.031  0.053   -0.070    0.008   -0.099    0.037  0.015   0.458 0.647
## 707   CEO prior career experience and expertise CEO succession                                        1  13.000  10418.000 -0.046  0.099   -0.046  0.099   -0.103    0.011   -0.173    0.081 -0.033  -0.669 0.503
## 708   CEO prior career experience and expertise CEO succession                                        2   4.000   3829.000 -0.013  0.082   -0.013  0.082   -0.100    0.074   -0.119    0.093 -0.016  -0.356 0.722
## 709   CEO prior career experience and expertise CEO tenure                                            1  81.000 106192.000  0.003  0.150    0.003  0.150   -0.030    0.036   -0.190    0.196 -0.057  -2.056 0.040
## 710   CEO prior career experience and expertise CEO tenure                                            2  14.000  30920.000  0.060  0.082    0.060  0.082    0.015    0.104   -0.046    0.165  0.034   1.197 0.231
## 711   CEO prior career experience and expertise CEO total pay                                         1  35.000  77069.000  0.026  0.105    0.026  0.105   -0.010    0.061   -0.108    0.160 -0.136  -2.435 0.015
## 712   CEO prior career experience and expertise CEO total pay                                         2   3.000  13721.000  0.161  0.092    0.161  0.092    0.057    0.266    0.044    0.279  0.140   2.590 0.010
## 713   CEO prior career experience and expertise Certification awards and Social reputation            1  11.000   8774.000  0.022  0.036    0.022  0.036   -0.008    0.052   -0.024    0.068 -0.058              
## 714   CEO prior career experience and expertise Certification awards and Social reputation            2   1.000    218.000  0.080           0.082          -0.053    0.217    0.082    0.082  0.052              
## 715   CEO prior career experience and expertise Compensation committee monitoring                     1   8.000   2554.000  0.028  0.078    0.028  0.078   -0.038    0.095   -0.072    0.129 -0.013              
## 716   CEO prior career experience and expertise Compensation committee monitoring                     2   1.000  10329.000  0.041           0.041           0.022    0.060    0.041    0.041 -0.007              
## 717   CEO prior career experience and expertise Consultant influence                                  1   1.000    175.000  0.048           0.048          -0.100    0.196    0.048    0.048  0.089              
## 718   CEO prior career experience and expertise Consultant influence                                  2   1.000     73.000 -0.041          -0.041          -0.271    0.190   -0.041   -0.041  0.096              
## 719   CEO prior career experience and expertise Country governance quality                            1   1.000     95.000 -0.137          -0.137          -0.335    0.062   -0.137   -0.137 -0.194              
## 720   CEO prior career experience and expertise Country governance quality                            2   2.000    782.000  0.057  0.021    0.057  0.021   -0.018    0.133    0.031    0.084  0.025   1.729 0.084
## 721   CEO prior career experience and expertise Country's socio-economic level                        1   2.000   1489.000  0.032  0.000    0.032  0.000    0.017    0.048    0.032    0.032  0.027              
## 722   CEO prior career experience and expertise Country's socio-economic level                        2   1.000    445.000  0.005           0.005          -0.088    0.098    0.005    0.005 -0.043              
## 723   CEO prior career experience and expertise Demographic similarity (CEO VS TMT)                   1   8.000   5091.000  0.048  0.067    0.049  0.068   -0.006    0.103   -0.038    0.136 -0.039  -1.624 0.104
## 724   CEO prior career experience and expertise Demographic similarity (CEO VS TMT)                   2   2.000   7723.000  0.087  0.000    0.087  0.000    0.079    0.094    0.087    0.087  0.087              
## 725   CEO prior career experience and expertise Employee and manager performance                      1   1.000   2101.000  0.000           0.000          -0.045    0.045    0.000    0.000 -0.004              
## 726   CEO prior career experience and expertise Environment turbulence                                1  32.000  35571.000  0.004  0.073    0.005  0.073   -0.023    0.032   -0.089    0.098  0.007   0.386 0.699
## 727   CEO prior career experience and expertise Environment turbulence                                2   7.000   3722.000 -0.003  0.019   -0.006  0.019   -0.041    0.030   -0.030    0.018 -0.036  -1.601 0.109
## 728   CEO prior career experience and expertise External supervision                                  1  15.000   8086.000  0.033  0.068    0.033  0.068   -0.008    0.074   -0.054    0.120 -0.169  -5.207 0.000
## 729   CEO prior career experience and expertise External supervision                                  2   2.000   8537.000  0.202  0.039    0.202  0.039    0.145    0.259    0.152    0.251  0.196   7.092 0.000
## 730   CEO prior career experience and expertise Financial performance                                 1  87.000 119035.000  0.006  0.044    0.006  0.044   -0.005    0.017   -0.051    0.062 -0.004  -0.478 0.632
## 731   CEO prior career experience and expertise Financial performance                                 2  14.000  34320.000  0.010  0.024    0.010  0.024   -0.007    0.026   -0.022    0.041 -0.021  -2.681 0.007
## 732   CEO prior career experience and expertise Firm risk taking                                      1 103.000 123555.000  0.031  0.046    0.031  0.046    0.020    0.041   -0.028    0.090 -0.005  -0.473 0.637
## 733   CEO prior career experience and expertise Firm risk taking                                      2  23.000  34854.000  0.035  0.043    0.035  0.043    0.015    0.056   -0.020    0.091  0.004   0.281 0.779
## 734   CEO prior career experience and expertise Firms Characteristics (Firm prestige)                 1 117.000 135986.000  0.031  0.130    0.031  0.130    0.007    0.055   -0.135    0.198 -0.022  -1.438 0.150
## 735   CEO prior career experience and expertise Firms Characteristics (Firm prestige)                 2  30.000  40283.000  0.054  0.055    0.054  0.055    0.032    0.076   -0.017    0.124  0.055   3.734 0.000
## 736   CEO prior career experience and expertise General performance                                   1  19.000  12112.000 -0.001  0.047   -0.001  0.047   -0.029    0.027   -0.061    0.059 -0.000  -0.006 0.995
## 737   CEO prior career experience and expertise General performance                                   2   4.000   7456.000 -0.001  0.040   -0.001  0.040   -0.046    0.044   -0.052    0.050  0.001   0.036 0.971
## 738   CEO prior career experience and expertise Industry Performance                                  1  25.000  34660.000 -0.002  0.022   -0.002  0.022   -0.015    0.012   -0.030    0.026 -0.052              
## 739   CEO prior career experience and expertise Industry Performance                                  2   1.000    218.000  0.050           0.050          -0.083    0.183    0.050    0.050  0.100              
## 740   CEO prior career experience and expertise Insider power                                         1  12.000  10738.000 -0.050  0.061   -0.050  0.061   -0.089   -0.011   -0.128    0.028 -0.084  -1.710 0.087
## 741   CEO prior career experience and expertise Insider power                                         2   2.000   3471.000  0.034  0.065    0.034  0.065   -0.062    0.129   -0.049    0.116  0.018   0.389 0.697
## 742   CEO prior career experience and expertise Institution                                           1   7.000   6767.000  0.016  0.000    0.016  0.000    0.003    0.029    0.016    0.016  0.045   5.941 0.000
## 743   CEO prior career experience and expertise Institution                                           2   3.000   8737.000 -0.029  0.013   -0.029  0.013   -0.055   -0.004   -0.046   -0.012 -0.044  -5.063 0.000
## 744   CEO prior career experience and expertise Institutional investor power                          1  17.000  27147.000  0.015  0.018    0.015  0.018    0.000    0.029   -0.008    0.038  0.013   2.917 0.004
## 745   CEO prior career experience and expertise Institutional investor power                          2   4.000   3925.000  0.002  0.000    0.002  0.000   -0.026    0.030    0.002    0.002 -0.033              
## 746   CEO prior career experience and expertise Labor market                                          1   1.000    870.000  0.035           0.035          -0.031    0.101    0.035    0.035  0.031              
## 747   CEO prior career experience and expertise Large owners power                                    1  10.000   5486.000  0.004  0.034    0.004  0.034   -0.030    0.038   -0.040    0.047  0.012   0.964 0.335
## 748   CEO prior career experience and expertise Large owners power                                    2   4.000  14557.000 -0.008  0.012   -0.008  0.012   -0.028    0.012   -0.023    0.007 -0.072  -3.427 0.001
## 749   CEO prior career experience and expertise M                                                     1   9.000   9674.000  0.063  0.060    0.063  0.060    0.019    0.107   -0.014    0.140  0.041   1.946 0.052
## 750   CEO prior career experience and expertise M                                                     2   3.000   3523.000  0.022  0.012    0.022  0.012   -0.014    0.058    0.007    0.038 -0.035  -1.315 0.188
## 751   CEO prior career experience and expertise Minority CEO                                          1   3.000   4476.000  0.057  0.044    0.057  0.044   -0.001    0.115    0.000    0.114 -0.036              
## 752   CEO prior career experience and expertise Nominating committee power                            1   1.000    304.000  0.093           0.093          -0.018    0.205    0.093    0.093  0.044              
## 753   CEO prior career experience and expertise Operational performance                               1  20.000  53986.000  0.049  0.062    0.049  0.062    0.020    0.077   -0.030    0.128 -0.010  -0.507 0.612
## 754   CEO prior career experience and expertise Operational performance                               2  10.000   7422.000  0.059  0.044    0.059  0.044    0.023    0.094    0.002    0.115  0.081   5.826 0.000
## 755   CEO prior career experience and expertise Ownership concentration                               1   4.000   4560.000 -0.023  0.002   -0.023  0.002   -0.052    0.007   -0.025   -0.020 -0.051  -1.753 0.080
## 756   CEO prior career experience and expertise Ownership concentration                               2   5.000   4334.000  0.028  0.065    0.028  0.065   -0.036    0.092   -0.055    0.111  0.037              
## 757   CEO prior career experience and expertise Region                                                1   1.000   1314.000 -0.009          -0.009          -0.063    0.045   -0.009   -0.009 -0.022              
## 758   CEO prior career experience and expertise Region                                                2   1.000    198.000  0.013           0.013          -0.126    0.153    0.013    0.013 -0.050              
## 759   CEO prior career experience and expertise Shareholder power                                     1   3.000    746.000  0.063  0.133    0.063  0.133   -0.104    0.230   -0.108    0.234  0.082   1.037 0.300
## 760   CEO prior career experience and expertise State/public-owned                                    2  10.000  29463.000 -0.018  0.054   -0.018  0.054   -0.054    0.017   -0.088    0.051 -0.032  -0.654 0.513
## 761   CEO prior career experience and expertise Subjective performance                                1   6.000   1921.000  0.014  0.113    0.014  0.113   -0.087    0.115   -0.131    0.158 -0.007              
## 762   CEO prior career experience and expertise Tax Performance                                       1   1.000     40.000  0.020           0.020          -0.293    0.334    0.020    0.020 -0.028              
## 763   CEO prior career experience and expertise X                                                     1  33.000  26252.000  0.049  0.074    0.049  0.074    0.021    0.077   -0.046    0.144 -0.107  -1.416 0.157
## 764   CEO prior career experience and expertise X                                                     2   4.000   1002.000  0.156  0.149    0.156  0.149   -0.002    0.314   -0.035    0.346  0.148   1.892 0.059
## 765   CEO self-concept                          Board power                                           1  20.000  10158.000  0.008  0.098    0.009  0.099   -0.039    0.056   -0.118    0.135 -0.021  -0.858 0.391
## 766   CEO self-concept                          Board power                                           2   2.000   5916.000  0.029  0.008    0.029  0.008    0.001    0.057    0.018    0.040  0.010   0.717 0.473
## 767   CEO self-concept                          Board, TMT & Employee career success                  1   5.000   4429.000  0.019  0.027    0.019  0.029   -0.020    0.058   -0.018    0.056 -0.018  -0.982 0.326
## 768   CEO self-concept                          Board, TMT & Employee human capital                   1  33.000  28685.000  0.037  0.080    0.037  0.081    0.008    0.067   -0.066    0.141 -0.021  -0.435 0.664
## 769   CEO self-concept                          Board, TMT & Employee human capital                   2  11.000   5518.000  0.058  0.158    0.057  0.165   -0.045    0.158   -0.155    0.269 -0.043  -0.829 0.407
## 770   CEO self-concept                          CEO self-concept                                      1  60.000  25302.000  0.101  0.178    0.104  0.190    0.054    0.154   -0.140    0.348  0.166   2.780 0.005
## 771   CEO self-concept                          CEO self-concept                                      2  14.000   3276.000 -0.065  0.215   -0.062  0.258   -0.203    0.079   -0.393    0.269 -0.142  -2.331 0.020
## 772   CEO self-concept                          CEO social capital                                    1  10.000   7547.000  0.078  0.084    0.078  0.088    0.019    0.137   -0.034    0.190  0.088   3.276 0.001
## 773   CEO self-concept                          CEO social capital                                    2   2.000   5580.000 -0.010  0.000   -0.010  0.000   -0.010   -0.010   -0.010   -0.010 -0.157    -Inf 0.000
## 774   CEO self-concept                          CEO succession                                        1   2.000    354.000  0.147  0.000    0.147  0.000    0.074    0.219    0.147    0.147  0.160  18.075 0.000
## 775   CEO self-concept                          CEO tenure                                            1  50.000  53647.000 -0.014  0.060   -0.014  0.061   -0.033    0.004   -0.092    0.063 -0.053  -3.819 0.000
## 776   CEO self-concept                          CEO tenure                                            2  11.000   7844.000  0.039  0.034    0.040  0.034    0.009    0.070   -0.004    0.083  0.020   0.249 0.803
## 777   CEO self-concept                          CEO total pay                                         1  15.000  43309.000  0.018  0.313    0.018  0.314   -0.141    0.177   -0.384    0.420  0.022              
## 778   CEO self-concept                          CEO total pay                                         2   1.000   4792.000 -0.004          -0.004          -0.032    0.024   -0.004   -0.004 -0.133              
## 779   CEO self-concept                          Certification awards and Social reputation            1  11.000   8550.000  0.129  0.104    0.129  0.104    0.064    0.194   -0.005    0.263  0.049   1.545 0.122
## 780   CEO self-concept                          Certification awards and Social reputation            2   2.000    296.000  0.081  0.000    0.085  0.000    0.002    0.169    0.085    0.085  0.011     Inf 0.000
## 781   CEO self-concept                          Compensation committee monitoring                     1   4.000   1124.000  0.070  0.000    0.070  0.000    0.037    0.103    0.070    0.070  0.088              
## 782   CEO self-concept                          Compensation committee monitoring                     2   1.000     97.000 -0.018          -0.019          -0.235    0.196   -0.019   -0.019 -0.141              
## 783   CEO self-concept                          Consultant influence                                  2   1.000     97.000  0.123           0.132          -0.080    0.344    0.132    0.132  0.126              
## 784   CEO self-concept                          Country's socio-economic level                        1   3.000   9446.000 -0.004  0.009   -0.004  0.009   -0.026    0.019   -0.015    0.008  0.052   9.763 0.000
## 785   CEO self-concept                          Demographic similarity (CEO VS TMT)                   1   3.000   2862.000 -0.055  0.000   -0.056  0.000   -0.080   -0.032   -0.056   -0.056 -0.254  -5.100 0.000
## 786   CEO self-concept                          Employee and manager performance                      1   2.000   2424.000  0.198  0.062    0.224  0.071    0.116    0.331    0.132    0.315  0.161   3.248 0.001
## 787   CEO self-concept                          Employee and manager performance                      2   2.000    662.000  0.037  0.000    0.048  0.000   -0.013    0.109    0.048    0.048  0.022   2.574 0.010
## 788   CEO self-concept                          Environment turbulence                                1  25.000  30895.000  0.015  0.166    0.004  0.175   -0.066    0.074   -0.221    0.229 -0.025  -0.989 0.322
## 789   CEO self-concept                          Environment turbulence                                2  10.000  14626.000  0.040  0.076    0.040  0.076   -0.010    0.090   -0.058    0.138 -0.085  -1.927 0.054
## 790   CEO self-concept                          External supervision                                  1  15.000  21100.000  0.125  0.153    0.118  0.173    0.030    0.207   -0.103    0.340  0.092              
## 791   CEO self-concept                          External supervision                                  2   1.000     97.000  0.034           0.038          -0.188    0.264    0.038    0.038  0.024              
## 792   CEO self-concept                          Financial performance                                 1  55.000  54473.000  0.010  0.089    0.009  0.089   -0.016    0.035   -0.105    0.124  0.128   2.997 0.003
## 793   CEO self-concept                          Financial performance                                 2  12.000  14976.000 -0.118  0.139   -0.120  0.139   -0.200   -0.040   -0.299    0.058 -0.186  -4.321 0.000
## 794   CEO self-concept                          Firm risk taking                                      1  72.000  76454.000  0.067  0.114    0.066  0.118    0.037    0.094   -0.086    0.217  0.016   0.865 0.387
## 795   CEO self-concept                          Firm risk taking                                      2  16.000  16782.000  0.052  0.051    0.051  0.052    0.022    0.081   -0.016    0.118 -0.026  -1.490 0.136
## 796   CEO self-concept                          Firms Characteristics (Firm prestige)                 1  99.000  97357.000  0.078  0.129    0.074  0.135    0.047    0.102   -0.099    0.248  0.083   4.172 0.000
## 797   CEO self-concept                          Firms Characteristics (Firm prestige)                 2  26.000  22820.000 -0.005  0.074   -0.006  0.075   -0.037    0.026   -0.101    0.090 -0.053  -2.287 0.022
## 798   CEO self-concept                          General performance                                   1  22.000  14566.000  0.048  0.081    0.047  0.083    0.009    0.086   -0.059    0.154  0.141   2.640 0.008
## 799   CEO self-concept                          General performance                                   2   7.000   9255.000 -0.093  0.132   -0.094  0.132   -0.194    0.006   -0.264    0.075 -0.120  -2.199 0.028
## 800   CEO self-concept                          Industry Performance                                  1  14.000  22082.000  0.027  0.115    0.019  0.121   -0.046    0.083   -0.136    0.173 -0.043              
## 801   CEO self-concept                          Industry Performance                                  2   1.000    218.000  0.070           0.079          -0.070    0.228    0.079    0.079  0.197              
## 802   CEO self-concept                          Insider power                                         1   2.000   1088.000 -0.127  0.000   -0.127  0.000   -0.182   -0.072   -0.127   -0.127 -0.388  -3.960 0.000
## 803   CEO self-concept                          Institution                                           1   6.000  16304.000  0.261  0.240    0.261  0.240    0.068    0.453   -0.047    0.568  0.254   2.559 0.010
## 804   CEO self-concept                          Institutional investor power                          1  10.000  14963.000  0.007  0.050    0.007  0.050   -0.028    0.042   -0.057    0.071  0.157              
## 805   CEO self-concept                          Labor union power                                     2   1.000    190.000 -0.150          -0.159          -0.305   -0.012   -0.159   -0.159 -0.166              
## 806   CEO self-concept                          Large owners power                                    1   3.000    984.000  0.016  0.000    0.016  0.000   -0.031    0.064    0.016    0.016 -0.052  -1.581 0.114
## 807   CEO self-concept                          M                                                     1  16.000   9347.000  0.068  0.160    0.056  0.193   -0.041    0.153   -0.191    0.303  0.073   2.206 0.027
## 808   CEO self-concept                          M                                                     2   2.000   5580.000 -0.005  0.000   -0.005  0.000   -0.012    0.002   -0.005   -0.005  0.014     Inf 0.000
## 809   CEO self-concept                          Minority CEO                                          1   3.000   4476.000 -0.019  0.000   -0.020  0.000   -0.039   -0.001   -0.020   -0.020 -0.208 -10.802 0.000
## 810   CEO self-concept                          Operational performance                               1  26.000  37925.000  0.188  0.097    0.190  0.111    0.146    0.234    0.048    0.332  0.201   7.263 0.000
## 811   CEO self-concept                          Operational performance                               2  10.000  13611.000 -0.013  0.059   -0.013  0.059   -0.054    0.027   -0.089    0.063 -0.013              
## 812   CEO self-concept                          Ownership concentration                               1   1.000    332.000  0.000           0.000          -0.108    0.108    0.000    0.000 -0.005              
## 813   CEO self-concept                          Region                                                1   3.000   5126.000  0.005  0.020    0.005  0.020   -0.031    0.040   -0.021    0.030 -0.005              
## 814   CEO self-concept                          Religion                                              1   1.000    520.000  0.010           0.010          -0.076    0.096    0.010    0.010 -0.024              
## 815   CEO self-concept                          Shareholder power                                     1   2.000   1380.000  0.034  0.000    0.035  0.000    0.029    0.041    0.035    0.035  0.124              
## 816   CEO self-concept                          State/public-owned                                    1   1.000    520.000 -0.090          -0.090          -0.175   -0.005   -0.090   -0.090 -0.027              
## 817   CEO self-concept                          State/public-owned                                    2   5.000   8804.000 -0.064  0.018   -0.064  0.017   -0.090   -0.039   -0.086   -0.042 -0.160  -3.630 0.000
## 818   CEO self-concept                          Subjective performance                                1   5.000   2652.000  0.096  0.086    0.108  0.088    0.021    0.196   -0.005    0.221 -0.094  -0.545 0.586
## 819   CEO self-concept                          Subjective performance                                2   2.000    835.000  0.190  0.207    0.218  0.236   -0.117    0.553   -0.084    0.520  0.196   1.173 0.241
## 820   CEO self-concept                          Tax Performance                                       1   3.000   1989.000 -0.006  0.000   -0.006  0.000   -0.027    0.014   -0.006   -0.006 -0.035  -2.654 0.008
## 821   CEO self-concept                          X                                                     1  38.000  25800.000  0.029  0.091    0.026  0.095   -0.007    0.059   -0.096    0.148 -0.027  -0.767 0.443
## 822   CEO self-concept                          X                                                     2   7.000   1864.000  0.056  0.084    0.057  0.095   -0.030    0.143   -0.065    0.178  0.007   0.192 0.847
## 823   CEO social capital                        Board power                                           1  21.000  24343.000  0.049  0.064    0.049  0.064    0.019    0.079   -0.032    0.131  0.068   3.649 0.000
## 824   CEO social capital                        Board power                                           2  10.000  44128.000 -0.019  0.039   -0.019  0.039   -0.046    0.007   -0.070    0.031 -0.017  -1.350 0.177
## 825   CEO social capital                        Board, TMT & Employee career success                  1   3.000   2871.000 -0.002  0.000   -0.002  0.000   -0.016    0.011   -0.002   -0.002 -0.109  -5.958 0.000
## 826   CEO social capital                        Board, TMT & Employee human capital                   1  25.000  29813.000  0.106  0.091    0.106  0.092    0.069    0.144   -0.011    0.224  0.071   2.597 0.009
## 827   CEO social capital                        Board, TMT & Employee human capital                   2   6.000  30830.000  0.035  0.050    0.035  0.050   -0.007    0.077   -0.029    0.099 -0.099  -2.600 0.009
## 828   CEO social capital                        CEO social capital                                    1  18.000  29203.000  0.134  0.136    0.135  0.137    0.071    0.199   -0.040    0.310  0.050   0.526 0.599
## 829   CEO social capital                        CEO social capital                                    2   4.000   1783.000  0.084  0.180    0.084  0.180   -0.098    0.266   -0.146    0.314  0.083   0.912 0.362
## 830   CEO social capital                        CEO succession                                        1   2.000  17898.000  0.001  0.019    0.001  0.019   -0.029    0.032   -0.024    0.026 -0.030  -1.574 0.116
## 831   CEO social capital                        CEO tenure                                            1  16.000  13444.000  0.031  0.053    0.031  0.053    0.000    0.062   -0.036    0.099 -0.060  -1.462 0.144
## 832   CEO social capital                        CEO tenure                                            2  13.000  42046.000  0.091  0.140    0.091  0.140    0.014    0.168   -0.089    0.271  0.021   0.504 0.614
## 833   CEO social capital                        CEO total pay                                         1   8.000   8062.000  0.071  0.033    0.071  0.033    0.039    0.103    0.028    0.113  0.009   0.541 0.589
## 834   CEO social capital                        CEO total pay                                         2   4.000  19686.000  0.062  0.023    0.062  0.023    0.035    0.089    0.032    0.092  0.082   2.819 0.005
## 835   CEO social capital                        Certification awards and Social reputation            1   2.000   4998.000 -0.021  0.038   -0.021  0.038   -0.080    0.039   -0.069    0.028 -0.189              
## 836   CEO social capital                        Chairman power                                        1   1.000     61.000  0.168           0.168          -0.078    0.414    0.168    0.168  0.125              
## 837   CEO social capital                        Compensation committee monitoring                     1   2.000    959.000  0.043  0.000    0.043  0.000    0.027    0.059    0.043    0.043  0.041   2.688 0.007
## 838   CEO social capital                        Compensation committee monitoring                     2   3.000  13751.000  0.002  0.026    0.002  0.026   -0.032    0.036   -0.032    0.036  0.182              
## 839   CEO social capital                        Country governance quality                            2   1.000    337.000 -0.180          -0.180          -0.284   -0.077   -0.180   -0.180 -0.175              
## 840   CEO social capital                        Country's socio-economic level                        2   2.000   8322.000 -0.005  0.000   -0.005  0.000   -0.009   -0.001   -0.005   -0.005 -0.061  -3.466 0.001
## 841   CEO social capital                        Demographic similarity (CEO VS TMT)                   1   6.000   4773.000  0.056  0.043    0.056  0.047    0.008    0.104   -0.005    0.116 -0.089              
## 842   CEO social capital                        Employee and manager performance                      1   1.000   2101.000  0.145           0.154           0.109    0.198    0.154    0.154  0.128              
## 843   CEO social capital                        Environment turbulence                                1   4.000   1230.000  0.017  0.000    0.017  0.000   -0.023    0.057    0.017    0.017  0.026   2.121 0.034
## 844   CEO social capital                        Environment turbulence                                2   5.000   6098.000 -0.009  0.026   -0.010  0.026   -0.044    0.024   -0.043    0.024 -0.075              
## 845   CEO social capital                        External supervision                                  1   1.000   2340.000  0.066           0.066           0.026    0.106    0.066    0.066  0.025              
## 846   CEO social capital                        External supervision                                  2   1.000   8006.000  0.041           0.041           0.019    0.063    0.041    0.041  0.039              
## 847   CEO social capital                        Financial performance                                 1  20.000  25651.000  0.002  0.020    0.002  0.020   -0.013    0.017   -0.023    0.027  0.003   0.217 0.829
## 848   CEO social capital                        Financial performance                                 2  12.000  48667.000 -0.001  0.041   -0.001  0.041   -0.026    0.024   -0.054    0.052 -0.009  -0.586 0.558
## 849   CEO social capital                        Firm risk taking                                      1  28.000  43557.000  0.008  0.051    0.008  0.051   -0.013    0.029   -0.057    0.073  0.037   3.000 0.003
## 850   CEO social capital                        Firm risk taking                                      2  17.000  51855.000 -0.029  0.032   -0.029  0.032   -0.047   -0.012   -0.071    0.012 -0.112  -5.174 0.000
## 851   CEO social capital                        Firms Characteristics (Firm prestige)                 1  33.000  46738.000  0.083  0.116    0.083  0.116    0.042    0.123   -0.065    0.231  0.050   1.752 0.080
## 852   CEO social capital                        Firms Characteristics (Firm prestige)                 2  18.000  54199.000  0.032  0.087    0.032  0.087   -0.009    0.074   -0.079    0.144 -0.053  -2.041 0.041
## 853   CEO social capital                        General performance                                   1   6.000   4629.000  0.085  0.039    0.085  0.039    0.043    0.128    0.036    0.135  0.202   3.567 0.000
## 854   CEO social capital                        General performance                                   2   2.000   8525.000 -0.117  0.077   -0.117  0.077   -0.226   -0.008   -0.216   -0.018 -0.070  -1.292 0.196
## 855   CEO social capital                        Industry Performance                                  1   4.000   1522.000 -0.047  0.000   -0.047  0.000   -0.086   -0.008   -0.047   -0.047  0.003              
## 856   CEO social capital                        Industry Performance                                  2   1.000   1277.000 -0.050          -0.050          -0.105    0.005   -0.050   -0.050 -0.050              
## 857   CEO social capital                        Insider power                                         1   1.000    360.000  0.000           0.000          -0.103    0.103    0.000    0.000 -0.196              
## 858   CEO social capital                        Insider power                                         2   2.000   3448.000  0.196  0.000    0.196  0.000    0.195    0.198    0.196    0.196  0.164              
## 859   CEO social capital                        Institution                                           1   1.000   1350.000  0.033           0.033          -0.021    0.086    0.033    0.033  0.039              
## 860   CEO social capital                        Institution                                           2   2.000   8434.000 -0.007  0.000   -0.007  0.000   -0.008   -0.006   -0.007   -0.007 -0.058  -1.859 0.063
## 861   CEO social capital                        Institutional investor power                          1   4.000  11296.000  0.051  0.062    0.051  0.062   -0.013    0.114   -0.029    0.130 -0.359              
## 862   CEO social capital                        Labor market                                          1   1.000  14250.000  0.410           0.410           0.396    0.424    0.410    0.410  0.465              
## 863   CEO social capital                        Large owners power                                    1   1.000    477.000 -0.055          -0.055          -0.144    0.035   -0.055   -0.055 -0.018              
## 864   CEO social capital                        Large owners power                                    2   3.000  13053.000 -0.037  0.035   -0.037  0.035   -0.080    0.007   -0.082    0.009 -0.020  -0.509 0.611
## 865   CEO social capital                        M                                                     1   3.000   5999.000 -0.017  0.057   -0.017  0.057   -0.087    0.053   -0.091    0.057  0.029   0.685 0.494
## 866   CEO social capital                        Minority CEO                                          1   2.000   3451.000 -0.046  0.038   -0.046  0.038   -0.109    0.016   -0.095    0.003 -0.258              
## 867   CEO social capital                        Nominating committee power                            1   1.000    534.000  0.212           0.212           0.131    0.293    0.212    0.212  0.189              
## 868   CEO social capital                        Operational performance                               1   6.000   3395.000  0.022  0.000    0.022  0.000    0.003    0.041    0.022    0.022  0.070   2.264 0.024
## 869   CEO social capital                        Operational performance                               2   6.000   9279.000 -0.048  0.076   -0.048  0.076   -0.112    0.016   -0.145    0.049  0.002   0.033 0.974
## 870   CEO social capital                        Ownership concentration                               2   5.000  22173.000 -0.050  0.084   -0.050  0.084   -0.124    0.025   -0.157    0.058  0.015              
## 871   CEO social capital                        Region                                                1   1.000   2340.000 -0.065          -0.065          -0.105   -0.025   -0.065   -0.065 -0.056              
## 872   CEO social capital                        Region                                                2   3.000   3862.000 -0.009  0.000   -0.009  0.000   -0.025    0.007   -0.009   -0.009 -0.009              
## 873   CEO social capital                        Religion                                              1   1.000    520.000 -0.000          -0.000          -0.086    0.086   -0.000   -0.000 -0.028              
## 874   CEO social capital                        Shareholder power                                     1   1.000   2340.000  0.028           0.028          -0.012    0.069    0.028    0.028  0.020              
## 875   CEO social capital                        State/public-owned                                    1   1.000    520.000  0.008           0.008          -0.079    0.094    0.008    0.008 -0.075              
## 876   CEO social capital                        State/public-owned                                    2  12.000  37382.000  0.082  0.187    0.082  0.187   -0.024    0.189   -0.158    0.322  0.097              
## 877   CEO social capital                        Tax Performance                                       1   1.000    520.000 -0.015          -0.015          -0.101    0.071   -0.015   -0.015 -0.085              
## 878   CEO social capital                        Voting rights                                         2   1.000   1277.000  0.070           0.070           0.015    0.125    0.070    0.070  0.053              
## 879   CEO social capital                        X                                                     1  11.000  15659.000  0.017  0.081    0.016  0.082   -0.034    0.067   -0.088    0.121  0.167   5.063 0.000
## 880   CEO social capital                        X                                                     2   3.000   8862.000 -0.150  0.038   -0.150  0.038   -0.198   -0.102   -0.199   -0.101 -0.122  -4.076 0.000
## 881   CEO succession                            Board power                                           1   7.000   3903.000 -0.028  0.053   -0.028  0.053   -0.078    0.022   -0.096    0.040  0.056   1.258 0.209
## 882   CEO succession                            Board power                                           2   5.000   3993.000 -0.084  0.089   -0.084  0.089   -0.168   -0.000   -0.198    0.030 -0.192  -4.823 0.000
## 883   CEO succession                            Board, TMT & Employee career success                  1   2.000    702.000  0.108  0.000    0.108  0.000    0.094    0.121    0.108    0.108 -0.000    -Inf 0.000
## 884   CEO succession                            Board, TMT & Employee career success                  2   2.000    245.000  0.108  0.000    0.108  0.000    0.086    0.130    0.108    0.108  0.136  15.013 0.000
## 885   CEO succession                            Board, TMT & Employee human capital                   1   5.000   7322.000 -0.028  0.020   -0.028  0.020   -0.057    0.001   -0.054   -0.002 -0.048              
## 886   CEO succession                            Board, TMT & Employee human capital                   2   1.000    164.000  0.020           0.020          -0.133    0.174    0.020    0.020 -0.211              
## 887   CEO succession                            CEO succession                                        1   5.000   6777.000  0.232  0.114    0.232  0.114    0.129    0.335    0.085    0.378 -0.023  -0.447 0.655
## 888   CEO succession                            CEO succession                                        2   2.000    339.000  0.255  0.000    0.255  0.000    0.202    0.307    0.255    0.255  0.469  11.428 0.000
## 889   CEO succession                            CEO tenure                                            1  15.000  13733.000 -0.214  0.159   -0.214  0.159   -0.296   -0.132   -0.418   -0.010 -0.200              
## 890   CEO succession                            CEO tenure                                            2   1.000    164.000 -0.014          -0.014          -0.168    0.139   -0.014   -0.014  0.036              
## 891   CEO succession                            CEO total pay                                         1   3.000   6141.000 -0.050  0.030   -0.050  0.030   -0.092   -0.008   -0.088   -0.012 -0.065  -2.009 0.044
## 892   CEO succession                            Certification awards and Social reputation            1   4.000   5746.000  0.015  0.055    0.015  0.055   -0.045    0.075   -0.055    0.085  0.022              
## 893   CEO succession                            Certification awards and Social reputation            2   1.000    164.000 -0.007          -0.007          -0.161    0.146   -0.007   -0.007  0.057              
## 894   CEO succession                            Compensation committee monitoring                     1   1.000    663.000 -0.064          -0.064          -0.139    0.012   -0.064   -0.064 -0.114              
## 895   CEO succession                            Demographic similarity (CEO VS TMT)                   1   2.000    314.000  0.050  0.000    0.050  0.000    0.032    0.068    0.050    0.050 -0.021    -Inf 0.000
## 896   CEO succession                            Environment turbulence                                1   8.000   4689.000  0.072  0.000    0.072  0.000    0.053    0.090    0.072    0.072  0.117   4.022 0.000
## 897   CEO succession                            External supervision                                  1   2.000    615.000 -0.045  0.041   -0.045  0.041   -0.143    0.052   -0.098    0.007 -0.037  -1.258 0.208
## 898   CEO succession                            Financial performance                                 1  16.000  15007.000 -0.008  0.024   -0.008  0.024   -0.028    0.012   -0.039    0.023 -0.052  -8.598 0.000
## 899   CEO succession                            Financial performance                                 2   2.000   3441.000  0.044  0.000    0.044  0.000    0.034    0.054    0.044    0.044 -0.031  -1.883 0.060
## 900   CEO succession                            Firm risk taking                                      1  22.000  37473.000  0.075  0.077    0.075  0.077    0.042    0.109   -0.023    0.174  0.101   2.591 0.010
## 901   CEO succession                            Firm risk taking                                      2   5.000   3993.000 -0.025  0.079   -0.025  0.079   -0.101    0.050   -0.126    0.076  0.024   0.645 0.519
## 902   CEO succession                            Firms Characteristics (Firm prestige)                 1  22.000  35637.000 -0.050  0.057   -0.050  0.057   -0.075   -0.024   -0.122    0.023  0.007   0.332 0.740
## 903   CEO succession                            Firms Characteristics (Firm prestige)                 2   5.000   3993.000 -0.056  0.035   -0.056  0.035   -0.099   -0.013   -0.100   -0.012 -0.071  -4.551 0.000
## 904   CEO succession                            General performance                                   1   2.000   3640.000  0.014  0.000    0.014  0.000    0.002    0.027    0.014    0.014  0.000   0.012 0.991
## 905   CEO succession                            General performance                                   2   2.000   3524.000  0.014  0.048    0.014  0.048   -0.061    0.089   -0.048    0.076 -0.028  -0.815 0.415
## 906   CEO succession                            Industry Performance                                  1   7.000   7488.000  0.042  0.000    0.042  0.000    0.020    0.064    0.042    0.042 -0.046  -3.027 0.002
## 907   CEO succession                            Institution                                           1   5.000   6134.000  0.088  0.034    0.088  0.034    0.049    0.127    0.044    0.132 -0.025  -1.669 0.095
## 908   CEO succession                            Institutional investor power                          1   2.000    657.000  0.114  0.000    0.114  0.000    0.068    0.159    0.114    0.114  0.134     Inf 0.000
## 909   CEO succession                            Institutional investor power                          2   3.000   3699.000 -0.021  0.000   -0.021  0.000   -0.051    0.009   -0.021   -0.021 -0.061              
## 910   CEO succession                            Labor market                                          1   1.000  14250.000  0.040           0.040           0.024    0.056    0.040    0.040 -0.103              
## 911   CEO succession                            Large owners power                                    1   2.000    672.000  0.143  0.000    0.143  0.000    0.130    0.156    0.143    0.143  0.080              
## 912   CEO succession                            Large owners power                                    2   1.000   3360.000  0.064           0.064           0.030    0.097    0.064    0.064  0.090              
## 913   CEO succession                            M                                                     1   3.000   4945.000 -0.027  0.000   -0.027  0.000   -0.051   -0.003   -0.027   -0.027  0.114              
## 914   CEO succession                            M                                                     2   1.000    130.000 -0.141          -0.141          -0.310    0.029   -0.141   -0.141 -0.251              
## 915   CEO succession                            Operational performance                               1   1.000    264.000  0.110           0.110          -0.009    0.230    0.110    0.110  0.062              
## 916   CEO succession                            Operational performance                               2   2.000    211.000  0.048  0.000    0.048  0.000   -0.062    0.158    0.048    0.048  0.055     Inf 0.000
## 917   CEO succession                            Ownership concentration                               2   2.000    245.000 -0.007  0.000   -0.007  0.000   -0.015   -0.000   -0.007   -0.007 -0.017              
## 918   CEO succession                            Shareholder power                                     1   1.000   1830.000  0.010           0.010          -0.036    0.055    0.010    0.010 -0.121              
## 919   CEO succession                            State/public-owned                                    1   1.000     67.000  0.131           0.131          -0.106    0.368    0.131    0.131  0.137              
## 920   CEO succession                            State/public-owned                                    2   1.000   3360.000 -0.006          -0.006          -0.040    0.028   -0.006   -0.006  0.044              
## 921   CEO succession                            Subjective performance                                1   1.000    438.000 -0.050          -0.050          -0.144    0.043   -0.050   -0.050 -0.072              
## 922   CEO succession                            X                                                     1  10.000  15464.000  0.022  0.096    0.022  0.096   -0.040    0.083   -0.101    0.144  0.063   1.916 0.055
## 923   CEO tenure                                Board power                                           1  98.000 108224.000 -0.041  0.124   -0.041  0.124   -0.066   -0.016   -0.200    0.119 -0.074  -4.129 0.000
## 924   CEO tenure                                Board power                                           2  29.000  91315.000  0.033  0.069    0.033  0.070    0.007    0.060   -0.056    0.123  0.076   2.242 0.025
## 925   CEO tenure                                Board, TMT & Employee career success                  1  13.000  24978.000 -0.043  0.113   -0.043  0.113   -0.105    0.020   -0.187    0.102  0.017   0.557 0.578
## 926   CEO tenure                                Board, TMT & Employee career success                  2   3.000   3527.000 -0.060  0.000   -0.060  0.000   -0.069   -0.051   -0.060   -0.060 -0.052  -5.804 0.000
## 927   CEO tenure                                Board, TMT & Employee human capital                   1  90.000 116768.000 -0.008  0.084   -0.008  0.084   -0.027    0.010   -0.116    0.099 -0.010  -0.885 0.376
## 928   CEO tenure                                Board, TMT & Employee human capital                   2  32.000  54982.000  0.001  0.040    0.001  0.040   -0.015    0.018   -0.050    0.053 -0.236  -2.981 0.003
## 929   CEO tenure                                CEO tenure                                            1  22.000  26176.000  0.238  0.370    0.238  0.370    0.082    0.393   -0.237    0.712  0.013   0.137 0.891
## 930   CEO tenure                                CEO tenure                                            2   5.000  20625.000  0.224  0.120    0.224  0.120    0.118    0.331    0.070    0.379  0.220   4.053 0.000
## 931   CEO tenure                                CEO total pay                                         1  73.000 148483.147  0.004  0.059    0.004  0.059   -0.010    0.019   -0.072    0.080 -0.088  -3.900 0.000
## 932   CEO tenure                                CEO total pay                                         2  15.000  40020.000  0.093  0.084    0.093  0.084    0.049    0.136   -0.014    0.200  0.071   2.415 0.016
## 933   CEO tenure                                Certification awards and Social reputation            1  12.000  10271.000  0.021  0.070    0.021  0.070   -0.023    0.065   -0.068    0.111 -0.072  -3.582 0.000
## 934   CEO tenure                                Certification awards and Social reputation            2   2.000    467.000  0.094  0.000    0.094  0.000    0.062    0.125    0.094    0.094  0.155   2.123 0.034
## 935   CEO tenure                                Chairman power                                        1   2.000    191.000 -0.061  0.103   -0.061  0.103   -0.263    0.140   -0.193    0.071 -0.135  -1.766 0.077
## 936   CEO tenure                                Compensation committee monitoring                     1  15.000  18509.000  0.074  0.086    0.074  0.086    0.028    0.120   -0.037    0.184  0.022   0.535 0.592
## 937   CEO tenure                                Compensation committee monitoring                     2   6.000  44708.000  0.052  0.084    0.052  0.084   -0.016    0.120   -0.056    0.160  0.112   3.270 0.001
## 938   CEO tenure                                Consultant influence                                  1   3.000    907.000 -0.061  0.000   -0.061  0.000   -0.118   -0.003   -0.061   -0.061 -0.068              
## 939   CEO tenure                                Consultant influence                                  2   1.000     73.000  0.007           0.007          -0.224    0.238    0.007    0.007 -0.163              
## 940   CEO tenure                                Country governance quality                            1   1.000     95.000  0.170           0.170          -0.026    0.366    0.170    0.170  0.041              
## 941   CEO tenure                                Country governance quality                            2   2.000    782.000  0.129  0.000    0.129  0.000    0.115    0.143    0.129    0.129  0.131   4.173 0.000
## 942   CEO tenure                                Country's socio-economic level                        1   6.000   4814.000 -0.002  0.077   -0.002  0.077   -0.070    0.065   -0.101    0.096 -0.063  -2.004 0.045
## 943   CEO tenure                                Country's socio-economic level                        2   2.000   2832.000  0.061  0.000    0.061  0.000    0.030    0.091    0.061    0.061  0.069   2.816 0.005
## 944   CEO tenure                                Demographic similarity (CEO VS TMT)                   1   5.000   3056.000 -0.009  0.055   -0.009  0.055   -0.069    0.051   -0.079    0.062 -0.024              
## 945   CEO tenure                                Employee and manager performance                      1   1.000   2101.000  0.015           0.016          -0.029    0.061    0.016    0.016  0.020              
## 946   CEO tenure                                Environment turbulence                                1  52.000  70875.000 -0.005  0.042   -0.005  0.042   -0.019    0.008   -0.059    0.049  0.005   0.181 0.856
## 947   CEO tenure                                Environment turbulence                                2   9.000   1171.000 -0.010  0.058   -0.013  0.062   -0.086    0.061   -0.092    0.066  0.011   0.329 0.743
## 948   CEO tenure                                External supervision                                  1  17.000  26127.000 -0.021  0.090   -0.021  0.090   -0.065    0.023   -0.136    0.094 -0.011  -0.506 0.613
## 949   CEO tenure                                External supervision                                  2   2.000  15854.000 -0.009  0.009   -0.009  0.009   -0.029    0.011   -0.021    0.002 -0.028  -3.929 0.000
## 950   CEO tenure                                Financial performance                                 1 160.000 236369.933  0.018  0.034    0.018  0.034    0.012    0.025   -0.026    0.062  0.016   1.571 0.116
## 951   CEO tenure                                Financial performance                                 2  40.000  98878.000  0.002  0.063    0.002  0.063   -0.018    0.023   -0.078    0.082  0.031   2.821 0.005
## 952   CEO tenure                                Firm risk taking                                      1 182.000 249053.181 -0.029  0.063   -0.029  0.063   -0.039   -0.019   -0.109    0.052 -0.001  -0.176 0.860
## 953   CEO tenure                                Firm risk taking                                      2  42.000 101309.000 -0.027  0.042   -0.027  0.042   -0.041   -0.013   -0.081    0.027 -0.041  -4.429 0.000
## 954   CEO tenure                                Firms Characteristics (Firm prestige)                 1 204.000 276830.578  0.014  0.095    0.014  0.095    0.000    0.027   -0.108    0.136 -0.042  -4.203 0.000
## 955   CEO tenure                                Firms Characteristics (Firm prestige)                 2  62.000 108631.000  0.056  0.058    0.056  0.058    0.040    0.071   -0.019    0.130  0.073   7.466 0.000
## 956   CEO tenure                                General performance                                   1  31.000  55402.000 -0.017  0.035   -0.017  0.035   -0.032   -0.002   -0.062    0.028  0.038   3.864 0.000
## 957   CEO tenure                                General performance                                   2  13.000  15707.000 -0.055  0.027   -0.055  0.027   -0.076   -0.033   -0.089   -0.020 -0.063  -7.401 0.000
## 958   CEO tenure                                Industry Performance                                  1  49.000  79766.000  0.008  0.028    0.008  0.028   -0.002    0.018   -0.027    0.043 -0.094  -3.210 0.001
## 959   CEO tenure                                Insider power                                         1  17.000  13325.000  0.102  0.119    0.102  0.119    0.043    0.161   -0.051    0.254 -0.322  -2.999 0.003
## 960   CEO tenure                                Insider power                                         2   5.000   4881.000  0.424  0.231    0.424  0.231    0.220    0.627    0.127    0.720  0.430   4.135 0.000
## 961   CEO tenure                                Institution                                           1  19.000  32243.000 -0.006  0.048   -0.006  0.048   -0.030    0.018   -0.068    0.055  0.014   0.627 0.531
## 962   CEO tenure                                Institution                                           2   3.000   8634.000 -0.020  0.034   -0.020  0.034   -0.064    0.024   -0.064    0.023 -0.016  -0.798 0.425
## 963   CEO tenure                                Institutional investor power                          1  46.000  94426.000 -0.004  0.034   -0.004  0.034   -0.016    0.008   -0.047    0.039 -0.005  -0.160 0.873
## 964   CEO tenure                                Institutional investor power                          2   6.000  18053.000  0.001  0.079    0.001  0.079   -0.063    0.066   -0.100    0.102  0.035              
## 965   CEO tenure                                Labor market                                          1   1.000    386.000 -0.034          -0.034          -0.134    0.066   -0.034   -0.034 -0.039              
## 966   CEO tenure                                Large owners power                                    1  25.000  13272.000  0.005  0.056    0.006  0.056   -0.022    0.034   -0.067    0.078  0.030   1.258 0.208
## 967   CEO tenure                                Large owners power                                    2  10.000  24722.000 -0.024  0.065   -0.024  0.065   -0.066    0.018   -0.108    0.059 -0.093  -1.326 0.185
## 968   CEO tenure                                M                                                     1  10.000   5644.000  0.069  0.212    0.069  0.212   -0.065    0.203   -0.203    0.340 -0.046  -0.680 0.497
## 969   CEO tenure                                M                                                     2   3.000   3690.000  0.115  0.013    0.116  0.015    0.079    0.152    0.096    0.135  0.147   4.219 0.000
## 970   CEO tenure                                Minority CEO                                          1   3.000   4476.000 -0.032  0.059   -0.032  0.059   -0.105    0.040   -0.108    0.043  0.062              
## 971   CEO tenure                                Nominating committee power                            1   1.000    534.000 -0.095          -0.095          -0.179   -0.010   -0.095   -0.095 -0.089              
## 972   CEO tenure                                Operational performance                               1  52.000 129660.000 -0.005  0.057   -0.005  0.057   -0.022    0.011   -0.078    0.067  0.039   4.950 0.000
## 973   CEO tenure                                Operational performance                               2  18.000  15377.000 -0.044  0.000   -0.044  0.000   -0.060   -0.029   -0.044   -0.044 -0.027    -Inf 0.000
## 974   CEO tenure                                Ownership concentration                               1   6.000   3352.000 -0.017  0.000   -0.017  0.000   -0.034   -0.001   -0.017   -0.017  0.036   2.010 0.044
## 975   CEO tenure                                Ownership concentration                               2   8.000  36533.000 -0.053  0.050   -0.053  0.050   -0.089   -0.017   -0.117    0.011 -0.039  -2.152 0.031
## 976   CEO tenure                                Region                                                1   4.000   8667.000 -0.013  0.009   -0.013  0.009   -0.036    0.010   -0.025   -0.001 -0.033  -1.311 0.190
## 977   CEO tenure                                Region                                                2   2.000   3570.000  0.020  0.035    0.020  0.035   -0.039    0.079   -0.025    0.065  0.087   3.357 0.001
## 978   CEO tenure                                Shareholder power                                     1  11.000  23545.000 -0.067  0.023   -0.067  0.023   -0.086   -0.048   -0.097   -0.037  0.024              
## 979   CEO tenure                                State/public-owned                                    1   1.000     67.000 -0.091          -0.091          -0.330    0.149   -0.091   -0.091 -0.068              
## 980   CEO tenure                                State/public-owned                                    2  16.000  70380.000 -0.022  0.079   -0.022  0.079   -0.062    0.017   -0.123    0.079 -0.054  -2.744 0.006
## 981   CEO tenure                                Subjective performance                                1   7.000   3662.000  0.032  0.000    0.032  0.000    0.000    0.064    0.032    0.032 -0.067    -Inf 0.000
## 982   CEO tenure                                Subjective performance                                2   2.000    776.000  0.099  0.000    0.104  0.000    0.048    0.160    0.104    0.104  0.079     Inf 0.000
## 983   CEO tenure                                Tax Performance                                       1   3.000   1068.000  0.020  0.000    0.020  0.000   -0.006    0.047    0.020    0.020  0.093              
## 984   CEO tenure                                Voting rights                                         1   1.000    267.000 -0.073          -0.073          -0.193    0.046   -0.073   -0.073 -0.072              
## 985   CEO tenure                                X                                                     1  58.000  65449.000 -0.001  0.096   -0.001  0.096   -0.027    0.025   -0.123    0.122  0.004   0.204 0.838
## 986   CEO tenure                                X                                                     2  14.000  36231.000 -0.005  0.060   -0.005  0.060   -0.038    0.028   -0.082    0.072 -0.075  -2.935 0.003
## 987   CEO total pay                             Board power                                           1  58.000  88956.000  0.070  0.148    0.070  0.148    0.032    0.109   -0.120    0.260  0.036   1.705 0.088
## 988   CEO total pay                             Board power                                           2  19.000  53396.000  0.034  0.035    0.034  0.035    0.016    0.052   -0.011    0.079 -0.024  -0.879 0.379
## 989   CEO total pay                             Board, TMT & Employee career success                  1  12.000  22767.000  0.058  0.092    0.058  0.092    0.005    0.112   -0.059    0.176 -0.032              
## 990   CEO total pay                             Board, TMT & Employee career success                  2   1.000    491.000  0.090           0.090           0.002    0.178    0.090    0.090 -0.068              
## 991   CEO total pay                             Board, TMT & Employee human capital                   1  51.000 109592.000  0.158  0.172    0.158  0.172    0.110    0.205   -0.063    0.378  0.106   3.745 0.000
## 992   CEO total pay                             Board, TMT & Employee human capital                   2  15.000  45505.000  0.051  0.058    0.051  0.058    0.021    0.082   -0.023    0.126 -0.294  -5.488 0.000
## 993   CEO total pay                             CEO total pay                                         1  36.000  72350.000  0.346  0.309    0.346  0.309    0.245    0.447   -0.050    0.742 -0.069  -0.288 0.774
## 994   CEO total pay                             CEO total pay                                         2   4.000  15984.000  0.415  0.468    0.415  0.468   -0.044    0.874   -0.185    1.015  0.323   1.378 0.168
## 995   CEO total pay                             Certification awards and Social reputation            1  10.000  11287.000  0.092  0.039    0.092  0.039    0.062    0.122    0.042    0.142  0.059              
## 996   CEO total pay                             Chairman power                                        1   1.000     61.000  0.033           0.033          -0.220    0.286    0.033    0.033  0.020              
## 997   CEO total pay                             Chairman power                                        2   1.000    385.000  0.013           0.013          -0.087    0.113    0.013    0.013 -0.146              
## 998   CEO total pay                             Compensation committee monitoring                     1  16.000  18261.000  0.158  0.227    0.158  0.227    0.046    0.270   -0.133    0.449 -0.017  -0.214 0.831
## 999   CEO total pay                             Compensation committee monitoring                     2   7.000  34451.000  0.175  0.152    0.175  0.152    0.063    0.288   -0.019    0.370  0.029   0.504 0.614
## 1000  CEO total pay                             Consultant influence                                  1   3.000   2559.000  0.146  0.000    0.146  0.000    0.124    0.169    0.146    0.146  0.257   5.630 0.000
## 1001  CEO total pay                             Country's socio-economic level                        1   4.000  10456.000 -0.111  0.091   -0.111  0.091   -0.202   -0.019   -0.228    0.006 -0.342  -4.139 0.000
## 1002  CEO total pay                             Country's socio-economic level                        2   3.000   8617.000  0.231  0.119    0.231  0.119    0.095    0.367    0.078    0.384  0.242   3.524 0.000
## 1003  CEO total pay                             Demographic similarity (CEO VS TMT)                   1   3.000   3003.000 -0.011  0.000   -0.011  0.000   -0.033    0.010   -0.011   -0.011 -0.001              
## 1004  CEO total pay                             Employee and manager performance                      1   1.000    269.000 -0.010          -0.010          -0.130    0.110   -0.010   -0.010 -0.003              
## 1005  CEO total pay                             Environment turbulence                                1  17.000  36086.000 -0.007  0.053   -0.007  0.053   -0.034    0.021   -0.075    0.061 -0.017              
## 1006  CEO total pay                             Environment turbulence                                2   1.000   2820.000  0.010           0.010          -0.027    0.047    0.010    0.010 -0.068              
## 1007  CEO total pay                             External supervision                                  1  12.000  19837.000  0.078  0.074    0.078  0.074    0.033    0.122   -0.018    0.173 -0.025  -0.563 0.573
## 1008  CEO total pay                             External supervision                                  2   3.000  15747.000  0.103  0.066    0.103  0.066    0.026    0.179    0.017    0.188  0.020   0.514 0.607
## 1009  CEO total pay                             Financial performance                                 1  93.000 152969.594  0.082  0.097    0.082  0.097    0.062    0.102   -0.042    0.206  0.004   0.167 0.868
## 1010  CEO total pay                             Financial performance                                 2  23.000  62995.000  0.078  0.095    0.078  0.095    0.039    0.118   -0.043    0.200  0.041   1.797 0.072
## 1011  CEO total pay                             Firm risk taking                                      1 100.000 150211.000  0.038  0.111    0.038  0.111    0.015    0.060   -0.105    0.180  0.002   0.078 0.938
## 1012  CEO total pay                             Firm risk taking                                      2  22.000  65323.000  0.036  0.099    0.036  0.099   -0.007    0.078   -0.092    0.163 -0.151  -4.602 0.000
## 1013  CEO total pay                             Firms Characteristics (Firm prestige)                 1  99.000 184240.933  0.187  0.250    0.187  0.250    0.138    0.237   -0.134    0.508  0.076   2.044 0.041
## 1014  CEO total pay                             Firms Characteristics (Firm prestige)                 2  25.000  57681.000  0.111  0.136    0.111  0.136    0.057    0.165   -0.063    0.286  0.056   1.560 0.119
## 1015  CEO total pay                             General performance                                   1  19.000  20057.000  0.056  0.100    0.056  0.100    0.009    0.103   -0.073    0.184  0.016   0.298 0.766
## 1016  CEO total pay                             General performance                                   2   2.000   7612.000  0.040  0.067    0.040  0.067   -0.056    0.136   -0.046    0.126 -0.030  -0.538 0.591
## 1017  CEO total pay                             Industry Performance                                  1  19.000  48146.000  0.070  0.129    0.070  0.129    0.011    0.129   -0.096    0.236  0.087              
## 1018  CEO total pay                             Industry Performance                                  2   1.000   6362.000 -0.017          -0.017          -0.041    0.008   -0.017   -0.017  0.052              
## 1019  CEO total pay                             Insider power                                         1  12.000   6883.000 -0.069  0.023   -0.069  0.023   -0.095   -0.042   -0.098   -0.040  0.006   0.264 0.792
## 1020  CEO total pay                             Insider power                                         2   4.000   1631.000 -0.074  0.042   -0.074  0.042   -0.138   -0.011   -0.129   -0.020  0.221   1.343 0.179
## 1021  CEO total pay                             Institution                                           1   6.000  17162.000 -0.295  0.399   -0.295  0.399   -0.615    0.025   -0.807    0.216 -0.223  -1.343 0.179
## 1022  CEO total pay                             Institutional investor power                          1  38.000  73426.000 -0.072  0.205   -0.072  0.205   -0.137   -0.006   -0.335    0.191 -0.125  -2.896 0.004
## 1023  CEO total pay                             Institutional investor power                          2   6.000  24498.000  0.054  0.068    0.054  0.068   -0.002    0.109   -0.033    0.141 -0.066  -2.369 0.018
## 1024  CEO total pay                             Labor market                                          1   2.000   1256.000  0.119  0.000    0.119  0.000    0.117    0.121    0.119    0.119  0.185   9.245 0.000
## 1025  CEO total pay                             Large owners power                                    1  17.000  20126.000 -0.066  0.083   -0.066  0.083   -0.108   -0.025   -0.172    0.040 -0.039  -1.764 0.078
## 1026  CEO total pay                             Large owners power                                    2  10.000  30747.000 -0.027  0.029   -0.027  0.029   -0.049   -0.006   -0.065    0.010 -0.183  -2.016 0.044
## 1027  CEO total pay                             M                                                     1   3.000   3998.000  0.155  0.156    0.155  0.156   -0.024    0.334   -0.045    0.355  0.140   1.539 0.124
## 1028  CEO total pay                             M                                                     2   7.000   4146.000  0.015  0.038    0.015  0.038   -0.027    0.056   -0.034    0.063  0.068   2.943 0.003
## 1029  CEO total pay                             Operational performance                               1  31.000  65871.000 -0.054  0.102   -0.053  0.102   -0.090   -0.017   -0.185    0.078 -0.169              
## 1030  CEO total pay                             Operational performance                               2   1.000   2820.000  0.115           0.115           0.079    0.151    0.115    0.115  0.106              
## 1031  CEO total pay                             Ownership concentration                               1   5.000   3386.000  0.009  0.096    0.009  0.096   -0.081    0.099   -0.114    0.132  0.019   0.453 0.651
## 1032  CEO total pay                             Ownership concentration                               2   4.000   6684.000 -0.010  0.000   -0.010  0.000   -0.033    0.012   -0.010   -0.010 -0.047  -1.983 0.047
## 1033  CEO total pay                             Region                                                1   4.000   8667.000  0.037  0.047    0.037  0.047   -0.014    0.088   -0.024    0.097  0.001   0.020 0.984
## 1034  CEO total pay                             Region                                                2   2.000   3570.000  0.035  0.099    0.035  0.099   -0.106    0.177   -0.092    0.162  0.050              
## 1035  CEO total pay                             Religion                                              1   1.000    520.000 -0.015          -0.015          -0.101    0.071   -0.015   -0.015 -0.036              
## 1036  CEO total pay                             Shareholder power                                     1   9.000  23150.000  0.021  0.064    0.021  0.064   -0.022    0.065   -0.061    0.103  0.068   1.652 0.099
## 1037  CEO total pay                             State/public-owned                                    1   2.000   1193.000 -0.047  0.050   -0.047  0.050   -0.136    0.043   -0.111    0.017 -0.017  -0.380 0.704
## 1038  CEO total pay                             State/public-owned                                    2  11.000  50926.000 -0.029  0.097   -0.029  0.097   -0.087    0.028   -0.153    0.095 -0.139              
## 1039  CEO total pay                             Subjective performance                                1   1.000    793.000  0.110           0.110           0.041    0.179    0.110    0.110 -0.003              
## 1040  CEO total pay                             Tax Performance                                       1   4.000   1557.000  0.113  0.075    0.113  0.075    0.025    0.202    0.017    0.209  0.073              
## 1041  CEO total pay                             Tax Performance                                       2   1.000    295.000  0.040           0.040          -0.074    0.154    0.040    0.040 -0.002              
## 1042  CEO total pay                             X                                                     1  28.000  41479.000  0.042  0.052    0.042  0.052    0.020    0.063   -0.025    0.109 -0.036  -2.080 0.037
## 1043  CEO total pay                             X                                                     2   4.000   7722.000  0.077  0.028    0.077  0.028    0.042    0.113    0.042    0.113 -0.443              
## 1044  CEO total pay                             firms Characteristics (Firm prestige)                 2   1.000     63.000  0.520           0.520           0.339    0.702    0.520    0.520  0.465              
## 1045  Demographic similarity (CEO VS TMT)       Board power                                           1   7.000   5571.000  0.055  0.081    0.055  0.085   -0.013    0.123   -0.053    0.163  0.061   2.038 0.042
## 1046  Demographic similarity (CEO VS TMT)       Board, TMT & Employee career success                  1   3.000   6869.000 -0.006  0.000   -0.006  0.000   -0.016    0.004   -0.006   -0.006 -0.056              
## 1047  Demographic similarity (CEO VS TMT)       Board, TMT & Employee career success                  2   1.000  13407.000  0.050           0.050           0.033    0.067    0.050    0.050  0.044              
## 1048  Demographic similarity (CEO VS TMT)       Board, TMT & Employee human capital                   1  10.000  13348.000  0.006  0.060    0.006  0.061   -0.036    0.048   -0.072    0.085 -0.317 -10.198 0.000
## 1049  Demographic similarity (CEO VS TMT)       Board, TMT & Employee human capital                   2   2.000  13536.000  0.323  0.033    0.323  0.033    0.274    0.372    0.280    0.366  0.423              
## 1050  Demographic similarity (CEO VS TMT)       Certification awards and Social reputation            1   1.000   3895.000 -0.100          -0.100          -0.131   -0.069   -0.100   -0.100 -0.113              
## 1051  Demographic similarity (CEO VS TMT)       Chairman power                                        1   1.000     61.000  0.013           0.013          -0.240    0.266    0.013    0.013 -0.018              
## 1052  Demographic similarity (CEO VS TMT)       Compensation committee monitoring                     1   1.000     61.000  0.032           0.032          -0.221    0.285    0.032    0.032 -0.079              
## 1053  Demographic similarity (CEO VS TMT)       Demographic similarity (CEO VS TMT)                   1   9.000   7985.000  0.111  0.132    0.110  0.139    0.017    0.204   -0.068    0.289  0.061              
## 1054  Demographic similarity (CEO VS TMT)       Demographic similarity (CEO VS TMT)                   2   1.000    129.000  0.050           0.050          -0.123    0.223    0.050    0.050  0.031              
## 1055  Demographic similarity (CEO VS TMT)       Employee and manager performance                      1   2.000   5996.000  0.020  0.079    0.020  0.084   -0.098    0.139   -0.087    0.128 -0.060  -1.024 0.306
## 1056  Demographic similarity (CEO VS TMT)       Environment turbulence                                1   5.000   1334.000  0.079  0.000    0.079  0.000    0.030    0.129    0.079    0.079  0.036              
## 1057  Demographic similarity (CEO VS TMT)       Environment turbulence                                2   1.000    129.000  0.044           0.044          -0.129    0.216    0.044    0.044 -0.122              
## 1058  Demographic similarity (CEO VS TMT)       External supervision                                  1   1.000    177.000  0.165           0.165           0.022    0.309    0.165    0.165  0.176              
## 1059  Demographic similarity (CEO VS TMT)       Financial performance                                 1  13.000  13623.000 -0.010  0.023   -0.010  0.023   -0.031    0.011   -0.040    0.020 -0.007  -0.526 0.599
## 1060  Demographic similarity (CEO VS TMT)       Firm risk taking                                      1  11.000  11493.000 -0.003  0.052   -0.002  0.053   -0.038    0.034   -0.070    0.065 -0.169              
## 1061  Demographic similarity (CEO VS TMT)       Firm risk taking                                      2   1.000    160.000  0.166           0.166           0.014    0.317    0.166    0.166  0.137              
## 1062  Demographic similarity (CEO VS TMT)       Firms Characteristics (Firm prestige)                 1  13.000  11128.000  0.028  0.053    0.028  0.053   -0.006    0.062   -0.040    0.096 -0.020  -1.380 0.168
## 1063  Demographic similarity (CEO VS TMT)       Firms Characteristics (Firm prestige)                 2   2.000    289.000  0.048  0.000    0.048  0.000   -0.022    0.118    0.048    0.048  0.039     Inf 0.000
## 1064  Demographic similarity (CEO VS TMT)       General performance                                   1   6.000   7861.000  0.010  0.000    0.010  0.000   -0.007    0.026    0.010    0.010 -0.081              
## 1065  Demographic similarity (CEO VS TMT)       Industry Performance                                  1   1.000    208.000  0.090           0.090          -0.045    0.225    0.090    0.090  0.381              
## 1066  Demographic similarity (CEO VS TMT)       Institution                                           1   1.000    347.000 -0.290          -0.290          -0.387   -0.194   -0.290   -0.290 -0.105              
## 1067  Demographic similarity (CEO VS TMT)       M                                                     1   2.000   2278.000 -0.185  0.080   -0.185  0.080   -0.303   -0.067   -0.288   -0.083 -0.165              
## 1068  Demographic similarity (CEO VS TMT)       Minority CEO                                          1   1.000   2101.000 -0.020          -0.020          -0.063    0.023   -0.020   -0.020  0.010              
## 1069  Demographic similarity (CEO VS TMT)       State/public-owned                                    2   1.000    129.000 -0.030          -0.030          -0.203    0.143   -0.030   -0.030 -0.064              
## 1070  Demographic similarity (CEO VS TMT)       Subjective performance                                2   1.000    129.000  0.033           0.033          -0.140    0.207    0.033    0.033  0.042              
## 1071  Demographic similarity (CEO VS TMT)       X                                                     1   3.000   7120.000 -0.009  0.092   -0.010  0.096   -0.121    0.102   -0.133    0.113 -0.062              
## 1072  Demographic similarity (CEO VS TMT)       X                                                     2   1.000    129.000  0.054           0.054          -0.119    0.226    0.054    0.054 -0.067              
## 1073  Minority CEO                              Board power                                           1   1.000   1350.000  0.120           0.120           0.067    0.173    0.120    0.120  0.120              
## 1074  Minority CEO                              Board, TMT & Employee career success                  1   2.000   3126.000  0.000  0.000    0.000  0.000    0.000    0.000    0.000    0.000  0.036   0.802 0.422
## 1075  Minority CEO                              Board, TMT & Employee human capital                   1   3.000   4476.000 -0.036  0.077   -0.036  0.077   -0.128    0.056   -0.135    0.063 -0.076              
## 1076  Minority CEO                              Certification awards and Social reputation            1   1.000   1350.000  0.040           0.040          -0.013    0.093    0.040    0.040  0.060              
## 1077  Minority CEO                              Employee and manager performance                      1   1.000   2101.000 -0.020          -0.021          -0.067    0.024   -0.021   -0.021  0.000              
## 1078  Minority CEO                              Financial performance                                 1   2.000   3126.000 -0.020  0.000   -0.020  0.000   -0.020   -0.020   -0.020   -0.020 -0.018  -3.340 0.001
## 1079  Minority CEO                              Firm risk taking                                      1   3.000   4476.000 -0.002  0.009   -0.002  0.009   -0.033    0.029   -0.014    0.010  0.049   2.830 0.005
## 1080  Minority CEO                              Firms Characteristics (Firm prestige)                 1   3.000   4476.000 -0.051  0.029   -0.051  0.029   -0.095   -0.008   -0.088   -0.014 -0.031  -1.886 0.059
## 1081  Minority CEO                              General performance                                   1   2.000   3126.000 -0.020  0.000   -0.020  0.000   -0.020   -0.020   -0.020   -0.020  0.030              
## 1082  Minority CEO                              Institution                                           1   1.000   1350.000 -0.050          -0.050          -0.103    0.003   -0.050   -0.050 -0.085              
## 1083  Minority CEO                              M                                                     1   2.000   3126.000  0.035  0.000    0.035  0.000    0.025    0.045    0.035    0.035  0.010              
## 1084  Minority CEO                              X                                                     1   1.000   1350.000  0.025           0.025          -0.028    0.078    0.025    0.025                     
## ─────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
#Describe(Contrast)
#Freq(Contrast[!(construct_y %in% values_to_remove)]$k)

4 CHECK

4.1 Variable check

Variables <- rbind(
  data.table(Structure = metadata$Xstructure),
  data.table(Structure = metadata$Ystructure)
)

Freq(Variables[grepl("Operational performance", Structure, ignore.case = TRUE)]$Structure)
## Frequency Statistics:
## ──────────────────────────────────────────────────────────────────────────────────────────
##                                                                                     N    %
## ──────────────────────────────────────────────────────────────────────────────────────────
## Operational performance#(change) R&Dt                                              14  0.3
## Operational performance#(change) R&Dt+1                                            14  0.3
## Operational performance#(change)R &D                                               13  0.3
## Operational performance#(change)R&D                                                14  0.3
## Operational performance#(CUSTSERV)it                                                4  0.1
## Operational performance#Acquirer R&D intensity                                     28  0.6
## Operational performance#Admissions                                                 11  0.2
## Operational performance#AQ1                                                        26  0.6
## Operational performance#AQ2                                                        13  0.3
## Operational performance#Average R&D Spending                                       11  0.2
## Operational performance#Brand                                                      13  0.3
## Operational performance#Breakthrough innovations                                   13  0.3
## Operational performance#CASE                                                        8  0.2
## Operational performance#Change in R&D                                              43  1.0
## Operational performance#Changes in R&Dt                                            15  0.3
## Operational performance#Commtech patents/patents                                   10  0.2
## Operational performance#Company R&D intensity                                      18  0.4
## Operational performance#Cost of Innovation                                         15  0.3
## Operational performance#Costumer complaints                                        35  0.8
## Operational performance#Customer satisfaction                                      13  0.3
## Operational performance#Customers (RDI)                                             8  0.2
## Operational performance#Customers evaluation                                        8  0.2
## Operational performance#DCASM                                                      22  0.5
## Operational performance#DCOMPL_CASM                                                22  0.5
## Operational performance#Degree of innovativeness                                   14  0.3
## Operational performance#DPEER_CASM                                                 22  0.5
## Operational performance#DR&D                                                       18  0.4
## Operational performance#DSEAT_CAP                                                  22  0.5
## Operational performance#DSTAGE_LENGTH                                              22  0.5
## Operational performance#DSUBS_CASM                                                 22  0.5
## Operational performance#Earlyrecall                                                13  0.3
## Operational performance#Exploitation                                               13  0.3
## Operational performance#Exploitative innovation                                    29  0.6
## Operational performance#Exploitative learning(EXPT)                                 5  0.1
## Operational performance#Exploitative NPI                                           10  0.2
## Operational performance#Exploitive innovation                                      14  0.3
## Operational performance#Exploration                                                13  0.3
## Operational performance#Explorative innovation                                     16  0.4
## Operational performance#Explorative learning(EXPR)                                  5  0.1
## Operational performance#Explorative NPI                                            10  0.2
## Operational performance#Exploratory innovation                                     25  0.6
## Operational performance#firm's research and development                            23  0.5
## Operational performance#Firm's tech. breadth                                       28  0.6
## Operational performance#Firm-customer relationship strengt                         16  0.4
## Operational performance#Firm-employee relationship strengt                         16  0.4
## Operational performance#Firm citations                                              9  0.2
## Operational performance#Firm innovation                                            14  0.3
## Operational performance#Firm innovative performance                                 9  0.2
## Operational performance#Firm innovativeness                                        11  0.2
## Operational performance#Firm Innovativeness                                         8  0.2
## Operational performance#Firm R&D intensity                                         80  1.8
## Operational performance#Firm R&D spend/revenue t-1                                 19  0.4
## Operational performance#Firm risk (R&D intensity)                                  26  0.6
## Operational performance#Firm risk taking                                           33  0.7
## Operational performance#Firm science orientation t-1                               19  0.4
## Operational performance#Firm?inventiveness                                         17  0.4
## Operational performance#Focal R&D Intensity                                         6  0.1
## Operational performance#Growth Opportunities                                       13  0.3
## Operational performance#Hazard                                                     13  0.3
## Operational performance#Idea Source                                                10  0.2
## Operational performance#Impact innovation                                          28  0.6
## Operational performance#Ind.R&D intensity                                           9  0.2
## Operational performance#Industry R&D intensity                                     43  1.0
## Operational performance#Industry R&D Intensity                                     14  0.3
## Operational performance#INNCOMM                                                    11  0.2
## Operational performance#Innovatio quantity                                         26  0.6
## Operational performance#Innovation differentiation                                 14  0.3
## Operational performance#Innovation Differentiation                                 15  0.3
## Operational performance#Innovation investment                                      10  0.2
## Operational performance#Innovation outcomes                                        15  0.3
## Operational performance#Innovation strategy                                        11  0.2
## Operational performance#Innovations,1992                                            9  0.2
## Operational performance#Innovations,1993                                            9  0.2
## Operational performance#Innovative performance                                     16  0.4
## Operational performance#Innovativeness                                             17  0.4
## Operational performance#Invention Resonanc                                          9  0.2
## Operational performance#Invention resonance                                        13  0.3
## Operational performance#Inventories                                                15  0.3
## Operational performance#Inventories Turnover                                       19  0.4
## Operational performance#INVERC                                                     19  0.4
## Operational performance#InvRec                                                     12  0.3
## Operational performance#INVREC                                                     23  0.5
## Operational performance#Labor costs                                                13  0.3
## Operational performance#Labor productivity                                          8  0.2
## Operational performance#Lag R&D intensity                                           8  0.2
## Operational performance#Launch of optical product                                  10  0.2
## Operational performance#Launch product (0 = no, 1 = yes)                            6  0.1
## Operational performance#Lead indicator strength                                    13  0.3
## Operational performance#Licensing                                                  13  0.3
## Operational performance#Like the Ad(AD)                                            11  0.2
## Operational performance#Like the Finn(FIR)                                         11  0.2
## Operational performance#Like the Product(PRD)                                      11  0.2
## Operational performance#Likeable(LK)                                               11  0.2
## Operational performance#Log (R&D expense)                                          27  0.6
## Operational performance#Log (total products)                                        9  0.2
## Operational performance#Log R&D expense                                            19  0.4
## Operational performance#logR&D                                                     17  0.4
## Operational performance#LOWCOST                                                    22  0.5
## Operational performance#New product                                                11  0.2
## Operational performance#New Product Development Process(NPD)                        9  0.2
## Operational performance#New Product Introduction(NPI)                               9  0.2
## Operational performance#New Product Introductions                                  13  0.3
## Operational performance#New product portfolio innovativeness                       11  0.2
## Operational performance#New products introduced                                     7  0.2
## Operational performance#Newness of innovation                                      14  0.3
## Operational performance#No. of  Customers                                           8  0.2
## Operational performance#Nonproduction overhead                                     17  0.4
## Operational performance#Number of commercialised R&D projects                       8  0.2
## Operational performance#Number of Patents                                           9  0.2
## Operational performance#Number of patents (log)                                    13  0.3
## Operational performance#Number of R&D projects                                      8  0.2
## Operational performance#Occupancy                                                  11  0.2
## Operational performance#Operational (total)                                        15  0.3
## Operational performance#Optical patents as a percentage of all patents             18  0.4
## Operational performance#Optical patents/patents                                    10  0.2
## Operational performance#Organizatiol innovatio                                      9  0.2
## Operational performance#Organizational innovation                                  12  0.3
## Operational performance#Organizational Innovation                                  10  0.2
## Operational performance#Patent stock (PS)                                          11  0.2
## Operational performance#Patent stocka                                              14  0.3
## Operational performance#Patents                                                    11  0.2
## Operational performance#Penetration rate (t-1)                                     17  0.4
## Operational performance#Perception of CRM benefits                                 15  0.3
## Operational performance#Persuasiveness of apology                                   5  0.1
## Operational performance#Post-succession R&D innovation                              9  0.2
## Operational performance#Pre-Bankruptcy R&D Ratio                                   12  0.3
## Operational performance#Pre-succession R&D innovation                               9  0.2
## Operational performance#Presample patent stock                                     15  0.3
## Operational performance#Previous?four?years' patents                               17  0.4
## Operational performance#Prior change in R&D                                        15  0.3
## Operational performance#Prior R&D                                                  28  0.6
## Operational performance#Prior R&D spending                                         18  0.4
## Operational performance#Product-Harm Crisis                                        13  0.3
## Operational performance#Product-service chang                                      11  0.2
## Operational performance#Product Clarity                                            10  0.2
## Operational performance#Product Innovation performance                             11  0.2
## Operational performance#Product innovativeness                                      9  0.2
## Operational performance#Product recall (binary)                                    18  0.4
## Operational performance#Product recalls (count)                                    18  0.4
## Operational performance#Product/customer performance                               13  0.3
## Operational performance#Productivity                                               11  0.2
## Operational performance#Products (number)                                          11  0.2
## Operational performance#Prodvalue                                                  13  0.3
## Operational performance#Proportion of Radical Innovations                          13  0.3
## Operational performance#R & D activity                                             23  0.5
## Operational performance#R & D Exp                                                  11  0.2
## Operational performance#R & D intensity                                            35  0.8
## Operational performance#R & D spending                                             13  0.3
## Operational performance#R&D                                                       197  4.4
## Operational performance#R&D-to-sales ratio                                         20  0.4
## Operational performance#R&D (RD)                                                   11  0.2
## Operational performance#R&D activity                                               13  0.3
## Operational performance#R&D and capital investment intensity                       20  0.4
## Operational performance#R&D Change                                                 17  0.4
## Operational performance#R&D Change / No. Employees                                 17  0.4
## Operational performance#R&D Change /Sales                                          17  0.4
## Operational performance#R&D exp/sales ratio t                                       9  0.2
## Operational performance#R&D expenditure                                            23  0.5
## Operational performance#R&D Expenditure (ln)                                       20  0.4
## Operational performance#R&D expenditures                                           39  0.9
## Operational performance#R&D Expenditures                                           27  0.6
## Operational performance#R&D expense (XRD)                                          21  0.5
## Operational performance#R&D expense to sales                                       12  0.3
## Operational performance#R&D expense1                                               17  0.4
## Operational performance#R&D expenses                                               16  0.4
## Operational performance#R&D IJV                                                    17  0.4
## Operational performance#R&D Inten.                                                 17  0.4
## Operational performance#R&D intensity                                             569 12.6
## Operational performance#R&D Intensity                                              99  2.2
## Operational performance#R&D intensity (%)                                          11  0.2
## Operational performance#R&D intensity (log)                                        15  0.3
## Operational performance#R&D intensity (R&D/assets)                                 16  0.4
## Operational performance#R&D intensity, RDInt(%)                                    18  0.4
## Operational performance#R&D investment                                             22  0.5
## Operational performance#R&D missing                                                64  1.4
## Operational performance#R&D ratio                                                  80  1.8
## Operational performance#R&D spending                                               42  0.9
## Operational performance#R&D spending (lagged)                                      24  0.5
## Operational performance#R&D spendingb                                              18  0.4
## Operational performance#r&d/Asset                                                   9  0.2
## Operational performance#R&D/sale                                                   13  0.3
## Operational performance#R&D/sales                                                  22  0.5
## Operational performance#R&D/Sales                                                  13  0.3
## Operational performance#R&D/total assets                                           15  0.3
## Operational performance#R&D?intensity                                              17  0.4
## Operational performance#R&Dt                                                       21  0.5
## Operational performance#RaD                                                        19  0.4
## Operational performance#Radical product innovation                                 13  0.3
## Operational performance#RD                                                        117  2.6
## Operational performance#RD_AQ                                                      26  0.6
## Operational performance#RD_SALES(t-1)                                              10  0.2
## Operational performance#RDEXP                                                      12  0.3
## Operational performance#RDint                                                      15  0.3
## Operational performance#RDintensity                                                20  0.4
## Operational performance#rdit                                                       12  0.3
## Operational performance#RDmissing                                                  20  0.4
## Operational performance#RDR                                                        11  0.2
## Operational performance#RDS                                                        14  0.3
## Operational performance#Recallexp                                                  13  0.3
## Operational performance#Relative R&D expenditure per employee                      18  0.4
## Operational performance#Research                                                   17  0.4
## Operational performance#Research & development                                     14  0.3
## Operational performance#Research and development (R&D)                             13  0.3
## Operational performance#Sales per Full-Time Employee                                8  0.2
## Operational performance#Sales/Employee Gap                                         14  0.3
## Operational performance#Satisfaction with company after apology                     5  0.1
## Operational performance#Science                                                    13  0.3
## Operational performance#Science-Based Research                                      9  0.2
## Operational performance#Science harvesting                                         13  0.3
## Operational performance#Star inventor recruitment                                  28  0.6
## Operational performance#Subscribers in large systems                                9  0.2
## Operational performance#T. since breakthrough innov.                               28  0.6
## Operational performance#Technological entry                                        14  0.3
## Operational performance#Technological innovation                                   30  0.7
## Operational performance#Technological kno                                          13  0.3
## Operational performance#Technological opportunity                                  14  0.3
## Operational performance#Technology innovation                                      10  0.2
## Operational performance#The number of new patent filing (Dependent variable)       13  0.3
## Operational performance#The ratio of research and development expenses to assets   15  0.3
## Operational performance#Tied-to Firm's R&D Intensit                                16  0.4
## Operational performance#U(ACSI)                                                    10  0.2
## Operational performance#Variable Costs to Sales                                    19  0.4
## ──────────────────────────────────────────────────────────────────────────────────────────
## Total N = 4,514
Freq(Variables[grepl("Demographic similarity", Structure, ignore.case = TRUE)]$Structure)
## Frequency Statistics:
## ───────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                                                                                                                   N   %
## ───────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## CEO social capital#Previous experience of:Demographic similarity to alters-Age                                                   17 1.3
## CEO social capital#Previous experience of:Demographic similarity to alters-Education                                             17 1.3
## CEO social capital#Previous experience of:Demographic similarity to alters-Functiol background                                   17 1.3
## CEO social capital#Receipt of social support from fellow board members for:Demographic similarity to alters-Age                  26 1.9
## CEO social capital#Receipt of social support from fellow board members for:Demographic similarity to alters-Education            26 1.9
## CEO social capital#Receipt of social support from fellow board members for:Demographic similarity to alters-Functiol background  26 1.9
## Demographic similarity (CEO VS TMT)#Absolute Value of Age Difference                                                             16 1.2
## Demographic similarity (CEO VS TMT)#Age dissimilarity                                                                            26 1.9
## Demographic similarity (CEO VS TMT)#Age eligibility                                                                              21 1.6
## Demographic similarity (CEO VS TMT)#Age similarity                                                                               32 2.4
## Demographic similarity (CEO VS TMT)#Age similarity (CEO)                                                                         17 1.3
## Demographic similarity (CEO VS TMT)#Background similarity (CEO)                                                                  17 1.3
## Demographic similarity (CEO VS TMT)#Board CEO experience diversity                                                               23 1.7
## Demographic similarity (CEO VS TMT)#CEO-CFO age difference (Log)?                                                                27 2.0
## Demographic similarity (CEO VS TMT)#CEO-CFO age difference?                                                                      23 1.7
## Demographic similarity (CEO VS TMT)#CEO-CFO same education level                                                                 27 2.0
## Demographic similarity (CEO VS TMT)#CEO-CFO same educational level                                                               23 1.7
## Demographic similarity (CEO VS TMT)#CEO-CFO same gender                                                                          27 2.0
## Demographic similarity (CEO VS TMT)#CEO-CFO same gender?                                                                         23 1.7
## Demographic similarity (CEO VS TMT)#CEO-executive demographic dissimilarity                                                       4 0.3
## Demographic similarity (CEO VS TMT)#CEO-TMT social similarity                                                                    29 2.2
## Demographic similarity (CEO VS TMT)#CEO similarity                                                                               13 1.0
## Demographic similarity (CEO VS TMT)#Change in affifitionsimilarity                                                               20 1.5
## Demographic similarity (CEO VS TMT)#Change in age similarity                                                                     20 1.5
## Demographic similarity (CEO VS TMT)#Change in backgroundsimilarity                                                               20 1.5
## Demographic similarity (CEO VS TMT)#Change in CEO-boardsimilarity                                                                17 1.3
## Demographic similarity (CEO VS TMT)#Change in cultural diversity                                                                 13 1.0
## Demographic similarity (CEO VS TMT)#Change in degree typesimilarity                                                              20 1.5
## Demographic similarity (CEO VS TMT)#Change in similarity:Multiple characteristics                                                20 1.5
## Demographic similarity (CEO VS TMT)#Demographic similarity to alters-Age                                                         26 1.9
## Demographic similarity (CEO VS TMT)#Demographic similarity to alters-Age?                                                        17 1.3
## Demographic similarity (CEO VS TMT)#Demographic similarity to alters-Education                                                   43 3.2
## Demographic similarity (CEO VS TMT)#Demographic similarity to alters-Functional background                                       43 3.2
## Demographic similarity (CEO VS TMT)#Dissimilarity                                                                                 7 0.5
## Demographic similarity (CEO VS TMT)#Dissimilarity in age                                                                         15 1.1
## Demographic similarity (CEO VS TMT)#Dissimilarity in gender                                                                      15 1.1
## Demographic similarity (CEO VS TMT)#Dissimilarity in informational demographics                                                  15 1.1
## Demographic similarity (CEO VS TMT)#Educational affiliationsimilarity                                                            15 1.1
## Demographic similarity (CEO VS TMT)#Educational background dissimilarity                                                         26 1.9
## Demographic similarity (CEO VS TMT)#Educational degree similarity                                                                15 1.1
## Demographic similarity (CEO VS TMT)#Eductional level similarity (CEO)                                                            17 1.3
## Demographic similarity (CEO VS TMT)#Functional background concentration                                                          12 0.9
## Demographic similarity (CEO VS TMT)#Functional background similarity                                                             17 1.3
## Demographic similarity (CEO VS TMT)#Functional backgroundsimilarity                                                              15 1.1
## Demographic similarity (CEO VS TMT)#Functional diversity CEO characteristics                                                     10 0.7
## Demographic similarity (CEO VS TMT)#Functional eligibility                                                                       21 1.6
## Demographic similarity (CEO VS TMT)#Functional heterogeneity                                                                     20 1.5
## Demographic similarity (CEO VS TMT)#High CEO/high chair, global                                                                  16 1.2
## Demographic similarity (CEO VS TMT)#High CEO/high chair, local                                                                   16 1.2
## Demographic similarity (CEO VS TMT)#High CEO/low chair, global                                                                   17 1.3
## Demographic similarity (CEO VS TMT)#High CEO/low chair, local                                                                    17 1.3
## Demographic similarity (CEO VS TMT)#Industry background similarity                                                               17 1.3
## Demographic similarity (CEO VS TMT)#Insider status similarity (CEO)                                                              17 1.3
## Demographic similarity (CEO VS TMT)#International background similarity                                                          17 1.3
## Demographic similarity (CEO VS TMT)#Low CEO/low chair, global                                                                    17 1.3
## Demographic similarity (CEO VS TMT)#Low CEO/low chair, local                                                                     17 1.3
## Demographic similarity (CEO VS TMT)#New director's demographic difference from the CEO                                           22 1.6
## Demographic similarity (CEO VS TMT)#New director's prior experience with other similar CEOs                                      22 1.6
## Demographic similarity (CEO VS TMT)#New director’s demographic difference from the CEO                                           26 1.9
## Demographic similarity (CEO VS TMT)#New directors' demographic difference from the CEO                                           28 2.1
## Demographic similarity (CEO VS TMT)#New directors' prior experience with other similar CEOs                                      28 2.1
## Demographic similarity (CEO VS TMT)#owners/chairper sons                                                                          7 0.5
## Demographic similarity (CEO VS TMT)#Similarity between focal manager and CEO on other demographic characteristics                16 1.2
## Demographic similarity (CEO VS TMT)#Similarity between focal manager and subordinate/peer on
## other demographic characteristics    22 1.6
## Demographic similarity (CEO VS TMT)#Similarityon multiple dimensions                                                             15 1.1
## Demographic similarity (CEO VS TMT)#Tenure eligibility                                                                           21 1.6
## X#Focal CEO’s demographic similarity to other CEOs                                                                               26 1.9
## ───────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Total N = 1,340
Freq(Variables[grepl("CEO Leadership behavior", Structure, ignore.case = TRUE)]$Structure)
## Frequency Statistics:
## ─────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                                                                                                                 N   %
## ─────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## CEO Leadership behavior#Articulates vision                                                                                     41 2.3
## CEO Leadership behavior#Articulating a visio                                                                                   16 0.9
## CEO Leadership behavior#Being authoritativ                                                                                     16 0.9
## CEO Leadership behavior#Being creative and                                                                                     16 0.9
## CEO Leadership behavior#Caring                                                                                                  7 0.4
## CEO Leadership behavior#CCV                                                                                                    21 1.2
## CEO Leadership behavior#CEO charisma                                                                                           58 3.2
## CEO Leadership behavior#CEO charismaa                                                                                           7 0.4
## CEO Leadership behavior#CEO charismatic leadership                                                                             21 1.2
## CEO Leadership behavior#CEO cooperative behaviour                                                                               9 0.5
## CEO Leadership behavior#CEO empowering leadership                                                                              39 2.2
## CEO Leadership behavior#CEO empowering leadership (CEO)                                                                         8 0.4
## CEO Leadership behavior#CEO entrepreneurial leadership                                                                          8 0.4
## CEO Leadership behavior#CEO ethical leadership                                                                                 24 1.3
## CEO Leadership behavior#CEO feedback seekin                                                                                     8 0.4
## CEO Leadership behavior#CEO Idealized Influence (II)                                                                            9 0.5
## CEO Leadership behavior#CEO Individualized Consideration (IC)                                                                   9 0.5
## CEO Leadership behavior#CEO ingratiatory behavior                                                                              17 0.9
## CEO Leadership behavior#CEO Inspirational Motivation (IM)                                                                       9 0.5
## CEO Leadership behavior#CEO intellectual stimulation                                                                           32 1.8
## CEO Leadership behavior#CEO Intellectual Stimulation (IS)                                                                       9 0.5
## CEO Leadership behavior#CEO participative lea                                                                                   8 0.4
## CEO Leadership behavior#CEO participative leadership                                                                           10 0.6
## CEO Leadership behavior#CEO relationship-focused behaviors(REL-CEO)                                                            15 0.8
## CEO Leadership behavior#CEO servant leadership                                                                                  7 0.4
## CEO Leadership behavior#CEO social-focused le                                                                                   8 0.4
## CEO Leadership behavior#CEO socialized charisma                                                                                20 1.1
## CEO Leadership behavior#CEO task-focused behaviors (TAS-CEO)                                                                   15 0.8
## CEO Leadership behavior#CEO task-focused lea                                                                                    8 0.4
## CEO Leadership behavior#CEO Transactional leadership                                                                           10 0.6
## CEO Leadership behavior#CEO transactional leadershipb                                                                          10 0.6
## CEO Leadership behavior#CEO transformatiol leadership                                                                          47 2.6
## CEO Leadership behavior#CEO Transformational                                                                                   12 0.7
## CEO Leadership behavior#CEO transformational leadership                                                                        75 4.1
## CEO Leadership behavior#CEO Transformational leadership                                                                        10 0.6
## CEO Leadership behavior#CEO Transformational leadership X  Environmental Dynamism                                              10 0.6
## CEO Leadership behavior#CEO transformational leadershipb                                                                       10 0.6
## CEO Leadership behavior#CEO vision articulatio                                                                                  8 0.4
## CEO Leadership behavior#Championing behaviors                                                                                   4 0.2
## CEO Leadership behavior#Change-oriented leadership                                                                             16 0.9
## CEO Leadership behavior#Charisma                                                                                               23 1.3
## CEO Leadership behavior#Contingent punishment                                                                                  41 2.3
## CEO Leadership behavior#Contingent reward                                                                                      64 3.5
## CEO Leadership behavior#Cost Leadership                                                                                        15 0.8
## CEO Leadership behavior#Creative leadersh                                                                                      13 0.7
## CEO Leadership behavior#Delegation: New investments                                                                             7 0.4
## CEO Leadership behavior#Delegation: Products/services                                                                           7 0.4
## CEO Leadership behavior#Dependable                                                                                             11 0.6
## CEO Leadership behavior#Empowering leadershi                                                                                    8 0.4
## CEO Leadership behavior#Empowerment                                                                                             9 0.5
## CEO Leadership behavior#Exemplary                                                                                              11 0.6
## CEO Leadership behavior#Fosters' e acceptance of                                                                               13 0.7
## CEO Leadership behavior#Fosters the acceptance of gro                                                                          14 0.8
## CEO Leadership behavior#Fosters the acceptance of group goals                                                                  14 0.8
## CEO Leadership behavior#GlobalAmbitions                                                                                        11 0.6
## CEO Leadership behavior#High performance                                                                                       13 0.7
## CEO Leadership behavior#High performance expectatio                                                                            14 0.8
## CEO Leadership behavior#High performance expectations                                                                          14 0.8
## CEO Leadership behavior#Idealized influence (II)                                                                               11 0.6
## CEO Leadership behavior#individualized consideration                                                                           17 0.9
## CEO Leadership behavior#Inspirational motivation (IM)                                                                          11 0.6
## CEO Leadership behavior#intellectual stimulation                                                                               17 0.9
## CEO Leadership behavior#Intellectual stimulation                                                                               41 2.3
## CEO Leadership behavior#Intellectual stimulation (IS)                                                                          11 0.6
## CEO Leadership behavior#Laissez-faire leadership                                                                                8 0.4
## CEO Leadership behavior#Low cost leadership                                                                                    14 0.8
## CEO Leadership behavior#Mentoring of lower-level managers                                                                      25 1.4
## CEO Leadership behavior#Mentoring to subordinates                                                                              25 1.4
## CEO Leadership behavior#Monitoring                                                                                             21 1.2
## CEO Leadership behavior#Monitoring opera Control variables                                                                     16 0.9
## CEO Leadership behavior#Monitotoring                                                                                           12 0.7
## CEO Leadership behavior#Naming wrongdoing                                                                                      28 1.5
## CEO Leadership behavior#Operational leadersh                                                                                   13 0.7
## CEO Leadership behavior#Opportunity Sensing                                                                                    11 0.6
## CEO Leadership behavior#People centric                                                                                         11 0.6
## CEO Leadership behavior#Perceived Supervisor Support                                                                            7 0.4
## CEO Leadership behavior#Provide individual support                                                                             13 0.7
## CEO Leadership behavior#Provides an appropriate role                                                                           27 1.5
## CEO Leadership behavior#Provides individual support                                                                            28 1.5
## CEO Leadership behavior#Providing encouragement to lower-level managers                                                        25 1.4
## CEO Leadership behavior#Provision of social support                                                                            17 0.9
## CEO Leadership behavior#Receipt of social support from fellow board members for:Mentoring of lower-level magers                25 1.4
## CEO Leadership behavior#Receipt of social support from fellow board members for:Providing encouragement to lower-level magers  25 1.4
## CEO Leadership behavior#Receipt of social support from fellow board members for:Seeking information from lower-level magers    25 1.4
## CEO Leadership behavior#Receipt of social support from fellow board members for:Seeking input from lower-level magers          25 1.4
## CEO Leadership behavior#Relating and commu                                                                                     16 0.9
## CEO Leadership behavior#Relational leadership                                                                                  13 0.7
## CEO Leadership behavior#Sales & marketing appt                                                                                 14 0.8
## CEO Leadership behavior#Seeking information from lower-level managers                                                          25 1.4
## CEO Leadership behavior#Seeking input from lower-level managers                                                                25 1.4
## CEO Leadership behavior#Servant leadership                                                                                     10 0.6
## CEO Leadership behavior#Showing benevole                                                                                        7 0.4
## CEO Leadership behavior#SM                                                                                                     13 0.7
## CEO Leadership behavior#Strategy presentations (SP)                                                                            21 1.2
## CEO Leadership behavior#Task-oriented                                                                                           7 0.4
## CEO Leadership behavior#Task leadership                                                                                         8 0.4
## CEO Leadership behavior#TFL climate                                                                                             8 0.4
## CEO Leadership behavior#Transactional                                                                                           6 0.3
## CEO Leadership behavior#Transactional leadership                                                                               31 1.7
## CEO Leadership behavior#Transformatiol leadership                                                                              15 0.8
## CEO Leadership behavior#Transformational                                                                                        6 0.3
## CEO Leadership behavior#Transformational leadership                                                                            44 2.4
## CEO Leadership behavior#Vision Breadth                                                                                         10 0.6
## CEO Leadership behavior#Visionary                                                                                              11 0.6
## CEO Leadership behavior#Visionary leadership                                                                                    8 0.4
## CEO Leadership behavior#Words                                                                                                  13 0.7
## ─────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Total N = 1,809
Freq(Variables[grepl("CEO social capital", Structure, ignore.case = TRUE)]$Structure)
## Frequency Statistics:
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                                                                                                                    N   %
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## CEO social capital#% directors active CEOs                                                                                         9 0.3
## CEO social capital#Appointment of outsiders                                                                                       15 0.5
## CEO social capital#BETWEENNESS                                                                                                    29 0.9
## CEO social capital#BETWEENNESS_RANK                                                                                               29 0.9
## CEO social capital#BUSYCEO                                                                                                        11 0.3
## CEO social capital#CAC40 Directorships                                                                                             6 0.2
## CEO social capital#CEO's cumulative public board experience                                                                       19 0.6
## CEO social capital#CEO's current public board experience                                                                          19 0.6
## CEO social capital#CEO affiliation with family owner                                                                              17 0.5
## CEO social capital#CEO bonding social capital                                                                                     11 0.3
## CEO social capital#CEO bridging social capital                                                                                    11 0.3
## CEO social capital#CEO central political connections                                                                              17 0.5
## CEO social capital#CEO Civic Engagement                                                                                           12 0.4
## CEO social capital#CEO CPPCC                                                                                                      13 0.4
## CEO social capital#CEO external directorships                                                                                     13 0.4
## CEO social capital#CEO external network                                                                                           19 0.6
## CEO social capital#CEO friendship ties to top magers at other firms                                                               23 0.7
## CEO social capital#CEO Network                                                                                                    12 0.4
## CEO social capital#CEO network extensiveness                                                                                      11 0.3
## CEO social capital#CEO NPC                                                                                                        13 0.4
## CEO social capital#CEO Outside Directorates                                                                                       28 0.9
## CEO social capital#CEO outsider                                                                                                   21 0.7
## CEO social capital#CEO Outsider Status                                                                                            10 0.3
## CEO social capital#CEO PolCon                                                                                                     15 0.5
## CEO social capital#CEO Political Connectedness                                                                                    21 0.7
## CEO social capital#CEO political connection                                                                                       18 0.6
## CEO social capital#CEO political connections                                                                                      17 0.5
## CEO social capital#CEO regional political connections                                                                             17 0.5
## CEO social capital#CEO social identification with the informal support group                                                      34 1.1
## CEO social capital#CEO status, global                                                                                             17 0.5
## CEO social capital#CEO with government ties                                                                                        8 0.2
## CEO social capital#CEO_POLITICAL                                                                                                   8 0.2
## CEO social capital#CEOBSEATS                                                                                                      16 0.5
## CEO social capital#CEOs' political connections(POCN)                                                                              14 0.4
## CEO social capital#CEOs with politicalties                                                                                        19 0.6
## CEO social capital#CEOTIES                                                                                                        20 0.6
## CEO social capital#CEO鈥檚 social status in the corporate elite                                                                   26 0.8
## CEO social capital#Chamber of Commerce                                                                                            15 0.5
## CEO social capital#CLOSENESS                                                                                                      29 0.9
## CEO social capital#CLOSENESS_RANK                                                                                                 29 0.9
## CEO social capital#COMPOSITE                                                                                                      29 0.9
## CEO social capital#COMPOSITE_RANK                                                                                                 29 0.9
## CEO social capital#DEGREE                                                                                                         29 0.9
## CEO social capital#Degree Centrality                                                                                              13 0.4
## CEO social capital#DEGREE_RANK                                                                                                    29 0.9
## CEO social capital#EIGENVECTOR                                                                                                    29 0.9
## CEO social capital#EIGENVECTOR_RANK                                                                                               29 0.9
## CEO social capital#Existence of political connections                                                                             10 0.3
## CEO social capital#Financial wealth                                                                                               35 1.1
## CEO social capital#Focal and other CEOs' prior ties                                                                               50 1.6
## CEO social capital#Focal and other CEOs in the same state                                                                         50 1.6
## CEO social capital#Focal CEO's similarity to departing directors                                                                  28 0.9
## CEO social capital#Focal CEO's similarity to other CEOs tied to departing directors                                               28 0.9
## CEO social capital#Focal CEO and new director's prior ties                                                                        50 1.6
## CEO social capital#Focus on outside industry ties                                                                                 16 0.5
## CEO social capital#Focus on political ties                                                                                        16 0.5
## CEO social capital#Fortune directorships                                                                                          11 0.3
## CEO social capital#Fortune Directorships                                                                                          13 0.4
## CEO social capital#Friends with higher social status                                                                              35 1.1
## CEO social capital#Friendship ties to potential ingratiators                                                                      26 0.8
## CEO social capital#Health problem of loved one                                                                                    26 0.8
## CEO social capital#International affiliations                                                                                     15 0.5
## CEO social capital#Lack of friendship tie                                                                                         26 0.8
## CEO social capital#Level of CEO-initiated social interaction with low-status alters                                               26 0.8
## CEO social capital#Level of non-CEO-initiated social inter. With low-status alters                                                26 0.8
## CEO social capital#Long-distance CEO golf                                                                                         18 0.6
## CEO social capital#Managerial tie utilizatio                                                                                      18 0.6
## CEO social capital#Member of elite social club                                                                                    26 0.8
## CEO social capital#Networking                                                                                                     17 0.5
## CEO social capital#New CEO external directorships                                                                                 23 0.7
## CEO social capital#New director’s informal ties to the CEO                                                                        26 0.8
## CEO social capital#New director’s private board ties to the CEO                                                                   26 0.8
## CEO social capital#New director’s public board ties to the CEO                                                                    26 0.8
## CEO social capital#NOFO                                                                                                           19 0.6
## CEO social capital#Official                                                                                                       12 0.4
## CEO social capital#Other CEOs’ informal ties to the CEO                                                                           26 0.8
## CEO social capital#Other CEOs’ private board ties to the CEO                                                                      26 0.8
## CEO social capital#Other CEOs’ public board ties to the CEO                                                                       26 0.8
## CEO social capital#OTHERBOARDS                                                                                                    17 0.5
## CEO social capital#Participation in social activities                                                                             14 0.4
## CEO social capital#PolconCEO                                                                                                      23 0.7
## CEO social capital#Political affiliation level                                                                                    13 0.4
## CEO social capital#Political connectedness                                                                                        19 0.6
## CEO social capital#Political connectedness(PC)                                                                                    10 0.3
## CEO social capital#Political_B                                                                                                    18 0.6
## CEO social capital#Political_N                                                                                                    18 0.6
## CEO social capital#Politically appointed CEO                                                                                      32 1.0
## CEO social capital#Previous experience of:Common board appointments                                                               17 0.5
## CEO social capital#Previous experience of:Demographic similarity to alters-Age                                                    17 0.5
## CEO social capital#Previous experience of:Demographic similarity to alters-Education                                              17 0.5
## CEO social capital#Previous experience of:Demographic similarity to alters-Functiol background                                    17 0.5
## CEO social capital#Previous experience of:Health problem of loved one                                                             34 1.1
## CEO social capital#Previous experience of:Number of informal support group members experiencing problems                          17 0.5
## CEO social capital#Previous experience of:Number of persol problems of fellow directors known to CEO                              17 0.5
## CEO social capital#Previous experience of:Previous experience of:Strained marital relationship                                    17 0.5
## CEO social capital#Previous experience of:Provision of social support                                                             17 0.5
## CEO social capital#Previous experience of:Receipt of strategic advice from fellow directors                                       17 0.5
## CEO social capital#Previous experience of:Social interaction with alters                                                          17 0.5
## CEO social capital#Previous experience of:Strained marital relationship                                                           17 0.5
## CEO social capital#Previous experience of:Strained relation with child                                                            17 0.5
## CEO social capital#Previous experience of:Strained relationship with child                                                        17 0.5
## CEO social capital#Previous experience of:Strength of persol tie to alters                                                        17 0.5
## CEO social capital#Prior Executive Employers                                                                                      21 0.7
## CEO social capital#Prior identification with corporate elite                                                                      26 0.8
## CEO social capital#Profitability of Linked Firms                                                                                  13 0.4
## CEO social capital#quality                                                                                                         2 0.1
## CEO social capital#Quality                                                                                                        12 0.4
## CEO social capital#Quantity of strategic help provided                                                                            26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Demographic similarity to alters-Age                   26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Demographic similarity to alters-Education             26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Demographic similarity to alters-Functiol background   26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Health problem of loved one                            26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Social interaction with alters                         26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Social support from family members                     26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Social support from persol friends                     26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Soliciting advice and counsel from outside directorsc  22 0.7
## CEO social capital#Receipt of social support from fellow board members for:Strained marital relationship                          26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Strained relationship with child                       26 0.8
## CEO social capital#Receipt of social support from fellow board members for:Strength of persol tie to alters                       26 0.8
## CEO social capital#Receipt of social support from informal support group members for:Health problem of loved one                  26 0.8
## CEO social capital#Receipt of social support from informal support group members for:Strained marital relationship                26 0.8
## CEO social capital#Receipt of social support from informal support group members for:Strained relationship with child             26 0.8
## CEO social capital#Regional industry supply of CEO resources                                                                      11 0.3
## CEO social capital#Residence in Major City                                                                                        21 0.7
## CEO social capital#Social capital(t-1)                                                                                            13 0.4
## CEO social capital#Social identification with the corporate elite                                                                 34 1.1
## CEO social capital#Social infuence                                                                                                17 0.5
## CEO social capital#Social interaction between top manager and subordinate/peer                                                    27 0.8
## CEO social capital#Social interaction ties(ST_CP)                                                                                  5 0.2
## CEO social capital#Social interaction with alters                                                                                 43 1.3
## CEO social capital#Social similarity                                                                                              17 0.5
## CEO social capital#Social status                                                                                                  35 1.1
## CEO social capital#Social support from family members                                                                             26 0.8
## CEO social capital#Social support from personal friends                                                                           26 0.8
## CEO social capital#Social ties                                                                                                     9 0.3
## CEO social capital#Soliciting advice and counsel from outside directors(c)                                                        22 0.7
## CEO social capital#Solidarity                                                                                                     18 0.6
## CEO social capital#Status index                                                                                                   35 1.1
## CEO social capital#Status of firms tied to the CEO                                                                                47 1.5
## CEO social capital#Strained marital relationship                                                                                  26 0.8
## CEO social capital#Strained relationship with child                                                                               26 0.8
## CEO social capital#Strength of personal tie to alters                                                                             43 1.3
## CEO social capital#Strong ties                                                                                                    12 0.4
## CEO social capital#Successful entrepreneurial advisors in the inner circle                                                        11 0.3
## CEO social capital#Sum_outside- and inside-industry ties                                                                          16 0.5
## CEO social capital#Sum_political and business ties                                                                                16 0.5
## CEO social capital#Time since tie was broken                                                                                      21 0.7
## CEO social capital#Total appointments                                                                                             19 0.6
## CEO social capital#Total directorships                                                                                            11 0.3
## CEO social capital#Total Directorships                                                                                            34 1.1
## CEO social capital#Unsuccessful entrepreneurial advisors in the inner circle                                                      11 0.3
## CEO social capital#Weak nepotism                                                                                                  11 0.3
## CEO social capital#Weak ties                                                                                                      12 0.4
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Total N = 3,225
Freq(Variables[grepl("CEO self-concept", Structure, ignore.case = TRUE)]$Structure)
## Frequency Statistics:
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                                                                                                    N   %
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## CEO self-concept#Advice from:Executives who are friends                                                           23 0.4
## CEO self-concept#Advice from:Executives who are not friends                                                       23 0.4
## CEO self-concept#Advice from:Executives with different background                                                 23 0.4
## CEO self-concept#Advice from:Executives with same background                                                      23 0.4
## CEO self-concept#Advice seeking from non-friends                                                                  26 0.4
## CEO self-concept#Advice seeking from others with dissimilar backgrounds                                           26 0.4
## CEO self-concept#Advice seeking from:Magers in a different industry                                               14 0.2
## CEO self-concept#Advice seeking from:Magers in the same industry                                                  14 0.2
## CEO self-concept#Advice seeking from:Magers who are friends                                                       14 0.2
## CEO self-concept#Advice seeking from:Magers who are not friends                                                   14 0.2
## CEO self-concept#Advice seeking from:Magers with similar backgrounds                                              28 0.4
## CEO self-concept#Affect                                                                                            9 0.1
## CEO self-concept#Agreableness                                                                                     19 0.3
## CEO self-concept#Agreeableness                                                                                    58 0.9
## CEO self-concept#Ambiguity tolerance                                                                              36 0.6
## CEO self-concept#Anger emotlve state                                                                              14 0.2
## CEO self-concept#Assertive acclaiming (F1)                                                                        27 0.4
## CEO self-concept#Assertiveness                                                                                     9 0.1
## CEO self-concept#Attitude toward change                                                                           33 0.5
## CEO self-concept#Authenticity                                                                                     22 0.3
## CEO self-concept#Authoritative                                                                                     7 0.1
## CEO self-concept#Benevolence                                                                                      53 0.8
## CEO self-concept#CEO's empathy                                                                                     8 0.1
## CEO self-concept#CEO's external blame                                                                             13 0.2
## CEO self-concept#CEO's issue ambivalence(intensity  t _ 1)                                                        16 0.2
## CEO self-concept#CEO's issue ambivalence(similarity t _ 1)                                                        16 0.2
## CEO self-concept#CEO's overconfidence from option holding                                                          6 0.1
## CEO self-concept#CEO's photograph                                                                                  3 0.0
## CEO self-concept#CEO's Promotion focus predominance                                                               11 0.2
## CEO self-concept#CEO's risk orientation                                                                           16 0.2
## CEO self-concept#CEO's technological orientation                                                                  19 0.3
## CEO self-concept#CEO agg                                                                                          15 0.2
## CEO self-concept#CEO agreeableness                                                                                14 0.2
## CEO self-concept#CEO Approach Goal Orientation                                                                    11 0.2
## CEO self-concept#CEO attitude towards adoption of IT                                                               6 0.1
## CEO self-concept#CEO Avoidance Goal Orientation                                                                   11 0.2
## CEO self-concept#CEO burnout                                                                                      12 0.2
## CEO self-concept#CEO cognitive trust                                                                              11 0.2
## CEO self-concept#CEO collectivistic orientation                                                                   11 0.2
## CEO self-concept#CEO conscientiousness                                                                            14 0.2
## CEO self-concept#CEO conservatism                                                                                 33 0.5
## CEO self-concept#CEO CSQ                                                                                          15 0.2
## CEO self-concept#CEO debt sensitivity                                                                             12 0.2
## CEO self-concept#CEO delta/vega ratio                                                                             15 0.2
## CEO self-concept#CEO emotiol stability                                                                            14 0.2
## CEO self-concept#CEO emphasis on SHRM                                                                             10 0.2
## CEO self-concept#CEO endorsement                                                                                  14 0.2
## CEO self-concept#CEO EO                                                                                           14 0.2
## CEO self-concept#CEO extraversion                                                                                 33 0.5
## CEO self-concept#CEO future focus                                                                                 12 0.2
## CEO self-concept#CEO Future Focus                                                                                 27 0.4
## CEO self-concept#CEO goal importance-Customer service                                                             17 0.3
## CEO self-concept#CEO goal importance-Efficient operations                                                         17 0.3
## CEO self-concept#CEO goal importance-Employee relations                                                           17 0.3
## CEO self-concept#CEO goal importance-Financial                                                                    17 0.3
## CEO self-concept#CEO goal importance-Growing                                                                      17 0.3
## CEO self-concept#CEO goal importance-Improving image                                                              17 0.3
## CEO self-concept#CEO goal importance-New products                                                                 17 0.3
## CEO self-concept#CEO grandiose narcissism                                                                          9 0.1
## CEO self-concept#CEO hubris                                                                                      113 1.7
## CEO self-concept#CEO HUBRIS                                                                                       22 0.3
## CEO self-concept#CEO humility                                                                                     80 1.2
## CEO self-concept#CEO innovativeness                                                                                6 0.1
## CEO self-concept#CEO internal locus of control                                                                    12 0.2
## CEO self-concept#CEO Learning Goal Orientation                                                                    11 0.2
## CEO self-concept#CEO liberalism                                                                                   89 1.4
## CEO self-concept#CEO Liberalism                                                                                   31 0.5
## CEO self-concept#CEO locus of control                                                                              6 0.1
## CEO self-concept#CEO narcissism                                                                                  275 4.2
## CEO self-concept#CEO Narcissism                                                                                   27 0.4
## CEO self-concept#CEO narcissism (Resick)                                                                           6 0.1
## CEO self-concept#CEO openness                                                                                     14 0.2
## CEO self-concept#CEO openness to change                                                                            8 0.1
## CEO self-concept#CEO Organizatiol Identity                                                                        26 0.4
## CEO self-concept#CEO organizational identification                                                                64 1.0
## CEO self-concept#CEO overconfidence                                                                               34 0.5
## CEO self-concept#CEO overconfidence (equity purchase)                                                             14 0.2
## CEO self-concept#CEO overconfidence (investment)                                                                  14 0.2
## CEO self-concept#CEO overconfidence (options)                                                                     14 0.2
## CEO self-concept#CEO overconfidence_media                                                                         23 0.4
## CEO self-concept#CEO overconfidence_options                                                                       23 0.4
## CEO self-concept#CEO overconfidence_success                                                                       23 0.4
## CEO self-concept#CEO past focus                                                                                   12 0.2
## CEO self-concept#CEO Past Focus                                                                                   27 0.4
## CEO self-concept#CEO perceived HR capability                                                                       8 0.1
## CEO self-concept#CEO photograph-size                                                                               2 0.0
## CEO self-concept#CEO Political Orientation                                                                        23 0.4
## CEO self-concept#CEO present focus                                                                                12 0.2
## CEO self-concept#CEO Present Focus                                                                                27 0.4
## CEO self-concept#CEO prevention focus                                                                             16 0.2
## CEO self-concept#CEO Prevention Focus                                                                             14 0.2
## CEO self-concept#CEO prominence in annual reports                                                                  4 0.1
## CEO self-concept#CEO prominence in press releases                                                                  4 0.1
## CEO self-concept#CEO promotion focus                                                                              16 0.2
## CEO self-concept#CEO Promotion Focus                                                                              14 0.2
## CEO self-concept#CEO Provocativeness                                                                              25 0.4
## CEO self-concept#CEO rcissism                                                                                     56 0.9
## CEO self-concept#CEO relative cash compensation                                                                    4 0.1
## CEO self-concept#CEO relative non-cash compensation                                                                4 0.1
## CEO self-concept#CEO relative sensitivity                                                                         12 0.2
## CEO self-concept#CEO risk-taking propensity                                                                       11 0.2
## CEO self-concept#CEO risk propensity                                                                              11 0.2
## CEO self-concept#CEO satisfaction wit total compensation                                                           5 0.1
## CEO self-concept#CEO satisfaction with firm performance Moderator                                                  9 0.1
## CEO self-concept#CEO seeking of adviCe from board members                                                         23 0.4
## CEO self-concept#CEO self-enhancement                                                                             26 0.4
## CEO self-concept#CEO self-enhancing valuesb                                                                       10 0.2
## CEO self-concept#CEO self-transcendent valuesb                                                                    10 0.2
## CEO self-concept#CEO stock sensitivity                                                                            12 0.2
## CEO self-concept#CEO style                                                                                         9 0.1
## CEO self-concept#CEO Style:Outsider assessed                                                                       9 0.1
## CEO self-concept#CEO Style:Self-assessed                                                                           9 0.1
## CEO self-concept#CEO Submissiveness                                                                               25 0.4
## CEO self-concept#CEO vega                                                                                         70 1.1
## CEO self-concept#CEO Vega (standardized)                                                                          23 0.4
## CEO self-concept#CEO vulnerability                                                                                15 0.2
## CEO self-concept#CH                                                                                               11 0.2
## CEO self-concept#CHB                                                                                              11 0.2
## CEO self-concept#Cognitive complexity                                                                             13 0.2
## CEO self-concept#Commitment to the status quo                                                                     13 0.2
## CEO self-concept#Communicated vision                                                                              10 0.2
## CEO self-concept#Community Orientation                                                                            10 0.2
## CEO self-concept#Competency-based values                                                                           8 0.1
## CEO self-concept#COMPETITION                                                                                       8 0.1
## CEO self-concept#Confidence                                                                                       15 0.2
## CEO self-concept#CONFIDENCE                                                                                       12 0.2
## CEO self-concept#Conscientiousness                                                                                63 1.0
## CEO self-concept#Conservation (Q-sort)                                                                             7 0.1
## CEO self-concept#Conservation (Questionnaire)                                                                      7 0.1
## CEO self-concept#Core self-evaluat                                                                                18 0.3
## CEO self-concept#Core self-evaluation                                                                             13 0.2
## CEO self-concept#Core self-evaluations                                                                             9 0.1
## CEO self-concept#Core self_evaluation  (CEO)                                                                      10 0.2
## CEO self-concept#Corporate jet use                                                                                14 0.2
## CEO self-concept#COVER                                                                                             7 0.1
## CEO self-concept#Customer legitimacy                                                                              25 0.4
## CEO self-concept#Customer power                                                                                   25 0.4
## CEO self-concept#Customer salience                                                                                25 0.4
## CEO self-concept#Customer urgency                                                                                 25 0.4
## CEO self-concept#DC-follower                                                                                       8 0.1
## CEO self-concept#DC-self                                                                                           8 0.1
## CEO self-concept#Deal attitude                                                                                    19 0.3
## CEO self-concept#Degree PPM Fllowed                                                                                9 0.1
## CEO self-concept#dentification with he corporate elite                                                            17 0.3
## CEO self-concept#Did well compared to others (1-100)                                                              12 0.2
## CEO self-concept#Disgust emotive state                                                                            14 0.2
## CEO self-concept#Economic                                                                                         15 0.2
## CEO self-concept#Emotional stabilit                                                                               15 0.2
## CEO self-concept#Emotional stability                                                                              61 0.9
## CEO self-concept#Empathy                                                                                          28 0.4
## CEO self-concept#Emphasis on Innovation                                                                           18 0.3
## CEO self-concept#ESE                                                                                              11 0.2
## CEO self-concept#Exclusive                                                                                        15 0.2
## CEO self-concept#Expectation                                                                                      12 0.2
## CEO self-concept#External advice contacts                                                                         11 0.2
## CEO self-concept#Extraversion                                                                                     85 1.3
## CEO self-concept#Fear emotive state                                                                               14 0.2
## CEO self-concept#Firm-specific LOC                                                                                 8 0.1
## CEO self-concept#Flexibility                                                                                       8 0.1
## CEO self-concept#Focus on opportunities                                                                           10 0.2
## CEO self-concept#Goal congruence                                                                                  10 0.2
## CEO self-concept#Goal of power                                                                                    11 0.2
## CEO self-concept#Goal of reputation                                                                               11 0.2
## CEO self-concept#Goals                                                                                            10 0.2
## CEO self-concept#Growth orientation                                                                               19 0.3
## CEO self-concept#Happiness emotive state                                                                          14 0.2
## CEO self-concept#Hedonistic                                                                                       15 0.2
## CEO self-concept#HEXACO honesty-humility (1-7)                                                                    12 0.2
## CEO self-concept#HighNarc                                                                                         23 0.4
## CEO self-concept#Holder 67                                                                                        24 0.4
## CEO self-concept#HOLDER67                                                                                         10 0.2
## CEO self-concept#Hope                                                                                              4 0.1
## CEO self-concept#Hubris factor                                                                                    19 0.3
## CEO self-concept#Identification with alter's organization                                                         26 0.4
## CEO self-concept#Identification with corporate elite                                                              26 0.4
## CEO self-concept#Identification with focal organization                                                           26 0.4
## CEO self-concept#Identity strength                                                                                 8 0.1
## CEO self-concept#Importance of ethics and social responsibility                                                    6 0.1
## CEO self-concept#Impression management                                                                            37 0.6
## CEO self-concept#Incoming OI                                                                                      24 0.4
## CEO self-concept#Incumbent CEO fWHR                                                                               28 0.4
## CEO self-concept#Incumbent CEO smile                                                                              28 0.4
## CEO self-concept#Incumbent integrity                                                                              28 0.4
## CEO self-concept#Incumbent trustworthiness                                                                        28 0.4
## CEO self-concept#Information-gathering style                                                                      10 0.2
## CEO self-concept#Information evaluation style                                                                     10 0.2
## CEO self-concept#Inhibition                                                                                       15 0.2
## CEO self-concept#Integrity                                                                                        24 0.4
## CEO self-concept#Integrity(INT)                                                                                   11 0.2
## CEO self-concept#Internall Control                                                                                10 0.2
## CEO self-concept#International responsibility                                                                     10 0.2
## CEO self-concept#Investment                                                                                       10 0.2
## CEO self-concept#Job Conflict                                                                                      8 0.1
## CEO self-concept#Job engagement                                                                                   11 0.2
## CEO self-concept#Job Satisfaction                                                                                  8 0.1
## CEO self-concept#Job satisfaction (JS)                                                                            15 0.2
## CEO self-concept#Knowledgeable(KN)                                                                                11 0.2
## CEO self-concept#Leader Accomplishment                                                                             5 0.1
## CEO self-concept#Letter agg                                                                                       15 0.2
## CEO self-concept#Life Satisfaction                                                                                 8 0.1
## CEO self-concept#Lines biography                                                                                  14 0.2
## CEO self-concept#LinkedIn                                                                                          8 0.1
## CEO self-concept#Locus of control                                                                                 34 0.5
## CEO self-concept#Locus_of_control                                                                                 10 0.2
## CEO self-concept#Logic-based rationalizing (F3)                                                                   27 0.4
## CEO self-concept#Longholder                                                                                       35 0.5
## CEO self-concept#Loss of control                                                                                  23 0.4
## CEO self-concept#Mager profile                                                                                     6 0.1
## CEO self-concept#Managerial attention                                                                             19 0.3
## CEO self-concept#Managerial attention at beginning of tenure                                                      19 0.3
## CEO self-concept#Mediabased Ceo Overconfidence                                                                    18 0.3
## CEO self-concept#mediabased CEO overconfidence, CEO_Over                                                          18 0.3
## CEO self-concept#Moral judgment competence (MJT)                                                                  35 0.5
## CEO self-concept#Morality-based values                                                                             8 0.1
## CEO self-concept#NAR                                                                                              10 0.2
## CEO self-concept#Narcissism                                                                                       44 0.7
## CEO self-concept#NARCISSISM                                                                                       23 0.4
## CEO self-concept#Narcissism (NPI-16)                                                                              12 0.2
## CEO self-concept#Narcissism (Resick-8)                                                                            12 0.2
## CEO self-concept#NarcScore                                                                                        23 0.4
## CEO self-concept#need for achievement                                                                             11 0.2
## CEO self-concept#Need for achievement                                                                             33 0.5
## CEO self-concept#Need for cognitive closure                                                                       11 0.2
## CEO self-concept#Negative affect                                                                                  25 0.4
## CEO self-concept#Negative stress (0-4)                                                                            10 0.2
## CEO self-concept#Net Buyer                                                                                        24 0.4
## CEO self-concept#NETBUYER                                                                                         30 0.5
## CEO self-concept#Nonwork Conflict                                                                                  8 0.1
## CEO self-concept#Nonwork Satisfaction                                                                              8 0.1
## CEO self-concept#Normalized commtech words                                                                        10 0.2
## CEO self-concept#Normalized count of optics-related words                                                         18 0.3
## CEO self-concept#Normalized optical words                                                                         10 0.2
## CEO self-concept#Normalized telecom words                                                                         10 0.2
## CEO self-concept#noVision                                                                                          9 0.1
## CEO self-concept#Number of articles                                                                               23 0.4
## CEO self-concept#Number of donations by the CEO                                                                   26 0.4
## CEO self-concept#OC                                                                                               27 0.4
## CEO self-concept#OC_CJRS(t-1)                                                                                     16 0.2
## CEO self-concept#OC_MSZt-1                                                                                        16 0.2
## CEO self-concept#OC_SZ(t-1)                                                                                       16 0.2
## CEO self-concept#OCFACTOR                                                                                         10 0.2
## CEO self-concept#Openness                                                                                         25 0.4
## CEO self-concept#Openness experience                                                                              10 0.2
## CEO self-concept#Openness to change (Q-sort)                                                                       7 0.1
## CEO self-concept#Openness to change (Questionnaire)                                                                7 0.1
## CEO self-concept#Openness to experience                                                                           16 0.2
## CEO self-concept#Openness to experiences                                                                          19 0.3
## CEO self-concept#Openness Values                                                                                  14 0.2
## CEO self-concept#OPT                                                                                              11 0.2
## CEO self-concept#OPTDELAY                                                                                         10 0.2
## CEO self-concept#OPTDELAY_NEGRET                                                                                  10 0.2
## CEO self-concept#Optimism                                                                                         39 0.6
## CEO self-concept#Organizational identification                                                                    45 0.7
## CEO self-concept#orientation                                                                                      15 0.2
## CEO self-concept#Outgoing OI                                                                                      24 0.4
## CEO self-concept#Outsider Awareness                                                                                9 0.1
## CEO self-concept#Overall Stress                                                                                    8 0.1
## CEO self-concept#Overcofidence (Options)                                                                          13 0.2
## CEO self-concept#Overcofidence (Press)                                                                            13 0.2
## CEO self-concept#Overconfidence                                                                                   23 0.4
## CEO self-concept#Overconfidence (OC)                                                                              23 0.4
## CEO self-concept#OVERCONFIDENT                                                                                    23 0.4
## CEO self-concept#Passion                                                                                          10 0.2
## CEO self-concept#Past                                                                                             15 0.2
## CEO self-concept#Perceived Risk                                                                                   10 0.2
## CEO self-concept#Performance orientation                                                                          50 0.8
## CEO self-concept#Perseverance                                                                                      8 0.1
## CEO self-concept#Personal mastery                                                                                 12 0.2
## CEO self-concept#Personal responsibility                                                                          28 0.4
## CEO self-concept#Personal values                                                                                   8 0.1
## CEO self-concept#Personality: Agreeableness                                                                       19 0.3
## CEO self-concept#Personality: Conscientiousness                                                                   19 0.3
## CEO self-concept#Personality: extraversion                                                                        19 0.3
## CEO self-concept#Personality: Neuroticism                                                                         19 0.3
## CEO self-concept#Personality: Openness                                                                            19 0.3
## CEO self-concept#Photograph                                                                                       14 0.2
## CEO self-concept#Planning Hours                                                                                    9 0.1
## CEO self-concept#Positive affect                                                                                  25 0.4
## CEO self-concept#Positive stress (0-4)                                                                            10 0.2
## CEO self-concept#Potential ingratiators鈥?perception of focal CEO鈥檚 strategic judgment and leadership ability   26 0.4
## CEO self-concept#Prevention Focus                                                                                  9 0.1
## CEO self-concept#Prior advice from:Executives who are friends                                                     23 0.4
## CEO self-concept#Prior advice from:Executives who are not friends                                                 23 0.4
## CEO self-concept#Prior advice from:Executives with different background                                           23 0.4
## CEO self-concept#Prior advice from:Executives with same background                                                23 0.4
## CEO self-concept#Prior CEO organizational identification                                                          17 0.3
## CEO self-concept#Prior CEO Political Orientation                                                                  23 0.4
## CEO self-concept#Prior optimism                                                                                   23 0.4
## CEO self-concept#Profit Orientation                                                                                9 0.1
## CEO self-concept#Promotion Focus                                                                                   9 0.1
## CEO self-concept#Psychological capital                                                                            12 0.2
## CEO self-concept#Publicity                                                                                        14 0.2
## CEO self-concept#Quote agg                                                                                        15 0.2
## CEO self-concept#Rank growth                                                                                      23 0.4
## CEO self-concept#Rank liquidity                                                                                   23 0.4
## CEO self-concept#Rank ROA                                                                                         23 0.4
## CEO self-concept#Relative non-cash compensation                                                                    3 0.0
## CEO self-concept#Relative non-cash pay                                                                             2 0.0
## CEO self-concept#Republican CEO                                                                                    3 0.0
## CEO self-concept#Resiliency                                                                                        4 0.1
## CEO self-concept#Risk-taking                                                                                      31 0.5
## CEO self-concept#Risk-taking spending                                                                             26 0.4
## CEO self-concept#Risk attitude                                                                                    11 0.2
## CEO self-concept#Risk background                                                                                  13 0.2
## CEO self-concept#Risk taking                                                                                       9 0.1
## CEO self-concept#Risk Tolerance Metric                                                                            17 0.3
## CEO self-concept#Risks Reduced                                                                                    10 0.2
## CEO self-concept#Role conflict (1-5)                                                                              10 0.2
## CEO self-concept#Role of IT                                                                                       17 0.3
## CEO self-concept#Role titles                                                                                      14 0.2
## CEO self-concept#Rotter scores                                                                                     8 0.1
## CEO self-concept#Sadness emotive state                                                                            14 0.2
## CEO self-concept#SD-impression management                                                                         13 0.2
## CEO self-concept#SD self-deception                                                                                13 0.2
## CEO self-concept#Security                                                                                         29 0.4
## CEO self-concept#Self-deception                                                                                   37 0.6
## CEO self-concept#Self-direction                                                                                   19 0.3
## CEO self-concept#Self-efficacy                                                                                    16 0.2
## CEO self-concept#Self-enhancing                                                                                    9 0.1
## CEO self-concept#Self-enhancing values (Q-sort)                                                                    7 0.1
## CEO self-concept#Self-enhancing values (Questionnaire)                                                             7 0.1
## CEO self-concept#Self-presentation                                                                                24 0.4
## CEO self-concept#Self-transcendent values (Q-sort)                                                                 7 0.1
## CEO self-concept#Self-transcendent values (Questionnairec)                                                         7 0.1
## CEO self-concept#Self-transcending                                                                                 9 0.1
## CEO self-concept#Shared vision                                                                                    12 0.2
## CEO self-concept#Shared vision(CG_CP)                                                                              5 0.1
## CEO self-concept#Showing benevole                                                                                  9 0.1
## CEO self-concept#SIGSIZEt                                                                                          7 0.1
## CEO self-concept#Social desirability                                                                              12 0.2
## CEO self-concept#Social support (1-5)                                                                             10 0.2
## CEO self-concept#Social values                                                                                    14 0.2
## CEO self-concept#Socioemotional wealth                                                                             8 0.1
## CEO self-concept#Status                                                                                           15 0.2
## CEO self-concept#Status of firms tied to the CEO                                                                  25 0.4
## CEO self-concept#Subordination of ethics and social responsibility                                                 5 0.1
## CEO self-concept#Subprime Lending Specialist                                                                      28 0.4
## CEO self-concept#Successor CEO fWHR                                                                               28 0.4
## CEO self-concept#Successor CEO smile                                                                              28 0.4
## CEO self-concept#Successor integrity                                                                              28 0.4
## CEO self-concept#Successor trustworthiness                                                                        28 0.4
## CEO self-concept#Surprise emotive state                                                                           14 0.2
## CEO self-concept#Temporal orientation                                                                             14 0.2
## CEO self-concept#Tenacity                                                                                         10 0.2
## CEO self-concept#Throughput-oriented successor                                                                    27 0.4
## CEO self-concept#Throughput orientation                                                                           11 0.2
## CEO self-concept#Tolerance for Ambiguity                                                                           6 0.1
## CEO self-concept#Type A                                                                                           23 0.4
## CEO self-concept#Use of first-person singular pronouns                                                             4 0.1
## CEO self-concept#Values,Aupperle                                                                                  42 0.6
## CEO self-concept#Values,Rokeach                                                                                   42 0.6
## CEO self-concept#Well Known(WK)                                                                                   11 0.2
## CEO self-concept#Work overload (1-5)                                                                              10 0.2
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Total N = 6,522

4.2 Direction check

4.2.1 Reverse coding

Freq(metadata[Xreverse==-1]$Xr)
## Frequency Statistics:
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                                                                                                             N    %
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Board power#NON-INDEP-OUTS#-1                                                                                               1  0.1
## Board power#Nonheir inside directors#-1                                                                                    10  0.8
## CEO duality#CEO/board chair separation#-1                                                                                   9  0.7
## CEO duality#Nonduality#-1                                                                                                  19  1.5
## CEO duality#Separate CEO and BCP roles#-1                                                                                   2  0.2
## CEO duality#Separate CEO and board chair positions#-1                                                                       2  0.2
## CEO long-term incentive pay#Fixed pay percentage#-1                                                                         8  0.7
## CEO managerial ability#CEO incapacitation#-1                                                                               19  1.5
## CEO power#CEO is Employed#-1                                                                                                6  0.5
## CEO power#Non-CEO exe. own.#-1                                                                                             17  1.4
## CEO power#Non-CEO executive ownership#-1                                                                                    7  0.6
## CEO power#Presence of a Separate COO/President#-1                                                                           2  0.2
## CEO power#Separate COO(t+n-1)#-1                                                                                         10  0.8
## CEO power#Shared power#-1                                                                                                  13  1.1
## CEO social capital#Health problem of loved one#-1                                                                           2  0.2
## CEO social capital#Previous experience of:Health problem of loved one#-1                                                   17  1.4
## CEO social capital#Previous experience of:Number of persol problems of fellow directors known to CEO#-1                    16  1.3
## CEO social capital#Previous experience of:Previous experience of:Strained marital relationship#-1                           2  0.2
## CEO social capital#Previous experience of:Strained marital relationship#-1                                                 11  0.9
## CEO social capital#Previous experience of:Strained relation with child#-1                                                  12  1.0
## CEO social capital#Previous experience of:Strained relationship with child#-1                                               3  0.2
## CEO social capital#Receipt of social support from fellow board members for:Health problem of loved one#-1                   8  0.7
## CEO social capital#Receipt of social support from fellow board members for:Strained marital relationship#-1                 6  0.5
## CEO social capital#Receipt of social support from fellow board members for:Strained relationship with child#-1              7  0.6
## CEO social capital#Receipt of social support from informal support group members for:Health problem of loved one#-1         5  0.4
## CEO social capital#Receipt of social support from informal support group members for:Strained marital relationship#-1       3  0.2
## CEO social capital#Receipt of social support from informal support group members for:Strained relationship with child#-1    4  0.3
## CEO social capital#Strained relationship with child#-1                                                                      1  0.1
## CEO succession#Abnormal#-1                                                                                                  4  0.3
## CEO succession#Fiduciary Violation#-1                                                                                      12  1.0
## CEO succession#Outgoing Forced#-1                                                                                           3  0.2
## CEO total pay#CEO underpayment#-1                                                                                           9  0.7
## CEO total pay#Redistributing rewards#-1                                                                                     1  0.1
## CEO total pay#Underpayment#-1                                                                                               6  0.5
## Certification awards and Social reputation#CEO malfeasance#-1                                                              37  3.0
## Certification awards and Social reputation#Negative Publicity#-1                                                           18  1.5
## Environment turbulence#Industry munificance#-1                                                                              7  0.6
## Environment turbulence#Industry munificen#-1                                                                               17  1.4
## Environment turbulence#Industry munificence#-1                                                                             16  1.3
## Environment turbulence#Industry Munificence#-1                                                                             21  1.7
## Environment turbulence#Industry munificence(t-1)#-1                                                                        17  1.4
## Environment turbulence#Market munificence#-1                                                                               46  3.7
## Environment turbulence#Market_munificence#-1                                                                               12  1.0
## Environment turbulence#MUNIF#-1                                                                                             5  0.4
## Environment turbulence#Munificence#-1                                                                                      95  7.7
## Environment turbulence#ndustry munificence#-1                                                                               6  0.5
## Environment turbulence#Rule of law#-1                                                                                      16  1.3
## Financial performance#2yearLoss Development#-1                                                                             15  1.2
## Financial performance#a loss indicator#-1                                                                                  10  0.8
## Financial performance#Bad news#-1                                                                                           5  0.4
## Financial performance#BAD#-1                                                                                                1  0.1
## Financial performance#BAD&UE#-1                                                                                             3  0.2
## Financial performance#Below#-1                                                                                              8  0.7
## Financial performance#Contemp. Negative Income#-1                                                                           3  0.2
## Financial performance#DD#-1                                                                                                 3  0.2
## Financial performance#Decline#-1                                                                                           11  0.9
## Financial performance#Declining firm performance#-1                                                                         2  0.2
## Financial performance#Depressed Stock#-1                                                                                    9  0.7
## Financial performance#Financial constraint#-1                                                                               7  0.6
## Financial performance#Financial Pressure Composite#-1                                                                      12  1.0
## Financial performance#Lagged Negative Income#-1                                                                             4  0.3
## Financial performance#Loss#-1                                                                                              74  6.0
## Financial performance#LOSS#-1                                                                                             131 10.7
## Financial performance#Losses#-1                                                                                             1  0.1
## Financial performance#LOSSt#-1                                                                                              7  0.6
## Financial performance#MISSED#-1                                                                                             3  0.2
## Financial performance#myopiait#-1                                                                                           6  0.5
## Financial performance#NegEarn#-1                                                                                            7  0.6
## Financial performance#NEGit#-1                                                                                              6  0.5
## Financial performance#Net operating loss carryforwards (NOL)#-1                                                            10  0.8
## Financial performance#net operating loss#-1                                                                                15  1.2
## Financial performance#NOL#-1                                                                                               10  0.8
## Financial performance#NOL(change)#-1                                                                                        3  0.2
## Financial performance#Operational loss#-1                                                                                   5  0.4
## Financial performance#Poor performance#-1                                                                                   3  0.2
## Financial performance#PoorReturn#-1                                                                                         1  0.1
## Financial performance#Positive discrepancy (historical)#-1                                                                 24  2.0
## Financial performance#Positive discrepancy (social)#-1                                                                     26  2.1
## Financial performance#Prior losses indicator#-1                                                                             2  0.2
## Financial performance#Reportcost#-1                                                                                        10  0.8
## Financial performance#ST#-1                                                                                                 8  0.7
## Financial performance#TO_LOSS#-1                                                                                           12  1.0
## Firm risk taking#CEO remains on the board#-1                                                                                4  0.3
## Firm risk taking#Focus#-1                                                                                                  11  0.9
## Firm risk taking#No CEO change#-1                                                                                          16  1.3
## Firms Characteristics (Firm prestige)#FROM_LOSS#-1                                                                         13  1.1
## Firms Characteristics (Firm prestige)#Nonfamily firms#-1                                                                   10  0.8
## Firms Characteristics (Firm prestige)#Owner-managed#-1                                                                      9  0.7
## General performance#Compliance index#-1                                                                                     9  0.7
## General performance#Corporate misconduct#-1                                                                                13  1.1
## General performance#CSP weaknesses#-1                                                                                       9  0.7
## General performance#CSP weaknessesb#-1                                                                                      1  0.1
## General performance#current organizational performance financial soundness score#-1                                         6  0.5
## General performance#Efficiency index#-1                                                                                     7  0.6
## General performance#Financial misconduct#-1                                                                                 2  0.2
## General performance#Industry-adjusted compliance index#-1                                                                  12  1.0
## General performance#Industry-adjusted efficiency index#-1                                                                  10  0.8
## General performance#Industry-adjusted spill index#-1                                                                       11  0.9
## General performance#KLD concerns#-1                                                                                         1  0.1
## General performance#Spill index#-1                                                                                          8  0.7
## Industry Performance#Country risk#-1                                                                                        5  0.4
## Industry Performance#Recession#-1                                                                                          10  0.8
## Insider power#InfoComt#-1                                                                                                   6  0.5
## Insider power#Insider departures#-1                                                                                        19  1.5
## Operational performance#Costumer complaints#-1                                                                             10  0.8
## Operational performance#Hazard#-1                                                                                           1  0.1
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Total N = 1,230
Freq(metadata[Yrevese==-1]$Yr)
## Frequency Statistics:
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                                                                                                            N   %
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Board power#NON-INDEP-OUTS#-1                                                                                             11 0.9
## Board power#Nonheir inside directors#-1                                                                                    4 0.3
## CEO duality#CEO/board chair separation#-1                                                                                 14 1.1
## CEO duality#Separate CEO and BCP roles#-1                                                                                  9 0.7
## CEO duality#Separate CEO and board chair positions#-1                                                                     12 0.9
## CEO long-term incentive pay#CEO Relative Debt-to-Equity#-1                                                                13 1.0
## CEO long-term incentive pay#Fixed pay percentage#-1                                                                        6 0.5
## CEO managerial ability#CEO incapacitation#-1                                                                               2 0.2
## CEO power#CEO is Employed#-1                                                                                              13 1.0
## CEO power#Non-CEO exe. own.#-1                                                                                             2 0.2
## CEO power#Non-CEO executive ownership#-1                                                                                   8 0.6
## CEO power#Presence of a Separate COO/President#-1                                                                         11 0.9
## CEO power#Separate COO(t+n-1)#-1                                                                                         6 0.5
## CEO power#Shared power#-1                                                                                                 10 0.8
## CEO social capital#Health problem of loved one#-1                                                                         24 1.9
## CEO social capital#Previous experience of:Health problem of loved one#-1                                                  17 1.3
## CEO social capital#Previous experience of:Number of persol problems of fellow directors known to CEO#-1                    1 0.1
## CEO social capital#Previous experience of:Previous experience of:Strained marital relationship#-1                         15 1.2
## CEO social capital#Previous experience of:Strained marital relationship#-1                                                 6 0.5
## CEO social capital#Previous experience of:Strained relation with child#-1                                                  5 0.4
## CEO social capital#Previous experience of:Strained relationship with child#-1                                             14 1.1
## CEO social capital#Receipt of social support from fellow board members for:Health problem of loved one#-1                 18 1.4
## CEO social capital#Receipt of social support from fellow board members for:Strained marital relationship#-1               20 1.6
## CEO social capital#Receipt of social support from fellow board members for:Strained relationship with child#-1            19 1.5
## CEO social capital#Receipt of social support from informal support group members for:Health problem of loved one#-1       21 1.7
## CEO social capital#Receipt of social support from informal support group members for:Strained marital relationship#-1     23 1.8
## CEO social capital#Receipt of social support from informal support group members for:Strained relationship with child#-1  22 1.7
## CEO social capital#Strained marital relationship#-1                                                                       26 2.1
## CEO social capital#Strained relationship with child#-1                                                                    25 2.0
## CEO succession#Abnormal#-1                                                                                                15 1.2
## CEO succession#Fiduciary Violation#-1                                                                                      9 0.7
## CEO succession#Outgoing Forced#-1                                                                                          9 0.7
## CEO total pay#CEO underpayment#-1                                                                                          7 0.6
## CEO total pay#Redistributing rewards#-1                                                                                   34 2.7
## CEO total pay#Underpayment#-1                                                                                             10 0.8
## Certification awards and Social reputation#CEO malfeasance#-1                                                              2 0.2
## Certification awards and Social reputation#Negative Publicity#-1                                                           3 0.2
## Environment turbulence#Industry munificance#-1                                                                            11 0.9
## Environment turbulence#Industry munificen#-1                                                                               8 0.6
## Environment turbulence#Industry munificence#-1                                                                            44 3.5
## Environment turbulence#Industry Munificence#-1                                                                             6 0.5
## Environment turbulence#Industry munificence(t-1)#-1                                                                        1 0.1
## Environment turbulence#Market munificence#-1                                                                              17 1.3
## Environment turbulence#Market_munificence#-1                                                                               2 0.2
## Environment turbulence#MUNIF#-1                                                                                            3 0.2
## Environment turbulence#Munificence#-1                                                                                     58 4.6
## Environment turbulence#ndustry munificence#-1                                                                             11 0.9
## Environment turbulence#Rule of law#-1                                                                                      1 0.1
## Financial performance#2yearLoss Development#-1                                                                             5 0.4
## Financial performance#Bad news#-1                                                                                         18 1.4
## Financial performance#BAD#-1                                                                                               6 0.5
## Financial performance#BAD&UE#-1                                                                                            4 0.3
## Financial performance#Below#-1                                                                                            10 0.8
## Financial performance#Contemp. Negative Income#-1                                                                          6 0.5
## Financial performance#DD#-1                                                                                                8 0.6
## Financial performance#Decline#-1                                                                                           4 0.3
## Financial performance#Declining firm performance#-1                                                                       15 1.2
## Financial performance#Depressed Stock#-1                                                                                   3 0.2
## Financial performance#Financial constraint#-1                                                                              6 0.5
## Financial performance#Financial Pressure Composite#-1                                                                      7 0.6
## Financial performance#Lagged Negative Income#-1                                                                            5 0.4
## Financial performance#Loss#-1                                                                                             56 4.4
## Financial performance#LOSS#-1                                                                                             48 3.8
## Financial performance#Losses#-1                                                                                           15 1.2
## Financial performance#LOSSt#-1                                                                                             5 0.4
## Financial performance#MISSED#-1                                                                                            6 0.5
## Financial performance#myopiait#-1                                                                                          6 0.5
## Financial performance#NegEarn#-1                                                                                           8 0.6
## Financial performance#NEGit#-1                                                                                            18 1.4
## Financial performance#Net operating loss carryforwards (NOL)#-1                                                            2 0.2
## Financial performance#net operating loss#-1                                                                                8 0.6
## Financial performance#NOL#-1                                                                                               3 0.2
## Financial performance#NOL(change)#-1                                                                                      13 1.0
## Financial performance#Operational loss#-1                                                                                 10 0.8
## Financial performance#Poor performance#-1                                                                                  8 0.6
## Financial performance#PoorReturn#-1                                                                                       19 1.5
## Financial performance#Positive discrepancy (historical)#-1                                                                 2 0.2
## Financial performance#Prior losses indicator#-1                                                                           14 1.1
## Financial performance#ST#-1                                                                                                9 0.7
## Financial performance#TO_LOSS#-1                                                                                          13 1.0
## Firm risk taking#CEO remains on the board#-1                                                                               9 0.7
## Firm risk taking#Corporate strategic refocusing#-1                                                                        11 0.9
## Firm risk taking#Focus#-1                                                                                                  4 0.3
## Firm risk taking#No CEO change#-1                                                                                          4 0.3
## Firms Characteristics (Firm prestige)#FROM_LOSS#-1                                                                        12 0.9
## Firms Characteristics (Firm prestige)#Owner-managed#-1                                                                    19 1.5
## General performance#Compliance index#-1                                                                                    8 0.6
## General performance#compute an index of socially irresponsible activities#-1                                              14 1.1
## General performance#CSP weaknesses#-1                                                                                      1 0.1
## General performance#CSP weaknessesb#-1                                                                                    15 1.2
## General performance#CSR decoupling#-1                                                                                     12 0.9
## General performance#current organizational performance financial soundness score#-1                                        1 0.1
## General performance#Efficiency index#-1                                                                                   10 0.8
## General performance#Financial misconduct#-1                                                                               21 1.7
## General performance#Industry-adjusted compliance index#-1                                                                  5 0.4
## General performance#Industry-adjusted efficiency index#-1                                                                  7 0.6
## General performance#Industry-adjusted spill index#-1                                                                       6 0.5
## General performance#KLD concerns#-1                                                                                       19 1.5
## General performance#Spill index#-1                                                                                         9 0.7
## Industry Performance#Country risk#-1                                                                                       8 0.6
## Industry Performance#Recession#-1                                                                                         30 2.4
## Insider power#InfoComt#-1                                                                                                 11 0.9
## Insider power#Insider departures#-1                                                                                        6 0.5
## Operational performance#Costumer complaints#-1                                                                            25 2.0
## Operational performance#Hazard#-1                                                                                         12 0.9
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Total N = 1,267

4.3 Non-Reverse coding

Freq(metadata[Xreverse==-1]$Xr)
## Frequency Statistics:
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                                                                                                             N    %
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Board power#NON-INDEP-OUTS#-1                                                                                               1  0.1
## Board power#Nonheir inside directors#-1                                                                                    10  0.8
## CEO duality#CEO/board chair separation#-1                                                                                   9  0.7
## CEO duality#Nonduality#-1                                                                                                  19  1.5
## CEO duality#Separate CEO and BCP roles#-1                                                                                   2  0.2
## CEO duality#Separate CEO and board chair positions#-1                                                                       2  0.2
## CEO long-term incentive pay#Fixed pay percentage#-1                                                                         8  0.7
## CEO managerial ability#CEO incapacitation#-1                                                                               19  1.5
## CEO power#CEO is Employed#-1                                                                                                6  0.5
## CEO power#Non-CEO exe. own.#-1                                                                                             17  1.4
## CEO power#Non-CEO executive ownership#-1                                                                                    7  0.6
## CEO power#Presence of a Separate COO/President#-1                                                                           2  0.2
## CEO power#Separate COO(t+n-1)#-1                                                                                         10  0.8
## CEO power#Shared power#-1                                                                                                  13  1.1
## CEO social capital#Health problem of loved one#-1                                                                           2  0.2
## CEO social capital#Previous experience of:Health problem of loved one#-1                                                   17  1.4
## CEO social capital#Previous experience of:Number of persol problems of fellow directors known to CEO#-1                    16  1.3
## CEO social capital#Previous experience of:Previous experience of:Strained marital relationship#-1                           2  0.2
## CEO social capital#Previous experience of:Strained marital relationship#-1                                                 11  0.9
## CEO social capital#Previous experience of:Strained relation with child#-1                                                  12  1.0
## CEO social capital#Previous experience of:Strained relationship with child#-1                                               3  0.2
## CEO social capital#Receipt of social support from fellow board members for:Health problem of loved one#-1                   8  0.7
## CEO social capital#Receipt of social support from fellow board members for:Strained marital relationship#-1                 6  0.5
## CEO social capital#Receipt of social support from fellow board members for:Strained relationship with child#-1              7  0.6
## CEO social capital#Receipt of social support from informal support group members for:Health problem of loved one#-1         5  0.4
## CEO social capital#Receipt of social support from informal support group members for:Strained marital relationship#-1       3  0.2
## CEO social capital#Receipt of social support from informal support group members for:Strained relationship with child#-1    4  0.3
## CEO social capital#Strained relationship with child#-1                                                                      1  0.1
## CEO succession#Abnormal#-1                                                                                                  4  0.3
## CEO succession#Fiduciary Violation#-1                                                                                      12  1.0
## CEO succession#Outgoing Forced#-1                                                                                           3  0.2
## CEO total pay#CEO underpayment#-1                                                                                           9  0.7
## CEO total pay#Redistributing rewards#-1                                                                                     1  0.1
## CEO total pay#Underpayment#-1                                                                                               6  0.5
## Certification awards and Social reputation#CEO malfeasance#-1                                                              37  3.0
## Certification awards and Social reputation#Negative Publicity#-1                                                           18  1.5
## Environment turbulence#Industry munificance#-1                                                                              7  0.6
## Environment turbulence#Industry munificen#-1                                                                               17  1.4
## Environment turbulence#Industry munificence#-1                                                                             16  1.3
## Environment turbulence#Industry Munificence#-1                                                                             21  1.7
## Environment turbulence#Industry munificence(t-1)#-1                                                                        17  1.4
## Environment turbulence#Market munificence#-1                                                                               46  3.7
## Environment turbulence#Market_munificence#-1                                                                               12  1.0
## Environment turbulence#MUNIF#-1                                                                                             5  0.4
## Environment turbulence#Munificence#-1                                                                                      95  7.7
## Environment turbulence#ndustry munificence#-1                                                                               6  0.5
## Environment turbulence#Rule of law#-1                                                                                      16  1.3
## Financial performance#2yearLoss Development#-1                                                                             15  1.2
## Financial performance#a loss indicator#-1                                                                                  10  0.8
## Financial performance#Bad news#-1                                                                                           5  0.4
## Financial performance#BAD#-1                                                                                                1  0.1
## Financial performance#BAD&UE#-1                                                                                             3  0.2
## Financial performance#Below#-1                                                                                              8  0.7
## Financial performance#Contemp. Negative Income#-1                                                                           3  0.2
## Financial performance#DD#-1                                                                                                 3  0.2
## Financial performance#Decline#-1                                                                                           11  0.9
## Financial performance#Declining firm performance#-1                                                                         2  0.2
## Financial performance#Depressed Stock#-1                                                                                    9  0.7
## Financial performance#Financial constraint#-1                                                                               7  0.6
## Financial performance#Financial Pressure Composite#-1                                                                      12  1.0
## Financial performance#Lagged Negative Income#-1                                                                             4  0.3
## Financial performance#Loss#-1                                                                                              74  6.0
## Financial performance#LOSS#-1                                                                                             131 10.7
## Financial performance#Losses#-1                                                                                             1  0.1
## Financial performance#LOSSt#-1                                                                                              7  0.6
## Financial performance#MISSED#-1                                                                                             3  0.2
## Financial performance#myopiait#-1                                                                                           6  0.5
## Financial performance#NegEarn#-1                                                                                            7  0.6
## Financial performance#NEGit#-1                                                                                              6  0.5
## Financial performance#Net operating loss carryforwards (NOL)#-1                                                            10  0.8
## Financial performance#net operating loss#-1                                                                                15  1.2
## Financial performance#NOL#-1                                                                                               10  0.8
## Financial performance#NOL(change)#-1                                                                                        3  0.2
## Financial performance#Operational loss#-1                                                                                   5  0.4
## Financial performance#Poor performance#-1                                                                                   3  0.2
## Financial performance#PoorReturn#-1                                                                                         1  0.1
## Financial performance#Positive discrepancy (historical)#-1                                                                 24  2.0
## Financial performance#Positive discrepancy (social)#-1                                                                     26  2.1
## Financial performance#Prior losses indicator#-1                                                                             2  0.2
## Financial performance#Reportcost#-1                                                                                        10  0.8
## Financial performance#ST#-1                                                                                                 8  0.7
## Financial performance#TO_LOSS#-1                                                                                           12  1.0
## Firm risk taking#CEO remains on the board#-1                                                                                4  0.3
## Firm risk taking#Focus#-1                                                                                                  11  0.9
## Firm risk taking#No CEO change#-1                                                                                          16  1.3
## Firms Characteristics (Firm prestige)#FROM_LOSS#-1                                                                         13  1.1
## Firms Characteristics (Firm prestige)#Nonfamily firms#-1                                                                   10  0.8
## Firms Characteristics (Firm prestige)#Owner-managed#-1                                                                      9  0.7
## General performance#Compliance index#-1                                                                                     9  0.7
## General performance#Corporate misconduct#-1                                                                                13  1.1
## General performance#CSP weaknesses#-1                                                                                       9  0.7
## General performance#CSP weaknessesb#-1                                                                                      1  0.1
## General performance#current organizational performance financial soundness score#-1                                         6  0.5
## General performance#Efficiency index#-1                                                                                     7  0.6
## General performance#Financial misconduct#-1                                                                                 2  0.2
## General performance#Industry-adjusted compliance index#-1                                                                  12  1.0
## General performance#Industry-adjusted efficiency index#-1                                                                  10  0.8
## General performance#Industry-adjusted spill index#-1                                                                       11  0.9
## General performance#KLD concerns#-1                                                                                         1  0.1
## General performance#Spill index#-1                                                                                          8  0.7
## Industry Performance#Country risk#-1                                                                                        5  0.4
## Industry Performance#Recession#-1                                                                                          10  0.8
## Insider power#InfoComt#-1                                                                                                   6  0.5
## Insider power#Insider departures#-1                                                                                        19  1.5
## Operational performance#Costumer complaints#-1                                                                             10  0.8
## Operational performance#Hazard#-1                                                                                           1  0.1
## ──────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Total N = 1,230
Freq(metadata[Yrevese==-1]$Yr)
## Frequency Statistics:
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
##                                                                                                                            N   %
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Board power#NON-INDEP-OUTS#-1                                                                                             11 0.9
## Board power#Nonheir inside directors#-1                                                                                    4 0.3
## CEO duality#CEO/board chair separation#-1                                                                                 14 1.1
## CEO duality#Separate CEO and BCP roles#-1                                                                                  9 0.7
## CEO duality#Separate CEO and board chair positions#-1                                                                     12 0.9
## CEO long-term incentive pay#CEO Relative Debt-to-Equity#-1                                                                13 1.0
## CEO long-term incentive pay#Fixed pay percentage#-1                                                                        6 0.5
## CEO managerial ability#CEO incapacitation#-1                                                                               2 0.2
## CEO power#CEO is Employed#-1                                                                                              13 1.0
## CEO power#Non-CEO exe. own.#-1                                                                                             2 0.2
## CEO power#Non-CEO executive ownership#-1                                                                                   8 0.6
## CEO power#Presence of a Separate COO/President#-1                                                                         11 0.9
## CEO power#Separate COO(t+n-1)#-1                                                                                         6 0.5
## CEO power#Shared power#-1                                                                                                 10 0.8
## CEO social capital#Health problem of loved one#-1                                                                         24 1.9
## CEO social capital#Previous experience of:Health problem of loved one#-1                                                  17 1.3
## CEO social capital#Previous experience of:Number of persol problems of fellow directors known to CEO#-1                    1 0.1
## CEO social capital#Previous experience of:Previous experience of:Strained marital relationship#-1                         15 1.2
## CEO social capital#Previous experience of:Strained marital relationship#-1                                                 6 0.5
## CEO social capital#Previous experience of:Strained relation with child#-1                                                  5 0.4
## CEO social capital#Previous experience of:Strained relationship with child#-1                                             14 1.1
## CEO social capital#Receipt of social support from fellow board members for:Health problem of loved one#-1                 18 1.4
## CEO social capital#Receipt of social support from fellow board members for:Strained marital relationship#-1               20 1.6
## CEO social capital#Receipt of social support from fellow board members for:Strained relationship with child#-1            19 1.5
## CEO social capital#Receipt of social support from informal support group members for:Health problem of loved one#-1       21 1.7
## CEO social capital#Receipt of social support from informal support group members for:Strained marital relationship#-1     23 1.8
## CEO social capital#Receipt of social support from informal support group members for:Strained relationship with child#-1  22 1.7
## CEO social capital#Strained marital relationship#-1                                                                       26 2.1
## CEO social capital#Strained relationship with child#-1                                                                    25 2.0
## CEO succession#Abnormal#-1                                                                                                15 1.2
## CEO succession#Fiduciary Violation#-1                                                                                      9 0.7
## CEO succession#Outgoing Forced#-1                                                                                          9 0.7
## CEO total pay#CEO underpayment#-1                                                                                          7 0.6
## CEO total pay#Redistributing rewards#-1                                                                                   34 2.7
## CEO total pay#Underpayment#-1                                                                                             10 0.8
## Certification awards and Social reputation#CEO malfeasance#-1                                                              2 0.2
## Certification awards and Social reputation#Negative Publicity#-1                                                           3 0.2
## Environment turbulence#Industry munificance#-1                                                                            11 0.9
## Environment turbulence#Industry munificen#-1                                                                               8 0.6
## Environment turbulence#Industry munificence#-1                                                                            44 3.5
## Environment turbulence#Industry Munificence#-1                                                                             6 0.5
## Environment turbulence#Industry munificence(t-1)#-1                                                                        1 0.1
## Environment turbulence#Market munificence#-1                                                                              17 1.3
## Environment turbulence#Market_munificence#-1                                                                               2 0.2
## Environment turbulence#MUNIF#-1                                                                                            3 0.2
## Environment turbulence#Munificence#-1                                                                                     58 4.6
## Environment turbulence#ndustry munificence#-1                                                                             11 0.9
## Environment turbulence#Rule of law#-1                                                                                      1 0.1
## Financial performance#2yearLoss Development#-1                                                                             5 0.4
## Financial performance#Bad news#-1                                                                                         18 1.4
## Financial performance#BAD#-1                                                                                               6 0.5
## Financial performance#BAD&UE#-1                                                                                            4 0.3
## Financial performance#Below#-1                                                                                            10 0.8
## Financial performance#Contemp. Negative Income#-1                                                                          6 0.5
## Financial performance#DD#-1                                                                                                8 0.6
## Financial performance#Decline#-1                                                                                           4 0.3
## Financial performance#Declining firm performance#-1                                                                       15 1.2
## Financial performance#Depressed Stock#-1                                                                                   3 0.2
## Financial performance#Financial constraint#-1                                                                              6 0.5
## Financial performance#Financial Pressure Composite#-1                                                                      7 0.6
## Financial performance#Lagged Negative Income#-1                                                                            5 0.4
## Financial performance#Loss#-1                                                                                             56 4.4
## Financial performance#LOSS#-1                                                                                             48 3.8
## Financial performance#Losses#-1                                                                                           15 1.2
## Financial performance#LOSSt#-1                                                                                             5 0.4
## Financial performance#MISSED#-1                                                                                            6 0.5
## Financial performance#myopiait#-1                                                                                          6 0.5
## Financial performance#NegEarn#-1                                                                                           8 0.6
## Financial performance#NEGit#-1                                                                                            18 1.4
## Financial performance#Net operating loss carryforwards (NOL)#-1                                                            2 0.2
## Financial performance#net operating loss#-1                                                                                8 0.6
## Financial performance#NOL#-1                                                                                               3 0.2
## Financial performance#NOL(change)#-1                                                                                      13 1.0
## Financial performance#Operational loss#-1                                                                                 10 0.8
## Financial performance#Poor performance#-1                                                                                  8 0.6
## Financial performance#PoorReturn#-1                                                                                       19 1.5
## Financial performance#Positive discrepancy (historical)#-1                                                                 2 0.2
## Financial performance#Prior losses indicator#-1                                                                           14 1.1
## Financial performance#ST#-1                                                                                                9 0.7
## Financial performance#TO_LOSS#-1                                                                                          13 1.0
## Firm risk taking#CEO remains on the board#-1                                                                               9 0.7
## Firm risk taking#Corporate strategic refocusing#-1                                                                        11 0.9
## Firm risk taking#Focus#-1                                                                                                  4 0.3
## Firm risk taking#No CEO change#-1                                                                                          4 0.3
## Firms Characteristics (Firm prestige)#FROM_LOSS#-1                                                                        12 0.9
## Firms Characteristics (Firm prestige)#Owner-managed#-1                                                                    19 1.5
## General performance#Compliance index#-1                                                                                    8 0.6
## General performance#compute an index of socially irresponsible activities#-1                                              14 1.1
## General performance#CSP weaknesses#-1                                                                                      1 0.1
## General performance#CSP weaknessesb#-1                                                                                    15 1.2
## General performance#CSR decoupling#-1                                                                                     12 0.9
## General performance#current organizational performance financial soundness score#-1                                        1 0.1
## General performance#Efficiency index#-1                                                                                   10 0.8
## General performance#Financial misconduct#-1                                                                               21 1.7
## General performance#Industry-adjusted compliance index#-1                                                                  5 0.4
## General performance#Industry-adjusted efficiency index#-1                                                                  7 0.6
## General performance#Industry-adjusted spill index#-1                                                                       6 0.5
## General performance#KLD concerns#-1                                                                                       19 1.5
## General performance#Spill index#-1                                                                                         9 0.7
## Industry Performance#Country risk#-1                                                                                       8 0.6
## Industry Performance#Recession#-1                                                                                         30 2.4
## Insider power#InfoComt#-1                                                                                                 11 0.9
## Insider power#Insider departures#-1                                                                                        6 0.5
## Operational performance#Costumer complaints#-1                                                                            25 2.0
## Operational performance#Hazard#-1                                                                                         12 0.9
## ────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────────
## Total N = 1,267