Qualifications Study

Checking randomization

It looks like randomization worked…with my limited randomization procedure.

with(qual_raw, table(ex_wom, deiexpert))
##          deiexpert
## ex_wom    man none woman
##   Adopt     0   50     0
##   Audit    68   51     0
##   Budget   68   48     0
##   Equity    0    0   203
##   Habitat  64   49     0
with(qual_raw, table(ex_man, deiexpert))
##          deiexpert
## ex_man    man none woman
##   Adopt     0   48     0
##   Audit     0   49    69
##   Budget    0   51    68
##   Equity  200    0     0
##   Habitat   0   50    66

Analyses

Voice Quality

Focal Woman

Mixed-Model Anova comparing EVERY candidate to each other
Pairwise comparisons (comparing conditions across candidates)
Pairwise comparisons (comparing candidates across conditions)
(vq_graph_data <- qual_clean_long %>%
  group_by(deiexpert_f, pers_simplified, ex_wom) %>%
  summarize(mean_vq = mean(vq),
            sd_vq = sd(vq)))
## `summarise()` has grouped output by 'deiexpert_f', 'pers_simplified'. You can override using the `.groups` argument.
vq_graph_data %>%
  ggplot(aes(x = ex_wom, fill = deiexpert_f, y = mean_vq))+
  geom_bar(position = "dodge", stat = "identity")+
  labs(x = "Focal Woman's Committee Assignment",
       y = "Voice Quality",
       fill = "DEI Expertise Condition")+
  facet_wrap(~pers_simplified)

summary(lmer(vq~ex_wom*deiexpert_f + (1|pid), data = qual_clean_long))
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vq ~ ex_wom * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7658
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.4867 -0.5637 -0.0014  0.7317  2.3191 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.449    0.67    
##  Residual             2.016    1.42    
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                               Estimate Std. Error       df t value            Pr(>|t|)    
## (Intercept)                                     4.9255     0.2539 509.0000   19.40 <0.0000000000000002 ***
## ex_womAudit                                    -0.1165     0.2872 509.0000   -0.41                0.69    
## ex_womBudget                                    0.0548     0.2850 509.0000    0.19                0.85    
## ex_womEquity                                   -0.3667     0.2640 509.0000   -1.39                0.17    
## ex_womHabitat                                  -0.1000     0.2157 509.0000   -0.46                0.64    
## deiexpert_fNo one has DEI Quals.               -0.1755     0.2044 509.0000   -0.86                0.39    
## ex_womAudit:deiexpert_fNo one has DEI Quals.    0.3825     0.2829 509.0000    1.35                0.18    
## ex_womBudget:deiexpert_fNo one has DEI Quals.   0.0137     0.2850 509.0000    0.05                0.96    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) ex_wmA ex_wmB ex_wmE ex_wmH d_ohDQ e_AohDQ
## ex_womAudit -0.884                                           
## ex_womBudgt -0.891  0.788                                    
## ex_womEquty -0.962  0.851  0.857                             
## ex_womHabtt -0.849  0.751  0.757  0.817                      
## dx_NohDEIQ. -0.805  0.712  0.717  0.774  0.540               
## e_A:_NohDEQ  0.582 -0.736 -0.518 -0.560 -0.390 -0.723        
## e_B:_NohDEQ  0.578 -0.511 -0.721 -0.556 -0.388 -0.717  0.518 
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
sjPlot::plot_model(
  lmer(vq~ex_wom*deiexpert_f + (1|pid), data = qual_clean_long), type = "int", mdrt.values = "meansd",
)
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## Could not compute variance-covariance matrix of predictions. No confidence intervals are returned.

Focal Man

Mixed-Model Anova comparing EVERY candidate to each other
Pairwise comparisons (comparing conditions across candidates)
Pairwise comparisons (comparing candidates across conditions)
(vq_graph_data <- qual_clean_long %>%
  group_by(deiexpert_f, pers_simplified, ex_man) %>%
  summarize(mean_vq = mean(vq),
            sd_vq = sd(vq)))
## `summarise()` has grouped output by 'deiexpert_f', 'pers_simplified'. You can override using the `.groups` argument.
vq_graph_data %>%
  ggplot(aes(x = ex_man, fill = deiexpert_f, y = mean_vq))+
  geom_bar(position = "dodge", stat = "identity")+
  labs(x = "Focal Man's Committee Assignment",
       y = "Voice Quality",
       fill = "DEI Expertise Condition")+
  facet_wrap(~pers_simplified)

summary(lmer(vq~ex_man*deiexpert_f + (1|pid), data = qual_clean_long))
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vq ~ ex_man * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7658
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.5160 -0.5738  0.0055  0.7302  2.3670 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.448    0.669   
##  Residual             2.016    1.420   
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                               Estimate Std. Error       df t value            Pr(>|t|)    
## (Intercept)                                     4.6789     0.2473 509.0000   18.92 <0.0000000000000002 ***
## ex_manAudit                                    -0.2506     0.2771 509.0000   -0.90                0.37    
## ex_manBudget                                   -0.0418     0.2766 509.0000   -0.15                0.88    
## ex_manEquity                                    0.1954     0.2589 509.0000    0.75                0.45    
## ex_manHabitat                                  -0.0685     0.2129 509.0000   -0.32                0.75    
## deiexpert_fNo one has DEI Quals.                0.1396     0.1963 509.0000    0.71                0.48    
## ex_manAudit:deiexpert_fNo one has DEI Quals.    0.0821     0.2791 509.0000    0.29                0.77    
## ex_manBudget:deiexpert_fNo one has DEI Quals.   0.2393     0.2722 509.0000    0.88                0.38    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) ex_mnA ex_mnB ex_mnE ex_mnH d_ohDQ e_AohDQ
## ex_manAudit -0.893                                           
## ex_manBudgt -0.894  0.798                                    
## ex_manEquty -0.955  0.853  0.854                             
## ex_manHabtt -0.861  0.768  0.770  0.822                      
## dx_NohDEIQ. -0.793  0.708  0.709  0.758  0.542               
## e_A:_NohDEQ  0.558 -0.700 -0.499 -0.533 -0.381 -0.703        
## e_B:_NohDEQ  0.572 -0.511 -0.715 -0.547 -0.391 -0.721  0.507 
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
sjPlot::plot_model(
  lmer(vq~ex_man*deiexpert_f + (1|pid), data = qual_clean_long), type = "int", mdrt.values = "meansd",
)
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## Could not compute variance-covariance matrix of predictions. No confidence intervals are returned.

Voice Solicitation

Focal Woman

Mixed-Model Anova comparing EVERY candidate to each other
Pairwise comparisons (comparing conditions across candidates)
Pairwise comparisons (comparing candidates across conditions)
(vs_graph_data <- qual_clean_long %>%
  group_by(deiexpert_f, pers_simplified, ex_wom) %>%
  summarize(mean_vs = mean(vs),
            sd_vs = sd(vs)))
## `summarise()` has grouped output by 'deiexpert_f', 'pers_simplified'. You can override using the `.groups` argument.
vs_graph_data %>%
  ggplot(aes(x = ex_wom, fill = deiexpert_f, y = mean_vs))+
  geom_bar(position = "dodge", stat = "identity")+
  labs(x = "Focal Woman's Committee Assignment",
       y = "Voice Solicitation",
       fill = "DEI Expertise Condition")+
  facet_wrap(~pers_simplified)

summary(lmer(vs~ex_wom*deiexpert_f + (1|pid), data = qual_clean_long))
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vs ~ ex_wom * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7957
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.7041 -0.5651  0.0729  0.6056  2.4554 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.827    0.909   
##  Residual             2.170    1.473   
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                               Estimate Std. Error      df t value            Pr(>|t|)    
## (Intercept)                                      5.282      0.304 509.000   17.35 <0.0000000000000002 ***
## ex_womAudit                                     -0.294      0.344 509.000   -0.85               0.394    
## ex_womBudget                                    -0.323      0.342 509.000   -0.95               0.344    
## ex_womEquity                                    -0.553      0.317 509.000   -1.75               0.081 .  
## ex_womHabitat                                   -0.194      0.259 509.000   -0.75               0.452    
## deiexpert_fNo one has DEI Quals.                -0.359      0.245 509.000   -1.47               0.144    
## ex_womAudit:deiexpert_fNo one has DEI Quals.     0.406      0.339 509.000    1.20               0.232    
## ex_womBudget:deiexpert_fNo one has DEI Quals.    0.303      0.342 509.000    0.89               0.376    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) ex_wmA ex_wmB ex_wmE ex_wmH d_ohDQ e_AohDQ
## ex_womAudit -0.884                                           
## ex_womBudgt -0.891  0.788                                    
## ex_womEquty -0.962  0.851  0.857                             
## ex_womHabtt -0.849  0.751  0.757  0.817                      
## dx_NohDEIQ. -0.805  0.712  0.717  0.774  0.540               
## e_A:_NohDEQ  0.582 -0.736 -0.518 -0.560 -0.390 -0.723        
## e_B:_NohDEQ  0.578 -0.511 -0.721 -0.556 -0.388 -0.717  0.518 
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
sjPlot::plot_model(
  lmer(vs~ex_wom*deiexpert_f + (1|pid), data = qual_clean_long), type = "int", mdrt.values = "meansd",
)
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## Could not compute variance-covariance matrix of predictions. No confidence intervals are returned.

Focal Man

Mixed-Model Anova comparing EVERY candidate to each other
Pairwise comparisons (comparing conditions across candidates)
Pairwise comparisons (comparing candidates across conditions)
(vs_graph_data <- qual_clean_long %>%
  group_by(deiexpert_f, pers_simplified, ex_man) %>%
  summarize(mean_vs = mean(vs),
            sd_vs = sd(vs)))
## `summarise()` has grouped output by 'deiexpert_f', 'pers_simplified'. You can override using the `.groups` argument.
vs_graph_data %>%
  ggplot(aes(x = ex_man, fill = deiexpert_f, y = mean_vs))+
  geom_bar(position = "dodge", stat = "identity")+
  labs(x = "Focal Man's Committee Assignment",
       y = "Voice Solicitation",
       fill = "DEI Expertise Condition")+
  facet_wrap(~pers_simplified)

summary(lmer(vs~ex_man*deiexpert_f + (1|pid), data = qual_clean_long))
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vs ~ ex_man * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7955
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -2.718 -0.554  0.055  0.587  2.504 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.821    0.906   
##  Residual             2.170    1.473   
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                               Estimate Std. Error       df t value            Pr(>|t|)    
## (Intercept)                                     4.8312     0.2961 509.0000   16.32 <0.0000000000000002 ***
## ex_manAudit                                    -0.2923     0.3317 509.0000   -0.88                0.38    
## ex_manBudget                                   -0.0349     0.3312 509.0000   -0.11                0.92    
## ex_manEquity                                    0.1787     0.3099 509.0000    0.58                0.56    
## ex_manHabitat                                   0.0208     0.2549 509.0000    0.08                0.93    
## deiexpert_fNo one has DEI Quals.                0.0705     0.2350 509.0000    0.30                0.76    
## ex_manAudit:deiexpert_fNo one has DEI Quals.    0.1187     0.3342 509.0000    0.36                0.72    
## ex_manBudget:deiexpert_fNo one has DEI Quals.   0.1677     0.3259 509.0000    0.51                0.61    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) ex_mnA ex_mnB ex_mnE ex_mnH d_ohDQ e_AohDQ
## ex_manAudit -0.893                                           
## ex_manBudgt -0.894  0.798                                    
## ex_manEquty -0.955  0.853  0.854                             
## ex_manHabtt -0.861  0.768  0.770  0.822                      
## dx_NohDEIQ. -0.793  0.708  0.709  0.758  0.542               
## e_A:_NohDEQ  0.558 -0.700 -0.499 -0.533 -0.381 -0.703        
## e_B:_NohDEQ  0.572 -0.511 -0.715 -0.547 -0.391 -0.721  0.507 
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
sjPlot::plot_model(
  lmer(vs~ex_man*deiexpert_f + (1|pid), data = qual_clean_long), type = "int", mdrt.values = "meansd",
)
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## Could not compute variance-covariance matrix of predictions. No confidence intervals are returned.

Ranking

Focal Woman

Mixed-Model Anova comparing EVERY candidate to each other
Pairwise comparisons (comparing conditions across candidates)
Pairwise comparisons (comparing candidates across conditions)
(rank_r_graph_data <- qual_clean_long %>%
  group_by(deiexpert_f, pers_simplified, ex_wom) %>%
  summarize(mean_rank_r = mean(rank_r),
            sd_rank_r = sd(rank_r)))
## `summarise()` has grouped output by 'deiexpert_f', 'pers_simplified'. You can override using the `.groups` argument.
rank_r_graph_data %>%
  ggplot(aes(x = ex_wom, fill = deiexpert_f, y = mean_rank_r))+
  geom_bar(position = "dodge", stat = "identity")+
  labs(x = "Focal Woman's Committee Assignment",
       y = "Ranking",
       fill = "DEI Expertise Condition")+
  facet_wrap(~pers_simplified)

summary(lmer(rank_r~ex_wom*deiexpert_f + (1|pid), data = qual_clean_long))
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## boundary (singular) fit: see help('isSingular')
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: rank_r ~ ex_wom * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 6357
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
##  -1.34  -0.67   0.00   0.67   1.34 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.00     0.00    
##  Residual             1.25     1.12    
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                             Estimate             Std. Error                     df t value            Pr(>|t|)    
## (Intercept)                                      2.49999999999998890    0.14570976436472310 2060.00000002685828804    17.2 <0.0000000000000002 ***
## ex_womAudit                                      0.00000000000001122    0.16477396582281445 2060.00000003330251275     0.0                   1    
## ex_womBudget                                     0.00000000000001145    0.16350866234967854 2060.00000004023513611     0.0                   1    
## ex_womEquity                                     0.00000000000001126    0.15147810850414550 2060.00000002748356565     0.0                   1    
## ex_womHabitat                                    0.00000000000000800    0.12374251916567837 2060.00000004034154699     0.0                   1    
## deiexpert_fNo one has DEI Quals.                 0.00000000000000757    0.11731139837023553 2060.00000003188051778     0.0                   1    
## ex_womAudit:deiexpert_fNo one has DEI Quals.    -0.00000000000000753    0.16234483623105600 2060.00000002783417585     0.0                   1    
## ex_womBudget:deiexpert_fNo one has DEI Quals.   -0.00000000000000807    0.16350866234967876 2060.00000004024650480     0.0                   1    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) ex_wmA ex_wmB ex_wmE ex_wmH d_ohDQ e_AohDQ
## ex_womAudit -0.884                                           
## ex_womBudgt -0.891  0.788                                    
## ex_womEquty -0.962  0.851  0.857                             
## ex_womHabtt -0.849  0.751  0.757  0.817                      
## dx_NohDEIQ. -0.805  0.712  0.717  0.774  0.540               
## e_A:_NohDEQ  0.582 -0.736 -0.518 -0.560 -0.390 -0.723        
## e_B:_NohDEQ  0.578 -0.511 -0.721 -0.556 -0.388 -0.717  0.518 
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')
sjPlot::plot_model(
  lmer(rank_r~ex_wom*deiexpert_f + (1|pid), data = qual_clean_long), type = "int", mdrt.values = "meansd",
)
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## boundary (singular) fit: see help('isSingular')
## Could not compute variance-covariance matrix of predictions. No confidence intervals are returned.

Focal Man

Mixed-Model Anova comparing EVERY candidate to each other
Pairwise comparisons (comparing conditions across candidates)
Pairwise comparisons (comparing candidates across conditions)
(rank_r_graph_data <- qual_clean_long %>%
  group_by(deiexpert_f, pers_simplified, ex_man) %>%
  summarize(mean_rank_r = mean(rank_r),
            sd_rank_r = sd(rank_r)))
## `summarise()` has grouped output by 'deiexpert_f', 'pers_simplified'. You can override using the `.groups` argument.
rank_r_graph_data %>%
  ggplot(aes(x = ex_man, fill = deiexpert_f, y = mean_rank_r))+
  geom_bar(position = "dodge", stat = "identity")+
  labs(x = "Focal Man's Committee Assignment",
       y = "Ranking",
       fill = "DEI Expertise Condition")+
  facet_wrap(~pers_simplified)

summary(lmer(rank_r~ex_man*deiexpert_f + (1|pid), data = qual_clean_long))
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## boundary (singular) fit: see help('isSingular')
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: rank_r ~ ex_man * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 6357
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
##  -1.34  -0.67   0.00   0.67   1.34 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.00     0.00    
##  Residual             1.25     1.12    
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                             Estimate             Std. Error                     df t value            Pr(>|t|)    
## (Intercept)                                      2.49999999999999556    0.14201162754449462 2060.00000002911792762    17.6 <0.0000000000000002 ***
## ex_manAudit                                      0.00000000000000456    0.15909163438769461 2060.00000003596414899     0.0                   1    
## ex_manBudget                                     0.00000000000000410    0.15883072437899340 2060.00000002343995220     0.0                   1    
## ex_manEquity                                     0.00000000000000433    0.14863352792378118 2060.00000003337481758     0.0                   1    
## ex_manHabitat                                    0.00000000000000338    0.12222414854391965 2060.00000004307548807     0.0                   1    
## deiexpert_fNo one has DEI Quals.                 0.00000000000000298    0.11268509712554366 2060.00000003596915121     0.0                   1    
## ex_manAudit:deiexpert_fNo one has DEI Quals.    -0.00000000000000286    0.16026108914621193 2060.00000003432205631     0.0                   1    
## ex_manBudget:deiexpert_fNo one has DEI Quals.   -0.00000000000000245    0.15630926090499600 2060.00000003689410732     0.0                   1    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) ex_mnA ex_mnB ex_mnE ex_mnH d_ohDQ e_AohDQ
## ex_manAudit -0.893                                           
## ex_manBudgt -0.894  0.798                                    
## ex_manEquty -0.955  0.853  0.854                             
## ex_manHabtt -0.861  0.768  0.770  0.822                      
## dx_NohDEIQ. -0.793  0.708  0.709  0.758  0.542               
## e_A:_NohDEQ  0.558 -0.700 -0.499 -0.533 -0.381 -0.703        
## e_B:_NohDEQ  0.572 -0.511 -0.715 -0.547 -0.391 -0.721  0.507 
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')
sjPlot::plot_model(
  lmer(rank_r~ex_man*deiexpert_f + (1|pid), data = qual_clean_long), type = "int", mdrt.values = "meansd",
)
## fixed-effect model matrix is rank deficient so dropping 7 columns / coefficients
## boundary (singular) fit: see help('isSingular')
## Could not compute variance-covariance matrix of predictions. No confidence intervals are returned.

Labeling notes:

pers_simplified references a variable coded for EVERY candidate.
targ_gend_f references a variable coded for the candidate’s gender.
deiexpert_f references a variable our between-subjects manipulations.

Snapshot of the dataset is below:

Manipulation Check

Regressions

Target Gender by DEI Expert Identity on Ranking

I reverse-coded the ranking variable. So I coded ‘1’ ranking as ‘4’, ‘2’ ranking as ‘3’, and ‘4’ as ‘1’ So higher #’s means person was more likely to be picked.”

Mixed-Model Anova comparing EVERY candidate to each other

Pairwise comparisons (comparing conditions across candidates)

Pairwise comparisons (comparing candidates across conditions)

Estimated marginal means for ranking (grouped by person)

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: rank_r ~ pers_simplified * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 6079
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.4726 -0.9828 -0.0261  0.6325  1.8871 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.00     0.00    
##  Residual             1.09     1.05    
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                         Estimate Std. Error        df t value             Pr(>|t|)    
## (Intercept)                                               2.3436     0.0819 2056.0000   28.62 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                     0.1534     0.1158 2056.0000    1.32              0.18546    
## pers_simplifiedW1(MC)                                    -0.0552     0.1158 2056.0000   -0.48              0.63352    
## pers_simplifiedW2(LM)                                     0.5276     0.1158 2056.0000    4.56        0.00000550560 ***
## deiexpert_fNo one has DEI Quals.                          0.2237     0.1144 2056.0000    1.95              0.05073 .  
## deiexpert_fWoman Has DEI Quals.                          -0.3162     0.1126 2056.0000   -2.81              0.00502 ** 
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.   -0.3639     0.1618 2056.0000   -2.25              0.02464 *  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.    0.0962     0.1618 2056.0000    0.59              0.55247    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.   -0.6270     0.1618 2056.0000   -3.87              0.00011 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.    -0.1315     0.1592 2056.0000   -0.83              0.40889    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.     0.3667     0.1592 2056.0000    2.30              0.02137 *  
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.     1.0298     0.1592 2056.0000    6.47        0.00000000012 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) p_M2(J p_W1(M p_W2(L d_ohDQ d_WHDQ p_MohDQ p_W1ohDQ p_W2ohDQ p_MHDQ p_W1HDQ
## prs_sM2(JA) -0.707                                                                            
## prs_sW1(MC) -0.707  0.500                                                                     
## prs_sW2(LM) -0.707  0.500  0.500                                                              
## dx_NohDEIQ. -0.716  0.506  0.506  0.506                                                       
## dxp_WHDEIQ. -0.727  0.514  0.514  0.514  0.520                                                
## p_M2(JAohDQ  0.506 -0.716 -0.358 -0.358 -0.707 -0.368                                         
## p_W1(MCohDQ  0.506 -0.358 -0.716 -0.358 -0.707 -0.368  0.500                                  
## p_W2(LMohDQ  0.506 -0.358 -0.358 -0.716 -0.707 -0.368  0.500   0.500                          
## p_M2(JA)HDQ  0.514 -0.727 -0.364 -0.364 -0.368 -0.707  0.520   0.260    0.260                 
## p_W1(MC)HDQ  0.514 -0.364 -0.727 -0.364 -0.368 -0.707  0.260   0.520    0.260    0.500        
## p_W2(LM)HDQ  0.514 -0.364 -0.364 -0.727 -0.368 -0.707  0.260   0.260    0.520    0.500  0.500 
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')

Target Gender by DEI Expert Identity on Voice Solicitation

Mixed-Model Anova comparing EVERY candidate to each other

Pairwise comparisons (comparing conditions across candidates)

Pairwise comparisons (comparing candidates across conditions)

Estimated marginal means for voice solicitation (grouped by person)

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vs ~ pers_simplified * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7595
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -3.249 -0.518  0.061  0.618  2.781 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.934    0.966   
##  Residual             1.710    1.308   
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                        Estimate Std. Error       df t value             Pr(>|t|)    
## (Intercept)                                               5.828      0.127 1496.028   45.76 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                    -1.331      0.145 1542.000   -9.19 < 0.0000000000000002 ***
## pers_simplifiedW1(MC)                                    -0.801      0.145 1542.000   -5.53  0.00000003813708947 ***
## pers_simplifiedW2(LM)                                    -1.141      0.145 1542.000   -7.88  0.00000000000000624 ***
## deiexpert_fNo one has DEI Quals.                         -1.331      0.178 1496.028   -7.48  0.00000000000012729 ***
## deiexpert_fWoman Has DEI Quals.                          -1.861      0.175 1496.028  -10.63 < 0.0000000000000002 ***
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.    1.419      0.202 1542.000    7.01  0.00000000000356045 ***
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.    1.593      0.202 1542.000    7.87  0.00000000000000667 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.    1.884      0.202 1542.000    9.31 < 0.0000000000000002 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.     1.501      0.199 1542.000    7.53  0.00000000000008302 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.     1.639      0.199 1542.000    8.23  0.00000000000000039 ***
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.     3.179      0.199 1542.000   15.96 < 0.0000000000000002 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) p_M2(J p_W1(M p_W2(L d_ohDQ d_WHDQ p_MohDQ p_W1ohDQ p_W2ohDQ p_MHDQ p_W1HDQ
## prs_sM2(JA) -0.569                                                                            
## prs_sW1(MC) -0.569  0.500                                                                     
## prs_sW2(LM) -0.569  0.500  0.500                                                              
## dx_NohDEIQ. -0.716  0.407  0.407  0.407                                                       
## dxp_WHDEIQ. -0.727  0.414  0.414  0.414  0.520                                                
## p_M2(JAohDQ  0.407 -0.716 -0.358 -0.358 -0.569 -0.296                                         
## p_W1(MCohDQ  0.407 -0.358 -0.716 -0.358 -0.569 -0.296  0.500                                  
## p_W2(LMohDQ  0.407 -0.358 -0.358 -0.716 -0.569 -0.296  0.500   0.500                          
## p_M2(JA)HDQ  0.414 -0.727 -0.364 -0.364 -0.296 -0.569  0.520   0.260    0.260                 
## p_W1(MC)HDQ  0.414 -0.364 -0.727 -0.364 -0.296 -0.569  0.260   0.520    0.260    0.500        
## p_W2(LM)HDQ  0.414 -0.364 -0.364 -0.727 -0.296 -0.569  0.260   0.260    0.520    0.500  0.500

Target Gender by DEI Expert Identity on Voice Quality

Comparing EVERY candidate to each other

Mixed-Model Anova comparing EVERY candidate to each other

Pairwise comparisons (comparing conditions across candidates)

Pairwise comparisons (comparing candidates across conditions)

Estimated marginal means for voice quality (grouped by person)

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vq ~ pers_simplified * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7237
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -3.618 -0.541  0.039  0.612  2.643 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.57     0.755   
##  Residual             1.53     1.236   
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                        Estimate Std. Error       df t value             Pr(>|t|)    
## (Intercept)                                               5.856      0.113 1683.285   51.62 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                    -1.475      0.137 1542.000  -10.78 < 0.0000000000000002 ***
## pers_simplifiedW1(MC)                                    -1.187      0.137 1542.000   -8.67 < 0.0000000000000002 ***
## pers_simplifiedW2(LM)                                    -1.264      0.137 1542.000   -9.23 < 0.0000000000000002 ***
## deiexpert_fNo one has DEI Quals.                         -1.391      0.159 1683.285   -8.77 < 0.0000000000000002 ***
## deiexpert_fWoman Has DEI Quals.                          -1.951      0.156 1683.285  -12.51 < 0.0000000000000002 ***
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.    1.572      0.191 1542.000    8.22  0.00000000000000044 ***
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.    1.833      0.191 1542.000    9.58 < 0.0000000000000002 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.    1.928      0.191 1542.000   10.07 < 0.0000000000000002 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.     1.639      0.188 1542.000    8.71 < 0.0000000000000002 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.     1.589      0.188 1542.000    8.44 < 0.0000000000000002 ***
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.     3.316      0.188 1542.000   17.61 < 0.0000000000000002 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) p_M2(J p_W1(M p_W2(L d_ohDQ d_WHDQ p_MohDQ p_W1ohDQ p_W2ohDQ p_MHDQ p_W1HDQ
## prs_sM2(JA) -0.603                                                                            
## prs_sW1(MC) -0.603  0.500                                                                     
## prs_sW2(LM) -0.603  0.500  0.500                                                              
## dx_NohDEIQ. -0.716  0.432  0.432  0.432                                                       
## dxp_WHDEIQ. -0.727  0.439  0.439  0.439  0.520                                                
## p_M2(JAohDQ  0.432 -0.716 -0.358 -0.358 -0.603 -0.314                                         
## p_W1(MCohDQ  0.432 -0.358 -0.716 -0.358 -0.603 -0.314  0.500                                  
## p_W2(LMohDQ  0.432 -0.358 -0.358 -0.716 -0.603 -0.314  0.500   0.500                          
## p_M2(JA)HDQ  0.439 -0.727 -0.364 -0.364 -0.314 -0.603  0.520   0.260    0.260                 
## p_W1(MC)HDQ  0.439 -0.364 -0.727 -0.364 -0.314 -0.603  0.260   0.520    0.260    0.500        
## p_W2(LM)HDQ  0.439 -0.364 -0.364 -0.727 -0.314 -0.603  0.260   0.260    0.520    0.500  0.500

Exploratory analyses

How did the qualifications participants saw impact our results?

Controlling for which set of qualifications were dislayed does NOT change results

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: rank_r ~ pers_simplified * deiexpert_f * partfunction * sort +      (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 3606
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -2.615 -0.306  0.000  0.361  2.550 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.00     0.00    
##  Residual             1.02     1.01    
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                                                                                                                 Estimate            Std. Error                    df t value Pr(>|t|)    
## (Intercept)                                                                                                                           4.9999999999927418    2.5705145080514971 1091.9999999567789928    1.95  0.05202 .  
## pers_simplifiedM2(JA)                                                                                                                -6.9999999999920650    3.6352564795645983 1091.9999999597703209   -1.93  0.05442 .  
## pers_simplifiedW1(MC)                                                                                                                -1.9999999999923217    3.6352564795637847 1091.9999999587921593   -0.55  0.58232    
## pers_simplifiedW2(LM)                                                                                                                -0.9999999999918684    3.6352564795645668 1091.9999999597321221   -0.28  0.78330    
## deiexpert_fNo one has DEI Quals.                                                                                                     -1.9166666666673180    2.1974053920845718 1091.9999999565388862   -0.87  0.38327    
## deiexpert_fWoman Has DEI Quals.                                                                                                      -2.4999999999954334    2.2544903630324447 1091.9999999653996383   -1.11  0.26772    
## partfunctionAccount Management                                                                                                        0.5000000000026935    1.8862419669565973 1091.9999999585356818    0.27  0.79100    
## partfunctionAccounting                                                                                                               -2.9999999999927671    2.6675489715850622 1091.9999999602453045   -1.12  0.26099    
## partfunctionAdministrative Assistant                                                                                                 -1.9999999999935958    2.8517298040328334 1091.9999999674830633   -0.70  0.48325    
## partfunctionAdministrative services                                                                                                  -1.9999999999927665    2.6356011248360827 1091.9999999572894467   -0.76  0.44811    
## partfunctionassistant manger                                                                                                         -2.0833333333254220    3.6700444155447904 1091.9999999529979959   -0.57  0.57038    
## partfunctionBook editor                                                                                                               0.5000000000026910    1.8862419669565873 1091.9999999585127171    0.27  0.79100    
## partfunctionBusiness Development                                                                                                     -1.0833333333278907    2.9824104168877521 1091.9999999600486262   -0.36  0.71650    
## partfunctionCase manager                                                                                                             -0.9999999999934319    2.8517298040329595 1091.9999999676758762   -0.35  0.72591    
## partfunctionchildcare                                                                                                                 0.5000000000026947    1.8862419669565831 1091.9999999585027126    0.27  0.79100    
## partfunctionCivil Engineering                                                                                                         1.9166666666721093    2.9824104168877321 1091.9999999474161996    0.64  0.52058    
## partfunctioncollege educator                                                                                                         -0.9999999999934358    2.8517298040329622 1091.9999999562278390   -0.35  0.72591    
## partfunctionCommunications                                                                                                           -0.9999999999927225    2.7611755097251183 1091.9999999644032869   -0.36  0.71730    
## partfunctionConstruction                                                                                                             -1.9999999999927363    2.7611755097251143 1091.9999999570825366   -0.72  0.46902    
## partfunctionConstruction, system management                                                                                          -0.0833333333278742    2.9824104168877454 1091.9999999600386218   -0.03  0.97771    
## partfunctionConsultant                                                                                                               -0.9999999999985429    1.4258649020172829 1091.9999999585436399   -0.70  0.48325    
## partfunctioncopywriter                                                                                                                0.0000000000014578    1.4258649020172831 1091.9999999585445494    0.00  1.00000    
## partfunctionCustomer Experience/Support                                                                                              -1.5833333333268609    3.1212005747136033 1091.9999999542701516   -0.51  0.61206    
## partfunctionData Analysis                                                                                                            -0.3333333333266458    3.1883308476394832 1091.9999999537656095   -0.10  0.91675    
## partfunctiondATA COLLECTION                                                                                                          -0.9999999999934378    2.8517298040329582 1091.9999999676740572   -0.35  0.72591    
## partfunctionData Processing                                                                                                          -2.0833333333254256    3.6700444155447900 1091.9999999529977686   -0.57  0.57038    
## partfunctionDesign                                                                                                                    1.0000000000065570    2.8517298040329586 1091.9999999561518962    0.35  0.72591    
## partfunctionDesign or creative services                                                                                              -3.9999999999927565    2.6675489715850484 1091.9999999602225671   -1.50  0.13403    
## partfunctionDisaster restoration                                                                                                     -0.9999999999927359    2.7611755097251125 1091.9999999570800355   -0.36  0.71730    
## partfunctionEducation                                                                                                                -0.9999999999927495    2.7611755097251143 1091.9999999570823093   -0.36  0.71730    
## partfunctionEducation                                                                                                                 0.5000000000026882    1.8862419669565849 1091.9999999585070327    0.27  0.79100    
## partfunctioneducation administration                                                                                                 -2.9999999999942006    2.4696704550220168 1091.9999999657934495   -1.21  0.22473    
## partfunctionEducational instructor                                                                                                   -0.0833333333278706    2.9824104168877432 1091.9999999600356659   -0.03  0.97771    
## partfunctionElectrical Engineering                                                                                                   -0.9999999999927364    2.7611755097251098 1091.9999999570379714   -0.36  0.71730    
## partfunctionElectrical maintenance                                                                                                    0.5000000000026931    1.8862419669565820 1091.9999999585004389    0.27  0.79100    
## partfunctionEmployee                                                                                                                  0.0000000000058020    2.4696704550220163 1091.9999999657923127    0.00  1.00000    
## partfunctionEntertainment                                                                                                            -0.9999999999934294    2.8517298040329617 1091.9999999562269295   -0.35  0.72591    
## partfunctionEnvironmental science and remediation services                                                                            1.9166666666721286    2.9824104168877450 1091.9999999600381670    0.64  0.52058    
## partfunctionEverything- hiring, firing, operations, purchases for company and office .                                                0.0000000000058033    2.4696704550220181 1091.9999999642880084    0.00  1.00000    
## partfunctionFaculty                                                                                                                  -0.9999999999985407    1.4258649020172824 1091.9999999585422756   -0.70  0.48325    
## partfunctionFinancial services                                                                                                        0.1666666666733809    3.0664384185008950 1091.9999999616879904    0.05  0.95666    
## partfunctionFireplace Installer                                                                                                       0.9166666666721301    2.9824104168877437 1091.9999999600363481    0.31  0.75863    
## partfunctionFood delivery                                                                                                            -0.9999999999935932    2.8517298040328303 1091.9999999536937594   -0.35  0.72591    
## partfunctionForman                                                                                                                    0.0000000000014561    1.4258649020172831 1091.9999999585440946    0.00  1.00000    
## partfunctionFreelance gigworker                                                                                                      -2.9999999999941989    2.4696704550220154 1091.9999999657916305   -1.21  0.22473    
## partfunctiongas fitter                                                                                                               -0.9999999999985398    1.4258649020172838 1091.9999999585463684   -0.70  0.48325    
## partfunctionGeological lab testing                                                                                                    0.0000000000034921    2.0164774825441989 1091.9999999576893970    0.00  1.00000    
## partfunctionGrocery Management                                                                                                       -2.9999999999941909    2.4696704550220181 1091.9999999642882358   -1.21  0.22473    
## partfunctionGrocery Sales                                                                                                             0.0000000000014496    1.4258649020172827 1091.9999999585431851    0.00  1.00000    
## partfunctionHealthcare                                                                                                               -3.9999999999926343    2.6675489715849663 1091.9999999600881893   -1.50  0.13403    
## partfunctionHomehealth Manager                                                                                                       -3.9999999999927831    2.8517298040328032 1091.9999999536516953   -1.40  0.16100    
## partfunctionHuman Resources                                                                                                          -1.3333333333260589    2.6356011248360756 1091.9999999572785327   -0.51  0.61303    
## partfunctionI am the rental property owner/manager.                                                                                   0.0000000000034933    2.0164774825442011 1091.9999999576232312    0.00  1.00000    
## partfunctionI an associate.                                                                                                           0.5000000000026924    1.8862419669565855 1091.9999999585083970    0.27  0.79100    
## partfunctioni'm a small business owner -- sole proprietorship that provides tutoring and academic consulting                         -2.9999999999941864    2.4696704550220159 1091.9999999657920853   -1.21  0.22473    
## partfunctionindividual contributor                                                                                                    3.0000000000034959    2.0164774825442002 1091.9999999554302121    1.49  0.13711    
## partfunctionInformation Networking                                                                                                    1.9166666666721281    2.9824104168877446 1091.9999999600372576    0.64  0.52058    
## partfunctionInformation Security                                                                                                     -2.9999999999927338    2.6675489715850542 1091.9999999615238266   -1.12  0.26099    
## partfunctionInformation Technology (IT)                                                                                              -3.6666666666592493    2.6356011248360729 1091.9999999572323759   -1.39  0.16445    
## partfunctionjanitor/cleaner                                                                                                          -0.0833333333278659    2.9824104168877419 1091.9999999600333922   -0.03  0.97771    
## partfunctionLegal services                                                                                                           -0.9999999999927371    2.7611755097251125 1091.9999999570416094   -0.36  0.71730    
## partfunctionLibrary Assistant                                                                                                        -2.9999999999941926    2.4696704550220145 1091.9999999642816420   -1.21  0.22473    
## partfunctionlibrary worker                                                                                                           -3.9999999999935860    2.8517298040328316 1091.9999999536951236   -1.40  0.16100    
## partfunctionmaintenance manager                                                                                                      -3.9999999999927369    2.7611755097251129 1091.9999999570804903   -1.45  0.14772    
## partfunctionmaintenance mechanic                                                                                                     -0.9999999999927777    2.8517298040328058 1091.9999999674405444   -0.35  0.72591    
## partfunctionManagement                                                                                                               -0.9999999999985421    1.4258649020172838 1091.9999999585468231   -0.70  0.48325    
## partfunctionmanager                                                                                                                  -0.9999999999927338    2.7611755097251134 1091.9999999570807176   -0.36  0.71730    
## partfunctionManual Laborer                                                                                                           -0.9999999999927761    2.8517298040328045 1091.9999999674387254   -0.35  0.72591    
## partfunctionManufacturing                                                                                                             0.0000000000034931    2.0164774825441998 1091.9999999576912160    0.00  1.00000    
## partfunctionMarketing                                                                                                                 1.9166666666721517    2.9824104168877876 1091.9999999474973720    0.64  0.52058    
## partfunctionMechanical Engineering                                                                                                    2.4166666666734216    3.3057317818543801 1091.9999999574858975    0.73  0.46490    
## partfunctionMedia Clerk                                                                                                              -0.9999999999927875    2.8517298040328050 1091.9999999559868229   -0.35  0.72591    
## partfunctionOperations                                                                                                               -2.2999999999927110    2.5902122252903057 1091.9999999585947990   -0.89  0.37476    
## partfunctionPackage delivery                                                                                                         -0.9999999999927823    2.8517298040328063 1091.9999999559886419   -0.35  0.72591    
## partfunctionPatient recruitment                                                                                                       0.0000000000034953    2.0164774825442002 1091.9999999554302121    0.00  1.00000    
## partfunctionPersonal assistant                                                                                                        3.0000000000034892    2.0164774825441998 1091.9999999576205028    1.49  0.13711    
## partfunctionPhotographer                                                                                                              1.5000000000026916    1.8862419669565840 1091.9999999585052137    0.80  0.42665    
## partfunctionPrinter Operator                                                                                                          1.0000000000014586    1.4258649020172838 1091.9999999585463684    0.70  0.48325    
## partfunctionPrivate Education                                                                                                         0.5000000000026902    1.8862419669565844 1091.9999999585058958    0.27  0.79100    
## partfunctionProduct Management                                                                                                       -1.9999999999927327    2.6356011248361098 1091.9999999572933120   -0.76  0.44811    
## partfunctionProgram Management                                                                                                       -0.9999999999927399    2.7611755097251218 1091.9999999582623786   -0.36  0.71730    
## partfunctionProject Management                                                                                                       -2.9999999999926490    2.6675489715850182 1091.9999999601732270   -1.12  0.26099    
## partfunctionProperty technician                                                                                                       1.0000000000034923    2.0164774825442007 1091.9999999576218670    0.50  0.62005    
## partfunctionPublic Relations                                                                                                         -0.9999999999927435    2.7611755097251067 1091.9999999643848696   -0.36  0.71730    
## partfunctionPurchasing agent                                                                                                         -3.9999999999935940    2.8517298040328347 1091.9999999674848823   -1.40  0.16100    
## partfunctionResearch development                                                                                                     -0.9999999999927363    2.7611755097251098 1091.9999999570375167   -0.36  0.71730    
## partfunctionSales                                                                                                                    -1.8333333333261690    2.6032612359635139 1091.9999999612152806   -0.70  0.48143    
## partfunctionSchool Safety                                                                                                            -1.9999999999936002    2.8517298040328316 1091.9999999536955784   -0.70  0.48325    
## partfunctionSchool/Education                                                                                                         -2.9999999999942073    2.4696704550220203 1091.9999999551025667   -1.21  0.22473    
## partfunctionscientific research consulting                                                                                            0.0000000000014546    1.4258649020172847 1091.9999999585490968    0.00  1.00000    
## partfunctionScientist                                                                                                                 2.0000000000065614    2.8517298040329608 1091.9999999676781499    0.70  0.48325    
## partfunctionSenior Scientist                                                                                                         -0.9999999999927942    2.8517298040328054 1091.9999999559877324   -0.35  0.72591    
## partfunctionSkilled tradesman                                                                                                        -0.4999999999973112    1.8862419669565869 1091.9999999572189608   -0.27  0.79100    
## partfunctionSocial worker                                                                                                            -2.9999999999942020    2.4696704550220181 1091.9999999657954959   -1.21  0.22473    
## partfunctionSoftware Engineering                                                                                                     -0.9999999999932507    2.4696704550211339 1091.9999999612630290   -0.40  0.68562    
## partfunctionSpecial Education Paraprofessional                                                                                       -1.0833333333278732    2.9824104168877454 1091.9999999600390765   -0.36  0.71650    
## partfunctionState infrastructure                                                                                                     -3.9999999999936051    2.8517298040328329 1091.9999999559590833   -1.40  0.16100    
## partfunctionSupport students with IEPs                                                                                               -0.9999999999927393    2.7611755097251138 1091.9999999570820819   -0.36  0.71730    
## partfunctionTeach High Shcool                                                                                                         3.0000000000034914    2.0164774825441980 1091.9999999576875780    1.49  0.13711    
## partfunctionteacher                                                                                                                  -1.9999999999927818    2.8517298040328027 1091.9999999536507858   -0.70  0.48325    
## partfunctionTeacher                                                                                                                   0.0000000000046463    2.0164774825437473 1091.9999999682343059    0.00  1.00000    
## partfunctionTeacher                                                                                                                   0.0000000000014584    1.4258649020172818 1091.9999999585404566    0.00  1.00000    
## partfunctionTeacher assistant                                                                                                        -0.9999999999936009    2.8517298040328325 1091.9999999559586286   -0.35  0.72591    
## partfunctionTeaching                                                                                                                  0.9166666666721273    2.9824104168877463 1091.9999999601045602    0.31  0.75863    
## partfunctionTeaching English                                                                                                         -1.9999999999936018    2.8517298040328320 1091.9999999536960331   -0.70  0.48325    
## partfunctiontechnical writer                                                                                                         -1.0833333333278741    2.9824104168877472 1091.9999999601059244   -0.36  0.71650    
## partfunctionTo do manual labor and greet customers                                                                                   -0.0833333333254230    3.6700444155447940 1091.9999999613253294   -0.02  0.98189    
## partfunctiontranscription                                                                                                             0.5000000000026946    1.8862419669565855 1091.9999999585086243    0.27  0.79100    
## partfunctionTutor/teacher                                                                                                             2.0000000000014593    1.4258649020172840 1091.9999999701408342    1.40  0.16100    
## partfunctionVolunteer                                                                                                                -2.9999999999927391    2.7611755097251134 1091.9999999570813998   -1.09  0.27750    
## partfunctionWarehouse worker                                                                                                         -2.9999999999941953    2.4696704550220172 1091.9999999657943590   -1.21  0.22473    
## partfunctionwarehousing                                                                                                               0.5000000000026867    1.8862419669565853 1091.9999999585079422    0.27  0.79100    
## partfunctionWorker                                                                                                                   -0.0833333333278761    2.9824104168877463 1091.9999999600399860   -0.03  0.97771    
## sortOrder3                                                                                                                           -0.9999999999985392    1.2348352275114363 1091.9999999565629878   -0.81  0.41822    
## sortOrder2                                                                                                                           -2.9166666666648640    1.8176282397832821 1091.9999999620467861   -1.60  0.10886    
## sortOrder4                                                                                                                            1.9166666666673640    2.3101651752338150 1091.9999999609538008    0.83  0.40691    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.                                                                                2.1666666666692214    3.1076005075175646 1091.9999999563101483    0.70  0.48582    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.                                                                                3.5833333333351831    3.1076005075175264 1091.9999999562562607    1.15  0.24913    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.                                                                                1.9166666666674175    3.1076005075171849 1091.9999999654796738    0.62  0.53752    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                                                                                 6.4999999999960938    3.1883308476409518 1091.9999999557217052    2.04  0.04172 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                                                                                 1.4999999999957845    3.1883308476403118 1091.9999999566537099    0.47  0.63812    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                                                                                 1.9999999999949827    3.1883308476407359 1091.9999999572344223    0.63  0.53060    
## pers_simplifiedM2(JA):partfunctionAccount Management                                                                                 -0.5000000000040352    2.6675489715873044 1091.9999999585045316   -0.19  0.85135    
## pers_simplifiedW1(MC):partfunctionAccount Management                                                                                 -1.5000000000034694    2.6675489715872533 1091.9999999584210855   -0.56  0.57402    
## pers_simplifiedW2(LM):partfunctionAccount Management                                                                                 -0.0000000000031173    2.6675489715872613 1091.9999999584340458    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionAccounting                                                                                          6.9999999999920854    3.7724839339113143 1091.9999999551057499    1.86  0.06379 .  
## pers_simplifiedW1(MC):partfunctionAccounting                                                                                          2.9999999999923421    3.7724839339105278 1091.9999999621120423    0.80  0.42665    
## pers_simplifiedW2(LM):partfunctionAccounting                                                                                          1.9999999999918885    3.7724839339112868 1091.9999999551137080    0.53  0.59611    
## pers_simplifiedM2(JA):partfunctionAdministrative Assistant                                                                            4.9999999999931370    4.0329549650878347 1091.9999999686026513    1.24  0.21532    
## pers_simplifiedW1(MC):partfunctionAdministrative Assistant                                                                            1.9999999999932183    4.0329549650871908 1091.9999999541203124    0.50  0.62005    
## pers_simplifiedW2(LM):partfunctionAdministrative Assistant                                                                            0.9999999999929293    4.0329549650877921 1091.9999999569618012    0.25  0.80421    
## pers_simplifiedM2(JA):partfunctionAdministrative services                                                                             6.3333333333254238    3.7273028557503149 1091.9999999588219453    1.70  0.08957 .  
## pers_simplifiedW1(MC):partfunctionAdministrative services                                                                             0.6666666666590375    3.7273028557495249 1091.9999999578956249    0.18  0.85808    
## pers_simplifiedW2(LM):partfunctionAdministrative services                                                                             0.9999999999919015    3.7273028557502821 1091.9999999600659066    0.27  0.78853    
## pers_simplifiedM2(JA):partfunctionassistant manger                                                                                    6.8333333333228490    5.1902265869755508 1091.9999999617161848    1.32  0.18826    
## pers_simplifiedW1(MC):partfunctionassistant manger                                                                                   -0.5833333333428612    5.1902265869749327 1091.9999999611950443   -0.11  0.91053    
## pers_simplifiedW2(LM):partfunctionassistant manger                                                                                    2.0833333333244544    5.1902265869752338 1091.9999999614492481    0.40  0.68821    
## pers_simplifiedM2(JA):partfunctionBook editor                                                                                        -1.5000000000040303    2.6675489715872942 1091.9999999584883881   -0.56  0.57402    
## pers_simplifiedW1(MC):partfunctionBook editor                                                                                        -0.5000000000034650    2.6675489715872427 1091.9999999584035777   -0.19  0.85135    
## pers_simplifiedW2(LM):partfunctionBook editor                                                                                        -0.0000000000031163    2.6675489715872511 1091.9999999584572379    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionBusiness Development                                                                                4.3333333333289570    4.2177652601265390 1091.9999999485680746    1.03  0.30446    
## pers_simplifiedW1(MC):partfunctionBusiness Development                                                                                0.2499999999951467    4.2177652601259767 1091.9999999605881840    0.06  0.95275    
## pers_simplifiedW2(LM):partfunctionBusiness Development                                                                               -0.2500000000058849    4.2177652601264537 1091.9999999610827217   -0.06  0.95275    
## pers_simplifiedM2(JA):partfunctionCase manager                                                                                        3.9999999999925211    4.0329549650879084 1091.9999999571589342    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionCase manager                                                                                       -0.0000000000072429    4.0329549650871996 1091.9999999679148459    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionCase manager                                                                                       -0.0000000000072799    4.0329549650877947 1091.9999999569647571    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionchildcare                                                                                          -1.5000000000040286    2.6675489715872915 1091.9999999584838406   -0.56  0.57402    
## pers_simplifiedW1(MC):partfunctionchildcare                                                                                          -0.5000000000034638    2.6675489715872387 1091.9999999583972112   -0.19  0.85135    
## pers_simplifiedW2(LM):partfunctionchildcare                                                                                          -0.0000000000031168    2.6675489715872480 1091.9999999584124453    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionCivil Engineering                                                                                  -1.6666666666710430    4.2177652601265168 1091.9999999611482053   -0.40  0.69281    
## pers_simplifiedW1(MC):partfunctionCivil Engineering                                                                                  -2.7500000000048610    4.2177652601259457 1091.9999999479528014   -0.65  0.51454    
## pers_simplifiedW2(LM):partfunctionCivil Engineering                                                                                  -3.2500000000058988    4.2177652601264404 1091.9999999610688519   -0.77  0.44114    
## pers_simplifiedM2(JA):partfunctioncollege educator                                                                                    3.9999999999925255    4.0329549650879102 1091.9999999570902673    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctioncollege educator                                                                                   -0.0000000000072366    4.0329549650872032 1091.9999999563945039    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctioncollege educator                                                                                   -0.0000000000072739    4.0329549650877956 1091.9999999569661213    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionCommunications                                                                                      3.9999999999920490    3.9048918539469755 1091.9999999584335910    1.02  0.30589    
## pers_simplifiedW1(MC):partfunctionCommunications                                                                                     -0.0000000000076951    3.9048918539462250 1091.9999999576316441    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionCommunications                                                                                     -0.0000000000081432    3.9048918539469484 1091.9999999584035777    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionConstruction                                                                                        4.9999999999920828    3.9048918539469746 1091.9999999584326815    1.28  0.20066    
## pers_simplifiedW1(MC):partfunctionConstruction                                                                                        0.9999999999923261    3.9048918539462161 1091.9999999588274022    0.26  0.79793    
## pers_simplifiedW2(LM):partfunctionConstruction                                                                                        1.9999999999918701    3.9048918539469430 1091.9999999596038833    0.51  0.60863    
## pers_simplifiedM2(JA):partfunctionConstruction, system management                                                                     0.3333333333289390    4.2177652601265292 1091.9999999611609383    0.08  0.93702    
## pers_simplifiedW1(MC):partfunctionConstruction, system management                                                                     1.2499999999951215    4.2177652601259599 1091.9999999605706762    0.30  0.76701    
## pers_simplifiedW2(LM):partfunctionConstruction, system management                                                                    -1.2500000000059108    4.2177652601264519 1091.9999999610802206   -0.30  0.76701    
## pers_simplifiedM2(JA):partfunctionConsultant                                                                                          1.9999999999982498    2.0164774825446785 1091.9999999586577815    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionConsultant                                                                                          0.9999999999982997    2.0164774825446536 1091.9999999586034392    0.50  0.62005    
## pers_simplifiedW2(LM):partfunctionConsultant                                                                                          0.9999999999982969    2.0164774825446821 1091.9999999586659669    0.50  0.62005    
## pers_simplifiedM2(JA):partfunctioncopywriter                                                                                          1.9999999999982487    2.0164774825446790 1091.9999999586586910    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctioncopywriter                                                                                         -2.0000000000017044    2.0164774825446536 1091.9999999586038939   -0.99  0.32150    
## pers_simplifiedW2(LM):partfunctioncopywriter                                                                                         -0.0000000000017060    2.0164774825446821 1091.9999999587355433    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionCustomer Experience/Support                                                                         3.8333333333269874    4.4140441836479996 1091.9999999574074536    0.87  0.38534    
## pers_simplifiedW1(MC):partfunctionCustomer Experience/Support                                                                         1.7499999999936804    4.4140441836472810 1091.9999999567546638    0.40  0.69184    
## pers_simplifiedW2(LM):partfunctionCustomer Experience/Support                                                                         0.7499999999929592    4.4140441836479791 1091.9999999574461071    0.17  0.86511    
## pers_simplifiedM2(JA):partfunctionData Analysis                                                                                      -1.1666666666733514    4.5089807260656283 1091.9999999568410658   -0.26  0.79588    
## pers_simplifiedW1(MC):partfunctionData Analysis                                                                                       2.4999999999934084    4.5089807260649364 1091.9999999544181719    0.55  0.57939    
## pers_simplifiedW2(LM):partfunctionData Analysis                                                                                      -0.0000000000072662    4.5089807260656398 1091.9999999550996108    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctiondATA COLLECTION                                                                                     4.9999999999925233    4.0329549650879066 1091.9999999571564331    1.24  0.21532    
## pers_simplifiedW1(MC):partfunctiondATA COLLECTION                                                                                    -1.0000000000072358    4.0329549650871979 1091.9999999679118901   -0.25  0.80421    
## pers_simplifiedW2(LM):partfunctiondATA COLLECTION                                                                                    -0.0000000000072758    4.0329549650877921 1091.9999999685564944    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionData Processing                                                                                     5.8333333333228490    5.1902265869755535 1091.9999999630836101    1.12  0.26130    
## pers_simplifiedW1(MC):partfunctionData Processing                                                                                     1.4166666666571446    5.1902265869749336 1091.9999999611964085    0.27  0.78494    
## pers_simplifiedW2(LM):partfunctionData Processing                                                                                     1.0833333333244588    5.1902265869752329 1091.9999999531255526    0.21  0.83470    
## pers_simplifiedM2(JA):partfunctionDesign                                                                                              1.9999999999925298    4.0329549650879066 1091.9999999571564331    0.50  0.62005    
## pers_simplifiedW1(MC):partfunctionDesign                                                                                             -4.0000000000072324    4.0329549650871988 1091.9999999679139364   -0.99  0.32150    
## pers_simplifiedW2(LM):partfunctionDesign                                                                                             -2.0000000000072711    4.0329549650877929 1091.9999999685574039   -0.50  0.62005    
## pers_simplifiedM2(JA):partfunctionDesign or creative services                                                                         8.9999999999921005    3.7724839339113063 1091.9999999630138063    2.39  0.01722 *  
## pers_simplifiedW1(MC):partfunctionDesign or creative services                                                                         2.9999999999923332    3.7724839339105043 1091.9999999542483238    0.80  0.42665    
## pers_simplifiedW2(LM):partfunctionDesign or creative services                                                                         3.9999999999918856    3.7724839339112735 1091.9999999550984739    1.06  0.28924    
## pers_simplifiedM2(JA):partfunctionDisaster restoration                                                                                4.9999999999920668    3.9048918539469719 1091.9999999596361704    1.28  0.20066    
## pers_simplifiedW1(MC):partfunctionDisaster restoration                                                                               -1.0000000000076792    3.9048918539462147 1091.9999999588260380   -0.26  0.79793    
## pers_simplifiedW2(LM):partfunctionDisaster restoration                                                                               -0.0000000000081328    3.9048918539469417 1091.9999999596020643    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionEducation                                                                                           4.9999999999920917    3.9048918539469750 1091.9999999584331363    1.28  0.20066    
## pers_simplifiedW1(MC):partfunctionEducation                                                                                          -1.0000000000076625    3.9048918539462183 1091.9999999575863967   -0.26  0.79793    
## pers_simplifiedW2(LM):partfunctionEducation                                                                                          -0.0000000000081163    3.9048918539469439 1091.9999999596047928    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionEducation                                                                                          -1.5000000000040217    2.6675489715872929 1091.9999999584863417   -0.56  0.57402    
## pers_simplifiedW1(MC):partfunctionEducation                                                                                          -0.5000000000034621    2.6675489715872405 1091.9999999583999397   -0.19  0.85135    
## pers_simplifiedW2(LM):partfunctionEducation                                                                                          -0.0000000000031140    2.6675489715872494 1091.9999999584149464    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctioneducation administration                                                                            5.9999999999933982    3.4926414520850209 1091.9999999574977210    1.72  0.08610 .  
## pers_simplifiedW1(MC):partfunctioneducation administration                                                                            1.9999999999935525    3.4926414520845550 1091.9999999554067927    0.57  0.56701    
## pers_simplifiedW2(LM):partfunctioneducation administration                                                                            3.9999999999934941    3.4926414520850164 1091.9999999575391030    1.15  0.25235    
## pers_simplifiedM2(JA):partfunctionEducational instructor                                                                              0.3333333333289336    4.2177652601265256 1091.9999999611573003    0.08  0.93702    
## pers_simplifiedW1(MC):partfunctionEducational instructor                                                                              1.2499999999951186    4.2177652601259572 1091.9999999605681751    0.30  0.76701    
## pers_simplifiedW2(LM):partfunctionEducational instructor                                                                             -1.2500000000059117    4.2177652601264501 1091.9999999610788564   -0.30  0.76701    
## pers_simplifiedM2(JA):partfunctionElectrical Engineering                                                                              4.9999999999920632    3.9048918539469679 1091.9999999596316229    1.28  0.20066    
## pers_simplifiedW1(MC):partfunctionElectrical Engineering                                                                             -1.0000000000076834    3.9048918539462112 1091.9999999576161827   -0.26  0.79793    
## pers_simplifiedW2(LM):partfunctionElectrical Engineering                                                                             -0.0000000000081349    3.9048918539469386 1091.9999999595988811    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionElectrical maintenance                                                                             -1.5000000000040257    2.6675489715872911 1091.9999999584831585   -0.56  0.57402    
## pers_simplifiedW1(MC):partfunctionElectrical maintenance                                                                             -0.5000000000034617    2.6675489715872374 1091.9999999662718437   -0.19  0.85135    
## pers_simplifiedW2(LM):partfunctionElectrical maintenance                                                                             -0.0000000000031163    2.6675489715872467 1091.9999999584101715    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionEmployee                                                                                            0.9999999999934008    3.4926414520850200 1091.9999999574965841    0.29  0.77469    
## pers_simplifiedW1(MC):partfunctionEmployee                                                                                           -0.0000000000064484    3.4926414520845541 1091.9999999554058832    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionEmployee                                                                                           -1.0000000000065066    3.4926414520850160 1091.9999999575384209   -0.29  0.77469    
## pers_simplifiedM2(JA):partfunctionEntertainment                                                                                       3.9999999999925149    4.0329549650879102 1091.9999999571605258    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionEntertainment                                                                                      -0.0000000000072423    4.0329549650872014 1091.9999999541316811    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionEntertainment                                                                                      -0.0000000000072816    4.0329549650877947 1091.9999999569652118    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionEnvironmental science and remediation services                                                     -0.6666666666710696    4.2177652601265292 1091.9999999611609383   -0.16  0.87444    
## pers_simplifiedW1(MC):partfunctionEnvironmental science and remediation services                                                     -3.7500000000048841    4.2177652601259608 1091.9999999605720404   -0.89  0.37415    
## pers_simplifiedW2(LM):partfunctionEnvironmental science and remediation services                                                     -3.2500000000059153    4.2177652601264519 1091.9999999610806753   -0.77  0.44114    
## pers_simplifiedM2(JA):partfunctionEverything- hiring, firing, operations, purchases for company and office .                          0.9999999999933957    3.4926414520850222 1091.9999999574995400    0.29  0.77469    
## pers_simplifiedW1(MC):partfunctionEverything- hiring, firing, operations, purchases for company and office .                         -2.0000000000064504    3.4926414520845577 1091.9999999554574970   -0.57  0.56701    
## pers_simplifiedW2(LM):partfunctionEverything- hiring, firing, operations, purchases for company and office .                          0.9999999999934911    3.4926414520850182 1091.9999999666845270    0.29  0.77469    
## pers_simplifiedM2(JA):partfunctionFaculty                                                                                             1.9999999999982496    2.0164774825446776 1091.9999999586557351    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionFaculty                                                                                             0.9999999999982966    2.0164774825446519 1091.9999999586004833    0.50  0.62005    
## pers_simplifiedW2(LM):partfunctionFaculty                                                                                             0.9999999999982949    2.0164774825446812 1091.9999999586636932    0.50  0.62005    
## pers_simplifiedM2(JA):partfunctionFinancial services                                                                                  0.8333333333266564    4.3365987996271889 1091.9999999629553713    0.19  0.84765    
## pers_simplifiedW1(MC):partfunctionFinancial services                                                                                  0.2499999999933375    4.3365987996264517 1091.9999999622739324    0.06  0.95404    
## pers_simplifiedW2(LM):partfunctionFinancial services                                                                                 -1.7500000000073366    4.3365987996271951 1091.9999999510393991   -0.40  0.68663    
## pers_simplifiedM2(JA):partfunctionFireplace Installer                                                                                 2.3333333333289321    4.2177652601265283 1091.9999999611600288    0.55  0.58023    
## pers_simplifiedW1(MC):partfunctionFireplace Installer                                                                                -2.7500000000048850    4.2177652601259590 1091.9999999605702214   -0.65  0.51454    
## pers_simplifiedW2(LM):partfunctionFireplace Installer                                                                                -3.2500000000059170    4.2177652601264510 1091.9999999610793111   -0.77  0.44114    
## pers_simplifiedM2(JA):partfunctionFood delivery                                                                                       4.9999999999931388    4.0329549650878320 1091.9999999548153937    1.24  0.21532    
## pers_simplifiedW1(MC):partfunctionFood delivery                                                                                      -1.0000000000067819    4.0329549650871899 1091.9999999563801794   -0.25  0.80421    
## pers_simplifiedW2(LM):partfunctionFood delivery                                                                                      -0.0000000000070678    4.0329549650877894 1091.9999999570295586    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionForman                                                                                             -0.0000000000017511    2.0164774825446781 1091.9999999586573267    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionForman                                                                                             -0.0000000000017034    2.0164774825446528 1091.9999999586023023    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionForman                                                                                             -0.0000000000017061    2.0164774825446821 1091.9999999586655122    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionFreelance gigworker                                                                                 5.9999999999933928    3.4926414520850200 1091.9999999666863459    1.72  0.08610 .  
## pers_simplifiedW1(MC):partfunctionFreelance gigworker                                                                                 1.9999999999935512    3.4926414520845550 1091.9999999554067927    0.57  0.56701    
## pers_simplifiedW2(LM):partfunctionFreelance gigworker                                                                                 3.9999999999934923    3.4926414520850155 1091.9999999575379661    1.15  0.25235    
## pers_simplifiedM2(JA):partfunctiongas fitter                                                                                          2.9999999999982414    2.0164774825446785 1091.9999999586582362    1.49  0.13711    
## pers_simplifiedW1(MC):partfunctiongas fitter                                                                                         -0.0000000000017016    2.0164774825446532 1091.9999999586032118    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctiongas fitter                                                                                          0.9999999999982950    2.0164774825446825 1091.9999999586668764    0.50  0.62005    
## pers_simplifiedM2(JA):partfunctionGeological lab testing                                                                             -0.0000000000043204    2.8517298040342380 1091.9999999580415988    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionGeological lab testing                                                                             -0.0000000000040092    2.8517298040340524 1091.9999999577566996    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionGeological lab testing                                                                             -0.0000000000039355    2.8517298040342305 1091.9999999581007160    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionGrocery Management                                                                                  3.9999999999933897    3.4926414520850213 1091.9999999574984031    1.15  0.25235    
## pers_simplifiedW1(MC):partfunctionGrocery Management                                                                                  3.9999999999935492    3.4926414520845568 1091.9999999554565875    1.15  0.25235    
## pers_simplifiedW2(LM):partfunctionGrocery Management                                                                                  3.9999999999934910    3.4926414520850173 1091.9999999575402398    1.15  0.25235    
## pers_simplifiedM2(JA):partfunctionGrocery Sales                                                                                      -0.0000000000017512    2.0164774825446781 1091.9999999586573267    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionGrocery Sales                                                                                      -0.0000000000016996    2.0164774825446528 1091.9999999586023023    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionGrocery Sales                                                                                      -0.0000000000017048    2.0164774825446821 1091.9999999586659669    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionHealthcare                                                                                          8.9999999999919709    3.7724839339112290 1091.9999999550070697    2.39  0.01722 *  
## pers_simplifiedW1(MC):partfunctionHealthcare                                                                                          3.4999999999922435    3.7724839339104337 1091.9999999541257694    0.93  0.35373    
## pers_simplifiedW2(LM):partfunctionHealthcare                                                                                          3.4999999999917577    3.7724839339111700 1091.9999999549788754    0.93  0.35373    
## pers_simplifiedM2(JA):partfunctionHomehealth Manager                                                                                  6.9999999999919673    4.0329549650877849 1091.9999999570247837    1.74  0.08290 .  
## pers_simplifiedW1(MC):partfunctionHomehealth Manager                                                                                  2.9999999999921432    4.0329549650871375 1091.9999999540621047    0.74  0.45711    
## pers_simplifiedW2(LM):partfunctionHomehealth Manager                                                                                  5.9999999999917764    4.0329549650877379 1091.9999999569031388    1.49  0.13711    
## pers_simplifiedM2(JA):partfunctionHuman Resources                                                                                     4.3333333333253927    3.7273028557503167 1091.9999999588235369    1.16  0.24525    
## pers_simplifiedW1(MC):partfunctionHuman Resources                                                                                     0.3333333333256460    3.7273028557495183 1091.9999999579292762    0.09  0.92876    
## pers_simplifiedW2(LM):partfunctionHuman Resources                                                                                     0.6666666666585306    3.7273028557502905 1091.9999999587516868    0.18  0.85808    
## pers_simplifiedM2(JA):partfunctionI am the rental property owner/manager.                                                            -0.0000000000043222    2.8517298040342403 1091.9999999580452368    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionI am the rental property owner/manager.                                                            -0.0000000000040091    2.8517298040340551 1091.9999999578315055    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionI am the rental property owner/manager.                                                            -0.0000000000039366    2.8517298040342327 1091.9999999580338681    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionI an associate.                                                                                    -0.5000000000040289    2.6675489715872938 1091.9999999584872512   -0.19  0.85135    
## pers_simplifiedW1(MC):partfunctionI an associate.                                                                                    -1.5000000000034621    2.6675489715872414 1091.9999999584015313   -0.56  0.57402    
## pers_simplifiedW2(LM):partfunctionI an associate.                                                                                    -0.0000000000031150    2.6675489715872502 1091.9999999584163106    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctioni'm a small business owner -- sole proprietorship that provides tutoring and academic consulting    5.9999999999933911    3.4926414520850200 1091.9999999574970388    1.72  0.08610 .  
## pers_simplifiedW1(MC):partfunctioni'm a small business owner -- sole proprietorship that provides tutoring and academic consulting    1.9999999999935518    3.4926414520845537 1091.9999999554054284    0.57  0.56701    
## pers_simplifiedW2(LM):partfunctioni'm a small business owner -- sole proprietorship that provides tutoring and academic consulting    3.9999999999934959    3.4926414520850160 1091.9999999575384209    1.15  0.25235    
## pers_simplifiedM2(JA):partfunctionindividual contributor                                                                             -3.0000000000043188    2.8517298040342389 1091.9999999580425083   -1.05  0.29304    
## pers_simplifiedW1(MC):partfunctionindividual contributor                                                                             -3.0000000000040057    2.8517298040340537 1091.9999999577589733   -1.05  0.29304    
## pers_simplifiedW2(LM):partfunctionindividual contributor                                                                             -6.0000000000039355    2.8517298040342314 1091.9999999580313670   -2.10  0.03561 *  
## pers_simplifiedM2(JA):partfunctionInformation Networking                                                                             -0.6666666666710658    4.2177652601265292 1091.9999999611609383   -0.16  0.87444    
## pers_simplifiedW1(MC):partfunctionInformation Networking                                                                             -1.7500000000048803    4.2177652601259599 1091.9999999605713583   -0.41  0.67829    
## pers_simplifiedW2(LM):partfunctionInformation Networking                                                                             -5.2500000000059135    4.2177652601264510 1091.9999999610793111   -1.24  0.21350    
## pers_simplifiedM2(JA):partfunctionInformation Security                                                                                7.4999999999920570    3.7724839339113037 1091.9999999551332621    1.99  0.04705 *  
## pers_simplifiedW1(MC):partfunctionInformation Security                                                                                1.9999999999923186    3.7724839339105189 1091.9999999542649221    0.53  0.59611    
## pers_simplifiedW2(LM):partfunctionInformation Security                                                                                2.4999999999918665    3.7724839339112735 1091.9999999550984739    0.66  0.50767    
## pers_simplifiedM2(JA):partfunctionInformation Technology (IT)                                                                         8.3333333333251698    3.7273028557502852 1091.9999999601100171    2.24  0.02557 *  
## pers_simplifiedW1(MC):partfunctionInformation Technology (IT)                                                                         3.9999999999921139    3.7273028557495040 1091.9999999578710685    1.07  0.28344    
## pers_simplifiedW2(LM):partfunctionInformation Technology (IT)                                                                         2.3333333333249917    3.7273028557502785 1091.9999999587375896    0.63  0.53144    
## pers_simplifiedM2(JA):partfunctionjanitor/cleaner                                                                                     3.3333333333289326    4.2177652601265265 1091.9999999611577550    0.79  0.42952    
## pers_simplifiedW1(MC):partfunctionjanitor/cleaner                                                                                    -1.7500000000048865    4.2177652601259572 1091.9999999605684025   -0.41  0.67829    
## pers_simplifiedW2(LM):partfunctionjanitor/cleaner                                                                                    -1.2500000000059182    4.2177652601264475 1091.9999999610763552   -0.30  0.76701    
## pers_simplifiedM2(JA):partfunctionLegal services                                                                                      3.9999999999920712    3.9048918539469755 1091.9999999584338184    1.02  0.30589    
## pers_simplifiedW1(MC):partfunctionLegal services                                                                                     -0.0000000000076784    3.9048918539462116 1091.9999999576168648    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionLegal services                                                                                     -0.0000000000081324    3.9048918539469324 1091.9999999583858425    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionLibrary Assistant                                                                                   5.9999999999933928    3.4926414520850182 1091.9999999666845270    1.72  0.08610 .  
## pers_simplifiedW1(MC):partfunctionLibrary Assistant                                                                                   1.9999999999935474    3.4926414520845537 1091.9999999554054284    0.57  0.56701    
## pers_simplifiedW2(LM):partfunctionLibrary Assistant                                                                                   3.9999999999934892    3.4926414520850146 1091.9999999560288870    1.15  0.25235    
## pers_simplifiedM2(JA):partfunctionlibrary worker                                                                                      7.9999999999931370    4.0329549650878329 1091.9999999570061391    1.98  0.04754 *  
## pers_simplifiedW1(MC):partfunctionlibrary worker                                                                                      3.9999999999932152    4.0329549650871890 1091.9999999541178113    0.99  0.32150    
## pers_simplifiedW2(LM):partfunctionlibrary worker                                                                                      3.9999999999929310    4.0329549650877894 1091.9999999569595275    0.99  0.32150    
## pers_simplifiedM2(JA):partfunctionmaintenance manager                                                                                 9.9999999999920668    3.9048918539469715 1091.9999999596354883    2.56  0.01057 *  
## pers_simplifiedW1(MC):partfunctionmaintenance manager                                                                                 2.9999999999923213    3.9048918539462134 1091.9999999588246737    0.77  0.44249    
## pers_simplifiedW2(LM):partfunctionmaintenance manager                                                                                 2.9999999999918678    3.9048918539469417 1091.9999999596022917    0.77  0.44249    
## pers_simplifiedM2(JA):partfunctionmaintenance mechanic                                                                                3.9999999999919651    4.0329549650877876 1091.9999999570281943    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionmaintenance mechanic                                                                               -0.0000000000078526    4.0329549650871401 1091.9999999540650606    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionmaintenance mechanic                                                                               -0.0000000000082254    4.0329549650877405 1091.9999999569065494    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionManagement                                                                                          1.9999999999982512    2.0164774825446781 1091.9999999586573267    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionManagement                                                                                          0.9999999999982992    2.0164774825446528 1091.9999999586018475    0.50  0.62005    
## pers_simplifiedW2(LM):partfunctionManagement                                                                                          0.9999999999982960    2.0164774825446830 1091.9999999586673312    0.50  0.62005    
## pers_simplifiedM2(JA):partfunctionmanager                                                                                             4.9999999999920650    3.9048918539469719 1091.9999999596359430    1.28  0.20066    
## pers_simplifiedW1(MC):partfunctionmanager                                                                                            -1.0000000000076763    3.9048918539462143 1091.9999999588258106   -0.26  0.79793    
## pers_simplifiedW2(LM):partfunctionmanager                                                                                            -0.0000000000081331    3.9048918539469430 1091.9999999596036560    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionManual Laborer                                                                                      3.9999999999919629    4.0329549650877858 1091.9999999570261480    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionManual Laborer                                                                                     -0.0000000000078505    4.0329549650871392 1091.9999999563256097    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionManual Laborer                                                                                     -0.0000000000082227    4.0329549650877397 1091.9999999569056399    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionManufacturing                                                                                      -1.0000000000043161    2.8517298040342380 1091.9999999580409167   -0.35  0.72591    
## pers_simplifiedW1(MC):partfunctionManufacturing                                                                                       0.9999999999959901    2.8517298040340529 1091.9999999555666363    0.35  0.72591    
## pers_simplifiedW2(LM):partfunctionManufacturing                                                                                      -0.0000000000039373    2.8517298040342314 1091.9999999580313670    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionMarketing                                                                                          -1.6666666666710972    4.2177652601265718 1091.9999999612043666   -0.40  0.69281    
## pers_simplifiedW1(MC):partfunctionMarketing                                                                                          -2.7500000000049152    4.2177652601259998 1091.9999999606127403   -0.65  0.51454    
## pers_simplifiedW2(LM):partfunctionMarketing                                                                                          -3.2500000000059517    4.2177652601264946 1091.9999999611252406   -0.77  0.44114    
## pers_simplifiedM2(JA):partfunctionMechanical Engineering                                                                             -3.1666666666734460    4.6750107194674637 1091.9999999602580374   -0.68  0.49832    
## pers_simplifiedW1(MC):partfunctionMechanical Engineering                                                                             -4.7500000000067129    4.6750107194667656 1091.9999999596054749   -1.02  0.30984    
## pers_simplifiedW2(LM):partfunctionMechanical Engineering                                                                             -1.7500000000073761    4.6750107194674744 1091.9999999602673597   -0.37  0.70823    
## pers_simplifiedM2(JA):partfunctionMedia Clerk                                                                                         4.9999999999919700    4.0329549650877867 1091.9999999570272848    1.24  0.21532    
## pers_simplifiedW1(MC):partfunctionMedia Clerk                                                                                        -1.0000000000078471    4.0329549650871392 1091.9999999563256097   -0.25  0.80421    
## pers_simplifiedW2(LM):partfunctionMedia Clerk                                                                                        -0.0000000000082204    4.0329549650877397 1091.9999999569051852    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionOperations                                                                                          6.5999999999920362    3.6631132584315069 1091.9999999615474735    1.80  0.07186 .  
## pers_simplifiedW1(MC):partfunctionOperations                                                                                          0.9999999999922926    3.6631132584306965 1091.9999999592093900    0.27  0.78491    
## pers_simplifiedW2(LM):partfunctionOperations                                                                                          1.5999999999918502    3.6631132584314678 1091.9999999531460162    0.44  0.66235    
## pers_simplifiedM2(JA):partfunctionPackage delivery                                                                                    3.9999999999919549    4.0329549650877867 1091.9999999570272848    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionPackage delivery                                                                                   -0.0000000000078525    4.0329549650871401 1091.9999999563265192    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionPackage delivery                                                                                   -0.0000000000082261    4.0329549650877414 1091.9999999685014700    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionPatient recruitment                                                                                -1.0000000000043221    2.8517298040342380 1091.9999999580415988   -0.35  0.72591    
## pers_simplifiedW1(MC):partfunctionPatient recruitment                                                                                 0.9999999999959841    2.8517298040340533 1091.9999999555673185    0.35  0.72591    
## pers_simplifiedW2(LM):partfunctionPatient recruitment                                                                                -0.0000000000039434    2.8517298040342314 1091.9999999580313670    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionPersonal assistant                                                                                 -3.0000000000043170    2.8517298040342376 1091.9999999580402346   -1.05  0.29304    
## pers_simplifiedW1(MC):partfunctionPersonal assistant                                                                                 -3.0000000000040119    2.8517298040340524 1091.9999999693511654   -1.05  0.29304    
## pers_simplifiedW2(LM):partfunctionPersonal assistant                                                                                 -6.0000000000039391    2.8517298040342314 1091.9999999580313670   -2.10  0.03561 *  
## pers_simplifiedM2(JA):partfunctionPhotographer                                                                                       -2.5000000000040230    2.6675489715872915 1091.9999999584836132   -0.94  0.34887    
## pers_simplifiedW1(MC):partfunctionPhotographer                                                                                       -1.5000000000034668    2.6675489715872400 1091.9999999583994850   -0.56  0.57402    
## pers_simplifiedW2(LM):partfunctionPhotographer                                                                                       -2.0000000000031193    2.6675489715872489 1091.9999999584140369   -0.75  0.45357    
## pers_simplifiedM2(JA):partfunctionPrinter Operator                                                                                   -0.0000000000017541    2.0164774825446790 1091.9999999586586910    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionPrinter Operator                                                                                   -3.0000000000017066    2.0164774825446528 1091.9999999586018475   -1.49  0.13711    
## pers_simplifiedW2(LM):partfunctionPrinter Operator                                                                                   -1.0000000000017100    2.0164774825446825 1091.9999999586668764   -0.50  0.62005    
## pers_simplifiedM2(JA):partfunctionPrivate Education                                                                                  -1.5000000000040279    2.6675489715872929 1091.9999999584858870   -0.56  0.57402    
## pers_simplifiedW1(MC):partfunctionPrivate Education                                                                                  -0.5000000000034653    2.6675489715872405 1091.9999999584003945   -0.19  0.85135    
## pers_simplifiedW2(LM):partfunctionPrivate Education                                                                                  -0.0000000000031177    2.6675489715872494 1091.9999999584149464    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionProduct Management                                                                                  5.9999999999920695    3.7273028557503483 1091.9999999588608262    1.61  0.10774    
## pers_simplifiedW1(MC):partfunctionProduct Management                                                                                  0.6666666666589830    3.7273028557495520 1091.9999999579270025    0.18  0.85808    
## pers_simplifiedW2(LM):partfunctionProduct Management                                                                                  1.3333333333251973    3.7273028557503141 1091.9999999588208084    0.36  0.72062    
## pers_simplifiedM2(JA):partfunctionProgram Management                                                                                  3.9999999999920748    3.9048918539469812 1091.9999999596464022    1.02  0.30589    
## pers_simplifiedW1(MC):partfunctionProgram Management                                                                                 -0.0000000000076757    3.9048918539462232 1091.9999999649817255    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionProgram Management                                                                                 -0.0000000000081311    3.9048918539469475 1091.9999999584022135    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionProject Management                                                                                  7.9999999999919726    3.7724839339112748 1091.9999999629771992    2.12  0.03418 *  
## pers_simplifiedW1(MC):partfunctionProject Management                                                                                  2.9999999999922169    3.7724839339104834 1091.9999999620604285    0.80  0.42665    
## pers_simplifiedW2(LM):partfunctionProject Management                                                                                  0.9999999999917687    3.7724839339112468 1091.9999999629444574    0.27  0.79100    
## pers_simplifiedM2(JA):partfunctionProperty technician                                                                                -0.0000000000043184    2.8517298040342389 1091.9999999580425083    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionProperty technician                                                                                -2.0000000000040092    2.8517298040340533 1091.9999999577585186   -0.70  0.48325    
## pers_simplifiedW2(LM):partfunctionProperty technician                                                                                -2.0000000000039391    2.8517298040342318 1091.9999999580322765   -0.70  0.48325    
## pers_simplifiedM2(JA):partfunctionPublic Relations                                                                                    5.9999999999920792    3.9048918539469684 1091.9999999596318503    1.54  0.12470    
## pers_simplifiedW1(MC):partfunctionPublic Relations                                                                                   -0.0000000000076739    3.9048918539462094 1091.9999999649660367    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionPublic Relations                                                                                   -2.0000000000081277    3.9048918539469377 1091.9999999596350335   -0.51  0.60863    
## pers_simplifiedM2(JA):partfunctionPurchasing agent                                                                                    6.9999999999931379    4.0329549650878356 1091.9999999570090949    1.74  0.08290 .  
## pers_simplifiedW1(MC):partfunctionPurchasing agent                                                                                    2.9999999999932210    4.0329549650871925 1091.9999999541216766    0.74  0.45711    
## pers_simplifiedW2(LM):partfunctionPurchasing agent                                                                                    5.9999999999929363    4.0329549650877938 1091.9999999569638476    1.49  0.13711    
## pers_simplifiedM2(JA):partfunctionResearch development                                                                                3.9999999999920708    3.9048918539469688 1091.9999999596323050    1.02  0.30589    
## pers_simplifiedW1(MC):partfunctionResearch development                                                                                0.9999999999923160    3.9048918539462116 1091.9999999576166374    0.26  0.79793    
## pers_simplifiedW2(LM):partfunctionResearch development                                                                               -1.0000000000081377    3.9048918539469391 1091.9999999595988811   -0.26  0.79793    
## pers_simplifiedM2(JA):partfunctionSales                                                                                               5.3333333333255535    3.6815673463011072 1091.9999999558306172    1.45  0.14772    
## pers_simplifiedW1(MC):partfunctionSales                                                                                               0.9999999999924504    3.6815673463002905 1091.9999999549033873    0.27  0.78596    
## pers_simplifiedW2(LM):partfunctionSales                                                                                               0.9999999999920055    3.6815673463010756 1091.9999999557935553    0.27  0.78596    
## pers_simplifiedM2(JA):partfunctionSchool Safety                                                                                       6.9999999999931468    4.0329549650878329 1091.9999999570065938    1.74  0.08290 .  
## pers_simplifiedW1(MC):partfunctionSchool Safety                                                                                      -0.0000000000067831    4.0329549650871881 1091.9999999563788151    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionSchool Safety                                                                                       0.9999999999929323    4.0329549650877912 1091.9999999569608917    0.25  0.80421    
## pers_simplifiedM2(JA):partfunctionSchool/Education                                                                                    5.9999999999934008    3.4926414520850249 1091.9999999559945536    1.72  0.08610 .  
## pers_simplifiedW1(MC):partfunctionSchool/Education                                                                                    1.9999999999935572    3.4926414520845586 1091.9999999554586338    0.57  0.56701    
## pers_simplifiedW2(LM):partfunctionSchool/Education                                                                                    3.9999999999934985    3.4926414520850191 1091.9999999666856638    1.15  0.25235    
## pers_simplifiedM2(JA):partfunctionscientific research consulting                                                                     -0.0000000000017562    2.0164774825446790 1091.9999999586591457    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionscientific research consulting                                                                     -0.0000000000017045    2.0164774825446536 1091.9999999586746071    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionscientific research consulting                                                                     -0.0000000000017065    2.0164774825446830 1091.9999999586677859    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionScientist                                                                                           1.9999999999925107    4.0329549650879093 1091.9999999548988399    0.50  0.62005    
## pers_simplifiedW1(MC):partfunctionScientist                                                                                          -4.0000000000072449    4.0329549650872005 1091.9999999563917754   -0.99  0.32150    
## pers_simplifiedW2(LM):partfunctionScientist                                                                                          -6.0000000000072857    4.0329549650877947 1091.9999999685596777   -1.49  0.13711    
## pers_simplifiedM2(JA):partfunctionSenior Scientist                                                                                    3.9999999999919704    4.0329549650877894 1091.9999999547685547    0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionSenior Scientist                                                                                   -0.0000000000078486    4.0329549650871392 1091.9999999540646058    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionSenior Scientist                                                                                   -0.0000000000082183    4.0329549650877432 1091.9999999547185325    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionSkilled tradesman                                                                                   2.4999999999959699    2.6675489715872942 1091.9999999584883881    0.94  0.34887    
## pers_simplifiedW1(MC):partfunctionSkilled tradesman                                                                                  -0.5000000000034670    2.6675489715872431 1091.9999999584042598   -0.19  0.85135    
## pers_simplifiedW2(LM):partfunctionSkilled tradesman                                                                                  -0.0000000000031186    2.6675489715872520 1091.9999999584190391    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionSocial worker                                                                                       5.9999999999933911    3.4926414520850226 1091.9999999575002221    1.72  0.08610 .  
## pers_simplifiedW1(MC):partfunctionSocial worker                                                                                       1.9999999999935507    3.4926414520845568 1091.9999999554092938    0.57  0.56701    
## pers_simplifiedW2(LM):partfunctionSocial worker                                                                                       3.9999999999934923    3.4926414520850160 1091.9999999575384209    1.15  0.25235    
## pers_simplifiedM2(JA):partfunctionSoftware Engineering                                                                                3.9999999999925251    3.4926414520841820 1091.9999999549879703    1.15  0.25235    
## pers_simplifiedW1(MC):partfunctionSoftware Engineering                                                                               -0.0000000000072799    3.4926414520834497 1091.9999999541189482    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionSoftware Engineering                                                                               -0.0000000000075563    3.4926414520841367 1091.9999999549313543    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionSpecial Education Paraprofessional                                                                  4.3333333333289330    4.2177652601265283 1091.9999999611595740    1.03  0.30446    
## pers_simplifiedW1(MC):partfunctionSpecial Education Paraprofessional                                                                  0.2499999999951173    4.2177652601259608 1091.9999999605715857    0.06  0.95275    
## pers_simplifiedW2(LM):partfunctionSpecial Education Paraprofessional                                                                 -0.2500000000059137    4.2177652601264519 1091.9999999610802206   -0.06  0.95275    
## pers_simplifiedM2(JA):partfunctionState infrastructure                                                                                8.9999999999931433    4.0329549650878329 1091.9999999570061391    2.23  0.02584 *  
## pers_simplifiedW1(MC):partfunctionState infrastructure                                                                                2.9999999999932236    4.0329549650871908 1091.9999999541203124    0.74  0.45711    
## pers_simplifiedW2(LM):partfunctionState infrastructure                                                                                3.9999999999929416    4.0329549650877912 1091.9999999569613465    0.99  0.32150    
## pers_simplifiedM2(JA):partfunctionSupport students with IEPs                                                                          3.9999999999920681    3.9048918539469741 1091.9999999584324542    1.02  0.30589    
## pers_simplifiedW1(MC):partfunctionSupport students with IEPs                                                                         -0.0000000000076839    3.9048918539462147 1091.9999999588262654    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionSupport students with IEPs                                                                         -0.0000000000081381    3.9048918539469426 1091.9999999596034286    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionTeach High Shcool                                                                                  -4.0000000000043174    2.8517298040342367 1091.9999999580388703   -1.40  0.16100    
## pers_simplifiedW1(MC):partfunctionTeach High Shcool                                                                                  -2.0000000000040079    2.8517298040340520 1091.9999999577566996   -0.70  0.48325    
## pers_simplifiedW2(LM):partfunctionTeach High Shcool                                                                                  -6.0000000000039311    2.8517298040342305 1091.9999999580300027   -2.10  0.03561 *  
## pers_simplifiedM2(JA):partfunctionteacher                                                                                             4.9999999999919602    4.0329549650877849 1091.9999999570247837    1.24  0.21532    
## pers_simplifiedW1(MC):partfunctionteacher                                                                                             1.9999999999921498    4.0329549650871366 1091.9999999540614226    0.50  0.62005    
## pers_simplifiedW2(LM):partfunctionteacher                                                                                             0.9999999999917794    4.0329549650877388 1091.9999999569047304    0.25  0.80421    
## pers_simplifiedM2(JA):partfunctionTeacher                                                                                            -0.0000000000054675    2.8517298040338752 1091.9999999574852154    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionTeacher                                                                                            -0.0000000000052318    2.8517298040335257 1091.9999999685444436    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionTeacher                                                                                            -0.0000000000052256    2.8517298040338734 1091.9999999575534275    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionTeacher                                                                                            -0.0000000000017570    2.0164774825446763 1091.9999999586534614    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionTeacher                                                                                            -0.0000000000017055    2.0164774825446510 1091.9999999585986643    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionTeacher                                                                                            -0.0000000000017079    2.0164774825446812 1091.9999999586636932    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionTeacher assistant                                                                                   4.9999999999931397    4.0329549650878329 1091.9999999570065938    1.24  0.21532    
## pers_simplifiedW1(MC):partfunctionTeacher assistant                                                                                  -2.0000000000067764    4.0329549650871890 1091.9999999541182660   -0.50  0.62005    
## pers_simplifiedW2(LM):partfunctionTeacher assistant                                                                                   0.9999999999929370    4.0329549650877921 1091.9999999685569492    0.25  0.80421    
## pers_simplifiedM2(JA):partfunctionTeaching                                                                                           -0.6666666666710694    4.2177652601265283 1091.9999999611600288   -0.16  0.87444    
## pers_simplifiedW1(MC):partfunctionTeaching                                                                                           -1.7500000000048812    4.2177652601259625 1091.9999999605734047   -0.41  0.67829    
## pers_simplifiedW2(LM):partfunctionTeaching                                                                                           -1.2500000000059137    4.2177652601264519 1091.9999999610806753   -0.30  0.76701    
## pers_simplifiedM2(JA):partfunctionTeaching English                                                                                    6.9999999999931433    4.0329549650878329 1091.9999999570061391    1.74  0.08290 .  
## pers_simplifiedW1(MC):partfunctionTeaching English                                                                                   -1.0000000000067804    4.0329549650871908 1091.9999999541203124   -0.25  0.80421    
## pers_simplifiedW2(LM):partfunctionTeaching English                                                                                    1.9999999999929343    4.0329549650877912 1091.9999999685555849    0.50  0.62005    
## pers_simplifiedM2(JA):partfunctiontechnical writer                                                                                    3.3333333333289339    4.2177652601265310 1091.9999999611623025    0.79  0.42952    
## pers_simplifiedW1(MC):partfunctiontechnical writer                                                                                    0.2499999999951191    4.2177652601259634 1091.9999999605745415    0.06  0.95275    
## pers_simplifiedW2(LM):partfunctiontechnical writer                                                                                    0.7499999999940864    4.2177652601264528 1091.9999999610820396    0.18  0.85890    
## pers_simplifiedM2(JA):partfunctionTo do manual labor and greet customers                                                              2.8333333333228454    5.1902265869755544 1091.9999999617191406    0.55  0.58525    
## pers_simplifiedW1(MC):partfunctionTo do manual labor and greet customers                                                             -2.5833333333428610    5.1902265869749336 1091.9999999611964085   -0.50  0.61877    
## pers_simplifiedW2(LM):partfunctionTo do manual labor and greet customers                                                              0.0833333333244546    5.1902265869752355 1091.9999999614503849    0.02  0.98719    
## pers_simplifiedM2(JA):partfunctiontranscription                                                                                      -0.5000000000040299    2.6675489715872929 1091.9999999584863417   -0.19  0.85135    
## pers_simplifiedW1(MC):partfunctiontranscription                                                                                      -1.5000000000034648    2.6675489715872414 1091.9999999584015313   -0.56  0.57402    
## pers_simplifiedW2(LM):partfunctiontranscription                                                                                      -0.0000000000031207    2.6675489715872502 1091.9999999584158559    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionTutor/teacher                                                                                      -2.0000000000017577    2.0164774825446790 1091.9999999586586910   -0.99  0.32150    
## pers_simplifiedW1(MC):partfunctionTutor/teacher                                                                                      -3.0000000000017035    2.0164774825446532 1091.9999999586027570   -1.49  0.13711    
## pers_simplifiedW2(LM):partfunctionTutor/teacher                                                                                      -3.0000000000017080    2.0164774825446825 1091.9999999586668764   -1.49  0.13711    
## pers_simplifiedM2(JA):partfunctionVolunteer                                                                                           5.9999999999920597    3.9048918539469732 1091.9999999596375346    1.54  0.12470    
## pers_simplifiedW1(MC):partfunctionVolunteer                                                                                           3.9999999999923204    3.9048918539462170 1091.9999999576225491    1.02  0.30589    
## pers_simplifiedW2(LM):partfunctionVolunteer                                                                                           1.9999999999918663    3.9048918539469430 1091.9999999596038833    0.51  0.60863    
## pers_simplifiedM2(JA):partfunctionWarehouse worker                                                                                    4.9999999999933964    3.4926414520850222 1091.9999999574995400    1.43  0.15255    
## pers_simplifiedW1(MC):partfunctionWarehouse worker                                                                                    1.9999999999935516    3.4926414520845581 1091.9999999554581791    0.57  0.56701    
## pers_simplifiedW2(LM):partfunctionWarehouse worker                                                                                    4.9999999999934932    3.4926414520850164 1091.9999999575391030    1.43  0.15255    
## pers_simplifiedM2(JA):partfunctionwarehousing                                                                                        -1.5000000000040252    2.6675489715872929 1091.9999999584863417   -0.56  0.57402    
## pers_simplifiedW1(MC):partfunctionwarehousing                                                                                        -0.5000000000034617    2.6675489715872414 1091.9999999584013040   -0.19  0.85135    
## pers_simplifiedW2(LM):partfunctionwarehousing                                                                                        -0.0000000000031169    2.6675489715872494 1091.9999999584144916    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionWorker                                                                                              3.3333333333289352    4.2177652601265283 1091.9999999611600288    0.79  0.42952    
## pers_simplifiedW1(MC):partfunctionWorker                                                                                             -1.7500000000048790    4.2177652601259608 1091.9999999605720404   -0.41  0.67829    
## pers_simplifiedW2(LM):partfunctionWorker                                                                                             -1.2500000000059110    4.2177652601264519 1091.9999999610802206   -0.30  0.76701    
## deiexpert_fNo one has DEI Quals.:partfunctionAccount Management                                                                      -1.9999999999970672    2.4696704550227131 1091.9999999577896688   -0.81  0.41822    
## deiexpert_fNo one has DEI Quals.:partfunctionAccounting                                                                               0.9166666666673451    2.4176715692096971 1091.9999999569809006    0.38  0.70465    
## deiexpert_fWoman Has DEI Quals.:partfunctionAccounting                                                                                4.4999999999954552    2.4696704550220354 1091.9999999551293968    1.82  0.06871 .  
## deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services                                                                  2.9166666666673531    2.4867618039729518 1091.9999999560322976    1.17  0.24110    
## deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services                                                                   1.4999999999954889    2.4351279083122828 1091.9999999499350452    0.62  0.53803    
## deiexpert_fNo one has DEI Quals.:partfunctionBusiness Development                                                                     1.0000000000024689    3.9265257693799240 1091.9999999607450718    0.25  0.79902    
## deiexpert_fWoman Has DEI Quals.:partfunctionBusiness Development                                                                      0.0833333333293519    2.9824104168883614 1091.9999999609410679    0.03  0.97771    
## deiexpert_fNo one has DEI Quals.:partfunctionCivil Engineering                                                                       -0.9999999999975172    3.9907239064242095 1091.9999999550836947   -0.25  0.80219    
## deiexpert_fWoman Has DEI Quals.:partfunctionCivil Engineering                                                                         4.9999999999976970    1.8862419669564603 1091.9999999582184955    2.65  0.00815 ** 
## deiexpert_fWoman Has DEI Quals.:partfunctionCommunications                                                                            0.4999999999954176    2.5705145080528062 1091.9999999589185791    0.19  0.84581    
## deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support                                                              1.5000000000014841    3.3185199602923112 1091.9999999557505816    0.45  0.65135    
## deiexpert_fWoman Has DEI Quals.:partfunctionCustomer Experience/Support                                                               0.0833333333294592    2.7764729980308367 1091.9999999573340119    0.03  0.97606    
## deiexpert_fNo one has DEI Quals.:partfunctionData Analysis                                                                           -0.7499999999987844    3.3817355445505712 1091.9999999538345037   -0.22  0.82453    
## deiexpert_fWoman Has DEI Quals.:partfunctionData Analysis                                                                             0.3333333333293393    2.8517298040332775 1091.9999999566402948    0.12  0.90697    
## deiexpert_fNo one has DEI Quals.:partfunctionDesign or creative services                                                              3.9166666666673233    2.4176715692096939 1091.9999999569754436    1.62  0.10552    
## deiexpert_fWoman Has DEI Quals.:partfunctionDesign or creative services                                                               4.4999999999954845    2.5705145080528151 1091.9999999589333584    1.75  0.08029 .  
## deiexpert_fWoman Has DEI Quals.:partfunctionEducation                                                                                 0.9999999999942117    2.7611755097257871 1091.9999999580716121    0.36  0.71730    
## deiexpert_fNo one has DEI Quals.:partfunctionFinancial services                                                                       0.2500000000011743    3.2928939400309107 1091.9999999574833964    0.08  0.93950    
## deiexpert_fWoman Has DEI Quals.:partfunctionFinancial services                                                                       -0.1666666666706879    2.7611755097260722 1091.9999999597287115   -0.06  0.95188    
## deiexpert_fNo one has DEI Quals.:partfunctionHealthcare                                                                               3.6666666666672203    2.3645294408642941 1091.9999999530793957    1.55  0.12126    
## deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare                                                                                4.7857142857095765    2.3950407600573129 1091.9999999669250883    2.00  0.04595 *  
## deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources                                                                          1.2500000000006533    2.3823751992492053 1091.9999999615633897    0.52  0.59991    
## deiexpert_fWoman Has DEI Quals.:partfunctionHuman Resources                                                                           0.5833333333287503    2.3823751992477629 1091.9999999574001777    0.24  0.80662    
## deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT)                                                              3.9833333333338206    2.3174874286988256 1091.9999999619583377    1.72  0.08593 .  
## deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT)                                                               3.3095238095190931    2.3594058607558681 1091.9999999619433311    1.40  0.16099    
## deiexpert_fNo one has DEI Quals.:partfunctionLegal services                                                                          -1.0000000000000551    1.8862419669567303 1091.9999999588435458   -0.53  0.59611    
## deiexpert_fWoman Has DEI Quals.:partfunctionLegal services                                                                            1.9999999999954288    2.5705145080527916 1091.9999999602844127    0.78  0.43671    
## deiexpert_fNo one has DEI Quals.:partfunctionMarketing                                                                               -2.4999999999975731    3.9265257693799294 1091.9999999534429662   -0.64  0.52446    
## deiexpert_fWoman Has DEI Quals.:partfunctionMarketing                                                                                -1.9166666666707002    2.9824104168883978 1091.9999999609942734   -0.64  0.52058    
## deiexpert_fNo one has DEI Quals.:partfunctionMechanical Engineering                                                                  -1.4999999999988278    3.5883479790981108 1091.9999999591432243   -0.42  0.67601    
## deiexpert_fWoman Has DEI Quals.:partfunctionMechanical Engineering                                                                   -1.9166666666707119    2.8959453059515767 1091.9999999561073309   -0.66  0.50821    
## deiexpert_fNo one has DEI Quals.:partfunctionOperations                                                                               1.5500000000006287    2.2954505976467128 1091.9999999596172984    0.68  0.49966    
## deiexpert_fWoman Has DEI Quals.:partfunctionOperations                                                                                1.5499999999954321    2.3046582182335844 1091.9999999596141151    0.67  0.50138    
## deiexpert_fNo one has DEI Quals.:partfunctionProduct Management                                                                      -0.0000000000000512    1.6971186910880585 1091.9999999582901182    0.00  1.00000    
## deiexpert_fWoman Has DEI Quals.:partfunctionProduct Management                                                                        1.4999999999948577    3.2410341015099271 1091.9999999502424544    0.46  0.64359    
## deiexpert_fNo one has DEI Quals.:partfunctionProgram Management                                                                       1.9999999999993046    1.7463207260430571 1091.9999999588183073    1.15  0.25235    
## deiexpert_fWoman Has DEI Quals.:partfunctionProgram Management                                                                       -0.0000000000057953    2.7611755097257991 1091.9999999580907115    0.00  1.00000    
## deiexpert_fNo one has DEI Quals.:partfunctionProject Management                                                                       3.9166666666672287    2.4176715692097006 1091.9999999650035534    1.62  0.10552    
## deiexpert_fWoman Has DEI Quals.:partfunctionProject Management                                                                        2.4999999999953468    2.4696704550219915 1091.9999999550516350    1.01  0.31163    
## deiexpert_fNo one has DEI Quals.:partfunctionPublic Relations                                                                        -0.0000000000008563    1.8862419669567123 1091.9999999587616912    0.00  1.00000    
## deiexpert_fNo one has DEI Quals.:partfunctionSales                                                                                    0.5000000000008618    2.1780446147585351 1091.9999999582573764    0.23  0.81847    
## deiexpert_fWoman Has DEI Quals.:partfunctionSales                                                                                     0.3333333333290696    2.5037364843319430 1091.9999999596016096    0.13  0.89411    
## deiexpert_fWoman Has DEI Quals.:partfunctionSoftware Engineering                                                                      0.9999999999958348    2.0164774825435194 1091.9999999677406777    0.50  0.62005    
## pers_simplifiedM2(JA):sortOrder3                                                                                                      3.9999999999986735    1.7463207260429954 1091.9999999587112143    2.29  0.02218 *  
## pers_simplifiedW1(MC):sortOrder3                                                                                                      0.9999999999987684    1.7463207260428264 1091.9999999567803570    0.57  0.56701    
## pers_simplifiedW2(LM):sortOrder3                                                                                                     -1.0000000000016276    1.7463207260429223 1091.9999999584802026   -0.57  0.56701    
## pers_simplifiedM2(JA):sortOrder2                                                                                                      5.6666666666631329    2.5705145080535021 1091.9999999614922217    2.20  0.02770 *  
## pers_simplifiedW1(MC):sortOrder2                                                                                                      2.7499999999972009    2.5705145080536980 1091.9999999632175331    1.07  0.28493    
## pers_simplifiedW2(LM):sortOrder2                                                                                                      3.2499999999977791    2.5705145080534217 1091.9999999613555701    1.26  0.20638    
## pers_simplifiedM2(JA):sortOrder4                                                                                                     -1.1666666666691161    3.2670669221373996 1091.9999999606332040   -0.36  0.72109    
## pers_simplifiedW1(MC):sortOrder4                                                                                                     -2.5833333333350099    3.2670669221374582 1091.9999999607116479   -0.79  0.42928    
## pers_simplifiedW2(LM):sortOrder4                                                                                                     -3.9166666666673260    3.2670669221371811 1091.9999999603405740   -1.20  0.23085    
## deiexpert_fNo one has DEI Quals.:sortOrder3                                                                                           2.9166666666667123    2.6194810890646720 1091.9999999572603429    1.11  0.26576    
## deiexpert_fWoman Has DEI Quals.:sortOrder3                                                                                           -0.5000000000022614    1.7463207260424982 1091.9999999559588559   -0.29  0.77469    
## deiexpert_fNo one has DEI Quals.:sortOrder2                                                                                           1.8333333333328772    0.9203918365758069 1091.9999999582626060    1.99  0.04663 *  
## deiexpert_fWoman Has DEI Quals.:sortOrder2                                                                                            2.4166666666660976    1.3337744857935405 1091.9999999568465228    1.81  0.07028 .  
## partfunctionAccount Management:sortOrder3                                                                                             0.5000000000007861    1.8862419669566532 1091.9999999586650574    0.27  0.79100    
## partfunctionAccounting:sortOrder3                                                                                                     0.0000000000008079    1.5941654238208827 1091.9999999586459580    0.00  1.00000    
## partfunctionAdministrative services:sortOrder3                                                                                       -0.5714285714299846    1.4173521996547918 1091.9999999644396667   -0.40  0.68690    
## partfunctionBusiness Development:sortOrder3                                                                                          -3.4166666666681609    2.5205968531809280 1091.9999999606479832   -1.36  0.17554    
## partfunctionCivil Engineering:sortOrder3                                                                                             -4.9166666666663090    2.5205968531809457 1091.9999999606336587   -1.95  0.05136 .  
## partfunctionCommunications:sortOrder3                                                                                                -2.0000000000014757    1.8862419669565811 1091.9999999584981651   -1.06  0.28924    
## partfunctionCustomer Experience/Support:sortOrder3                                                                                   -0.4166666666673154    2.2356240032096792 1091.9999999616311470   -0.19  0.85218    
## partfunctionData Analysis:sortOrder3                                                                                                  0.0000000000007864    1.5941654238208691 1091.9999999695789938    0.00  1.00000    
## partfunctionDesign or creative services:sortOrder3                                                                                    0.9999999999985373    1.5401101168223772 1091.9999999576816663    0.65  0.51628    
## partfunctionEducation:sortOrder3                                                                                                     -0.0000000000014443    1.8862419669565818 1091.9999999584999841    0.00  1.00000    
## partfunctionFinancial services:sortOrder3                                                                                            -0.1666666666675301    2.3101651752335388 1091.9999999499821115   -0.07  0.94250    
## partfunctionHealthcare:sortOrder3                                                                                                     2.4999999999984706    1.5941654238207299 1091.9999999582271357    1.57  0.11712    
## partfunctionHuman Resources:sortOrder3                                                                                               -1.6666666666681351    1.5401101168223643 1091.9999999576452865   -1.08  0.27941    
## partfunctionInformation Technology (IT):sortOrder3                                                                                    1.3809523809507549    1.4173521996547911 1091.9999999481262876    0.97  0.33011    
## partfunctionLegal services:sortOrder3                                                                                                -0.0000000000014590    1.8862419669565715 1091.9999999584761099    0.00  1.00000    
## partfunctionMarketing:sortOrder3                                                                                                     -4.9166666666663499    2.6194810890646099 1091.9999999571573426   -1.88  0.06079 .  
## partfunctionMechanical Engineering:sortOrder3                                                                                        -0.4999999999992099    1.8862419669566419 1091.9999999586391368   -0.27  0.79100    
## partfunctionOperations:sortOrder3                                                                                                     0.4428571428556781    1.3310497138245196 1091.9999999570650289    0.33  0.73942    
## partfunctionProduct Management:sortOrder3                                                                                            -1.0000000000014615    1.6971186910878908 1091.9999999578585630   -0.59  0.55583    
## partfunctionProject Management:sortOrder3                                                                                            -0.0000000000015517    1.5941654238207768 1091.9999999564897735    0.00  1.00000    
## partfunctionSales:sortOrder3                                                                                                          1.0833333333319579    1.3958433312950660 1091.9999999578094503    0.78  0.43785    
## partfunctionAccounting:sortOrder2                                                                                                    -1.5000000000012266    1.7463207260430640 1091.9999999588355877   -0.86  0.39056    
## partfunctionAdministrative services:sortOrder2                                                                                        2.1666666666649004    1.9740205700657072 1091.9999999593965185    1.10  0.27263    
## partfunctionCommunications:sortOrder2                                                                                                 0.4999999999987624    1.5941654238209739 1091.9999999588389983    0.31  0.75385    
## partfunctionCustomer Experience/Support:sortOrder2                                                                                    1.4999999999989171    1.5401101168226192 1091.9999999583076260    0.97  0.33029    
## partfunctionData Analysis:sortOrder2                                                                                                  0.2499999999987678    1.5123581119085820 1091.9999999639514954    0.17  0.86873    
## partfunctionDesign or creative services:sortOrder2                                                                                    4.9166666666648773    2.1974053920843559 1091.9999999542646947    2.24  0.02546 *  
## partfunctionFinancial services:sortOrder2                                                                                            -0.2500000000012457    1.4258649020173724 1091.9999999588180799   -0.18  0.86085    
## partfunctionHealthcare:sortOrder2                                                                                                     3.9166666666647498    1.9892877779215199 1091.9999999580145413    1.97  0.04922 *  
## partfunctionHuman Resources:sortOrder2                                                                                                2.2499999999981957    2.0373741803834435 1091.9999999699919044    1.10  0.26968    
## partfunctionInformation Technology (IT):sortOrder2                                                                                    4.4166666666647263    1.9524459269743788 1091.9999999615968136    2.26  0.02389 *  
## partfunctionLegal services:sortOrder2                                                                                                 2.9166666666648675    2.3101651752337351 1091.9999999608021426    1.26  0.20703    
## partfunctionMechanical Engineering:sortOrder2                                                                                        -0.5000000000012551    1.7463207260430436 1091.9999999588321771   -0.29  0.77469    
## partfunctionOperations:sortOrder2                                                                                                     2.4388888888870692    1.8757335733989455 1091.9999999589883828    1.30  0.19380    
## partfunctionProduct Management:sortOrder2                                                                                             0.9999999999993447    2.0164774825447145 1091.9999999587359980    0.50  0.62005    
## partfunctionProject Management:sortOrder2                                                                                            -0.0000000000012313    1.5941654238209710 1091.9999999588310402    0.00  1.00000    
## partfunctionSales:sortOrder2                                                                                                          1.4999999999984712    1.6971186910879934 1091.9999999581225438    0.88  0.37697    
## partfunctionAdministrative services:sortOrder4                                                                                       -3.2500000000007110    2.5869396880096684 1091.9999999609283350   -1.26  0.20927    
## partfunctionCustomer Experience/Support:sortOrder4                                                                                   -0.9166666666674192    2.4867618039728652 1091.9999999558806394   -0.37  0.71248    
## partfunctionData Analysis:sortOrder4                                                                                                 -1.5833333333340176    2.4524599982734543 1091.9999999617436970   -0.65  0.51867    
## partfunctionDesign or creative services:sortOrder4                                                                                   -2.9166666666673553    2.6194810890645535 1091.9999999571045919   -1.11  0.26576    
## partfunctionFinancial services:sortOrder4                                                                                            -2.9166666666673446    2.5205968531809151 1091.9999999606257006   -1.16  0.24747    
## partfunctionHealthcare:sortOrder4                                                                                                    -2.6666666666673859    2.4351279083136195 1091.9999999647909590   -1.10  0.27372    
## partfunctionHuman Resources:sortOrder4                                                                                               -1.5833333333340496    2.4867618039728780 1091.9999999558572199   -0.64  0.52445    
## partfunctionInformation Technology (IT):sortOrder4                                                                                   -1.3166666666673617    2.4593586335556741 1091.9999999531444246   -0.54  0.59250    
## partfunctionMarketing:sortOrder4                                                                                                     -1.9166666666673633    2.5205968531809173 1091.9999999606293386   -0.76  0.44718    
## partfunctionOperations:sortOrder4                                                                                                    -1.5833333333340285    2.4176715692095634 1091.9999999552153440   -0.65  0.51267    
## partfunctionProject Management:sortOrder4                                                                                            -1.9166666666673653    2.6194810890645588 1091.9999999570723048   -0.73  0.46451    
## partfunctionSales:sortOrder4                                                                                                         -1.4166666666674852    2.3101651752338110 1091.9999999504966581   -0.61  0.53985    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionAccount Management                                                 6.9999999999974349    3.4926414520856510 1091.9999999567780833    2.00  0.04529 *  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionAccount Management                                                -3.0000000000027920    3.4926414520853886 1091.9999999579576979   -0.86  0.39056    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionAccount Management                                                 3.9999999999968572    3.4926414520855769 1091.9999999581932570    1.15  0.25235    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionAccounting                                                         0.3333333333307579    3.4191039225400086 1091.9999999552169356    0.10  0.92235    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionAccounting                                                        -3.0833333333352035    3.4191039225399744 1091.9999999567464783   -0.90  0.36736    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionAccounting                                                        -0.9166666666674365    3.4191039225396622 1091.9999999562983248   -0.27  0.78867    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionAccounting                                                         -8.9999999999961222    3.4926414520852327 1091.9999999578099050   -2.58  0.01010 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionAccounting                                                         -3.4999999999958100    3.4926414520846452 1091.9999999662168193   -1.00  0.31651    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionAccounting                                                         -5.4999999999950022    3.4926414520850377 1091.9999999575186393   -1.57  0.11561    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services                                           -3.5000000000026423    3.5168122695697903 1091.9999999573431069   -1.00  0.31985    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services                                           -5.2500000000019256    3.5168122695697384 1091.9999999648098310   -1.49  0.13577    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services                                           -2.9166666666674330    3.5168122695694124 1091.9999999644512627   -0.83  0.40709    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services                                            -6.3333333333294872    3.4437909140494201 1091.9999999526585270   -1.84  0.06618 .  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services                                             0.3333333333374521    3.4437909140488241 1091.9999999598528575    0.10  0.92291    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services                                             0.0000000000049400    3.4437909140492060 1091.9999999602894150    0.00  1.00000    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionBusiness Development                                              -0.5000000000061103    5.5529459960639667 1091.9999999602939624   -0.09  0.92827    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionBusiness Development                                              -1.8333333333380066    5.5529459960641345 1091.9999999531173671   -0.33  0.74135    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionBusiness Development                                              -1.6666666666696595    5.5529459960634844 1091.9999999599149305   -0.30  0.76413    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionBusiness Development                                               -2.3333333333307169    4.2177652601271216 1091.9999999617746198   -0.55  0.58023    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionBusiness Development                                                0.7500000000031496    4.2177652601266669 1091.9999999612391548    0.18  0.85890    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionBusiness Development                                                1.2500000000041802    4.2177652601269271 1091.9999999489048150    0.30  0.76701    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionCivil Engineering                                                  3.4999999999938773    5.6437358721510913 1091.9999999546469098    0.62  0.53528    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionCivil Engineering                                                 -0.8333333333380077    5.6437358721512538 1091.9999999618119091   -0.15  0.88264    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionCivil Engineering                                                  1.3333333333303417    5.6437358721506374 1091.9999999613703494    0.24  0.81328    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionCivil Engineering                                                  -5.9999999999977147    2.6675489715873213 1091.9999999585324986   -2.25  0.02469 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionCivil Engineering                                                  -5.9999999999975602    2.6675489715872023 1091.9999999570447926   -2.25  0.02469 *  
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionCivil Engineering                                                  -7.9999999999974367    2.6675489715873035 1091.9999999585033947   -3.00  0.00277 ** 
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionCommunications                                                     -3.9999999999960822    3.6352564795659794 1091.9999999613867203   -1.10  0.27143    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionCommunications                                                      1.0000000000042284    3.6352564795654239 1091.9999999607189238    0.28  0.78330    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionCommunications                                                      1.0000000000050240    3.6352564795657916 1091.9999999526783085    0.28  0.78330    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support                                       -0.0000000000042114    4.6930959348510175 1091.9999999640788246    0.00  1.00000    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support                                       -4.3333333333366006    4.6930959348510877 1091.9999999641443083   -0.92  0.35603    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support                                       -1.6666666666685641    4.6930959348505406 1091.9999999551259862   -0.36  0.72256    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionCustomer Experience/Support                                        -1.8333333333308797    3.9265257693787938 1091.9999999582944383   -0.47  0.64066    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionCustomer Experience/Support                                         0.2500000000029885    3.9265257693782898 1091.9999999650422069    0.06  0.94925    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionCustomer Experience/Support                                         1.2500000000040408    3.9265257693785585 1091.9999999580325039    0.32  0.75028    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis                                                      6.9999999999962093    4.7824962714623789 1091.9999999553076577    1.46  0.14357    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis                                                     -4.4166666666695944    4.7824962714624650 1091.9999999635815584   -0.92  0.35595    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis                                                      0.4166666666650646    4.7824962714619961 1091.9999999549581844    0.09  0.93059    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionData Analysis                                                       0.1666666666693130    4.0329549650883498 1091.9999999691603989    0.04  0.96704    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionData Analysis                                                      -1.9999999999968601    4.0329549650878720 1091.9999999570482032   -0.50  0.62005    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionData Analysis                                                       0.5000000000041586    4.0329549650881420 1091.9999999551503151    0.12  0.90136    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionDesign or creative services                                       -5.1666666666692356    3.4191039225400028 1091.9999999567332907   -1.51  0.13105    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionDesign or creative services                                       -3.5833333333351898    3.4191039225399655 1091.9999999566855422   -1.05  0.29486    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionDesign or creative services                                       -6.9166666666674201    3.4191039225396609 1091.9999999643623596   -2.02  0.04332 *  
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionDesign or creative services                                       -10.4999999999961826    3.6352564795659976 1091.9999999628016667   -2.89  0.00395 ** 
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionDesign or creative services                                        -3.4999999999958509    3.6352564795654132 1091.9999999607064183   -0.96  0.33586    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionDesign or creative services                                        -3.9999999999950568    3.6352564795658155 1091.9999999611900421   -1.10  0.27143    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionEducation                                                          -4.9999999999938511    3.9048918539476132 1091.9999999603535343   -1.28  0.20066    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionEducation                                                           1.0000000000059546    3.9048918539470057 1091.9999999584674697    0.26  0.79793    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionEducation                                                           0.0000000000064043    3.9048918539475173 1091.9999999602462140    0.00  1.00000    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services                                                 3.9999999999962301    4.6568552694476040 1091.9999999588571882    0.86  0.39056    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services                                                -3.8333333333361743    4.6568552694477070 1091.9999999573105924   -0.82  0.41060    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services                                                -1.1666666666681897    4.6568552694472674 1091.9999999585950263   -0.25  0.80223    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionFinancial services                                                 -0.5833333333306819    3.9048918539479183 1091.9999999606575329   -0.15  0.88128    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionFinancial services                                                 -0.2499999999968076    3.9048918539474218 1091.9999999601391210   -0.06  0.94896    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionFinancial services                                                  1.5000000000042182    3.9048918539477193 1091.9999999530828063    0.38  0.70095    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare                                                        -4.1666666666691325    3.3439496039005689 1091.9999999645051503   -1.25  0.21302    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare                                                        -6.0833333333351263    3.3439496039005383 1091.9999999644653599   -1.82  0.06915 .  
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare                                                        -4.4166666666673287    3.3439496039002283 1091.9999999640601800   -1.32  0.18685    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare                                                        -10.0714285714245282    3.3870991253104266 1091.9999999584038051   -2.97  0.00301 ** 
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare                                                         -4.7142857142813925    3.3870991253098186 1091.9999999576700702   -1.39  0.16426    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare                                                         -4.3571428571377044    3.3870991253102054 1091.9999999597225724   -1.29  0.19858    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources                                                   -0.0000000000025709    3.3691873174393412 1091.9999999514429874    0.00  1.00000    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources                                                   -2.4166666666685175    3.3691873174393110 1091.9999999613294221   -0.72  0.47335    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources                                                   -2.5833333333340924    3.3691873174389935 1091.9999999592480435   -0.77  0.44339    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionHuman Resources                                                    -3.0833333333294219    3.3691873174384779 1091.9999999585791102   -0.92  0.36031    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionHuman Resources                                                     0.1666666666708883    3.3691873174378673 1091.9999999594572273    0.05  0.96056    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionHuman Resources                                                     0.5833333333383547    3.3691873174382807 1091.9999999583737917    0.17  0.86258    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT)                                       -5.1000000000023205    3.2774221522948559 1091.9999999530025434   -1.56  0.11997    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT)                                       -6.9833333333349685    3.2774221522948168 1091.9999999616736659   -2.13  0.03333 *  
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT)                                       -3.8500000000005254    3.2774221522944846 1091.9999999612311967   -1.17  0.24037    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT)                                        -7.6904761904720695    3.3367037674244919 1091.9999999648734956   -2.30  0.02136 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT)                                        -3.6428571428527321    3.3367037674238880 1091.9999999640826900   -1.09  0.27518    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT)                                        -1.9047619047566915    3.3367037674243010 1091.9999999545552782   -0.57  0.56822    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionLegal services                                                     2.9999999999998970    2.6675489715875353 1091.9999999588831088    1.12  0.26099    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionLegal services                                                    -0.0000000000001696    2.6675489715875260 1091.9999999588271749    0.00  1.00000    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionLegal services                                                     0.9999999999999141    2.6675489715875207 1091.9999999588592345    0.37  0.70783    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services                                                     -5.9999999999960956    3.6352564795659692 1091.9999999627671059   -1.65  0.09913 .  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services                                                     -0.4999999999957839    3.6352564795653994 1091.9999999606898200   -0.14  0.89063    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services                                                     -1.4999999999949842    3.6352564795657654 1091.9999999611293333   -0.41  0.67996    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionMarketing                                                          5.9999999999939417    5.5529459960639667 1091.9999999602946446    1.08  0.28015    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionMarketing                                                          2.1666666666620524    5.5529459960641327 1091.9999999604249297    0.39  0.69648    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionMarketing                                                          1.8333333333304018    5.5529459960635066 1091.9999999515055151    0.33  0.74135    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionMarketing                                                           4.6666666666693528    4.2177652601271562 1091.9999999617457433    1.11  0.26878    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionMarketing                                                           0.7500000000032162    4.2177652601266926 1091.9999999486624347    0.18  0.85890    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionMarketing                                                           2.2500000000042504    4.2177652601269688 1091.9999999616156856    0.53  0.59383    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionMechanical Engineering                                             4.9999999999962759    5.0746903785543953 1091.9999999589365416    0.99  0.32470    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionMechanical Engineering                                             1.1666666666638439    5.0746903785544673 1091.9999999589988420    0.23  0.81821    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionMechanical Engineering                                            -0.1666666666681819    5.0746903785540098 1091.9999999586050308   -0.03  0.97381    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionMechanical Engineering                                              2.6666666666693817    4.0954851275682511 1091.9999999569226929    0.65  0.51510    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionMechanical Engineering                                              3.2500000000032343    4.0954851275677644 1091.9999999585979822    0.79  0.42763    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionMechanical Engineering                                              1.7500000000042557    4.0954851275680522 1091.9999999589047093    0.43  0.66925    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionOperations                                                        -2.7666666666691961    3.2462573669492238 1091.9999999593694611   -0.85  0.39425    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionOperations                                                        -1.5833333333351516    3.2462573669491803 1091.9999999593653683   -0.49  0.62583    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionOperations                                                        -1.8500000000007331    3.2462573669488526 1091.9999999588699211   -0.57  0.56887    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionOperations                                                         -5.5999999999960943    3.2592789088615599 1091.9999999503636445   -1.72  0.08605 .  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionOperations                                                          0.0000000000042134    3.2592789088609262 1091.9999999601216132    0.00  1.00000    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionOperations                                                         -0.5999999999949996    3.2592789088613388 1091.9999999624060365   -0.18  0.85398    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionProduct Management                                                 0.9999999999998908    2.4000882698936370 1091.9999999599908733    0.42  0.67702    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionProduct Management                                                -0.6666666666668427    2.4000882698936286 1091.9999999583289991   -0.28  0.78124    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionProduct Management                                                -0.3333333333334276    2.4000882698936223 1091.9999999583176304   -0.14  0.88957    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionProduct Management                                                 -3.9999999999944058    4.5835143824697999 1091.9999999509147983   -0.87  0.38302    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionProduct Management                                                 -1.1666666666613328    4.5835143824692448 1091.9999999610572559   -0.25  0.79913    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionProduct Management                                                 -0.8333333333278828    4.5835143824696702 1091.9999999632148047   -0.18  0.85576    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionProgram Management                                                -1.9999999999995537    2.4696704550233632 1091.9999999497024419   -0.81  0.41822    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionProgram Management                                                -2.4999999999995635    2.4696704550233290 1091.9999999588310402   -1.01  0.31163    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionProgram Management                                                -3.4999999999991434    2.4696704550233122 1091.9999999588490027   -1.42  0.15671    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionProgram Management                                                 -1.9999999999938349    3.9048918539476274 1091.9999999603694505   -0.51  0.60863    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionProgram Management                                                  1.0000000000059641    3.9048918539470128 1091.9999999596816451    0.26  0.79793    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionProgram Management                                                  1.0000000000064173    3.9048918539475248 1091.9999999602168828    0.26  0.79793    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionProject Management                                                -5.6666666666691192    3.4191039225400082 1091.9999999552164809   -1.66  0.09774 .  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionProject Management                                                -7.0833333333350676    3.4191039225399753 1091.9999999567469331   -2.07  0.03853 *  
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionProject Management                                                -2.9166666666673113    3.4191039225396644 1091.9999999563010533   -0.85  0.39382    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionProject Management                                                 -7.4999999999960094    3.4926414520851918 1091.9999999669014414   -2.15  0.03198 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionProject Management                                                 -0.4999999999956787    3.4926414520845981 1091.9999999662049959   -0.14  0.88619    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionProject Management                                                 -1.9999999999948839    3.4926414520849911 1091.9999999574608864   -0.57  0.56701    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionPublic Relations                                                  -2.9999999999989369    2.6675489715874976 1091.9999999588214905   -1.12  0.26099    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionPublic Relations                                                   0.0000000000008930    2.6675489715874909 1091.9999999588101218    0.00  1.00000    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionPublic Relations                                                   3.0000000000010640    2.6675489715874932 1091.9999999588139872    1.12  0.26099    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionSales                                                             -0.5000000000027847    3.0802202336449671 1091.9999999579831638   -0.16  0.87108    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionSales                                                             -0.8333333333354058    3.0802202336449871 1091.9999999580115855   -0.27  0.78679    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionSales                                                             -0.6666666666677004    3.0802202336446478 1091.9999999575302354   -0.22  0.82869    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionSales                                                              -2.8333333333302058    3.5408180927515316 1091.9999999607478003   -0.80  0.42377    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionSales                                                               0.5000000000035977    3.5408180927509694 1091.9999999615670276    0.14  0.88773    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionSales                                                               1.0000000000045732    3.5408180927513149 1091.9999999605258836    0.28  0.77767    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionSoftware Engineering                                               -3.9999999999960596    2.8517298040338108 1091.9999999689810011   -1.40  0.16100    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionSoftware Engineering                                                0.0000000000041188    2.8517298040332797 1091.9999999566432507    0.00  1.00000    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionSoftware Engineering                                                0.0000000000045851    2.8517298040336678 1091.9999999571673470    0.00  1.00000    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:sortOrder3                                                                    -5.1666666666689629    3.7045056825351299 1091.9999999573321929   -1.39  0.16339    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:sortOrder3                                                                    -3.5833333333348456    3.7045056825349625 1091.9999999652620772   -0.97  0.33361    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:sortOrder3                                                                    -2.9166666666668521    3.7045056825347613 1091.9999999568974545   -0.79  0.43126    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:sortOrder3                                                                     -1.4999999999983797    2.4696704550230280 1091.9999999568385647   -0.61  0.54373    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:sortOrder3                                                                      0.5000000000017777    2.4696704550226838 1091.9999999562292032    0.20  0.83960    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:sortOrder3                                                                      3.0000000000024487    2.4696704550228903 1091.9999999581027623    1.21  0.22473    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:sortOrder2                                                                    -3.8333333333328028    1.3016306179829884 1091.9999999582655619   -2.95  0.00330 ** 
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:sortOrder2                                                                    -2.3333333333328201    1.3016306179829751 1091.9999999582637429   -1.79  0.07331 .  
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:sortOrder2                                                                    -1.1666666666660479    1.3016306179829753 1091.9999999582646524   -0.90  0.37028    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:sortOrder2                                                                     -6.1666666666654075    1.8862419669563830 1091.9999999567467057   -3.27  0.00111 ** 
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:sortOrder2                                                                     -1.2499999999989626    1.8862419669564543 1091.9999999569117790   -0.66  0.50767    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:sortOrder2                                                                     -2.2499999999991904    1.8862419669563533 1091.9999999566778115   -1.19  0.23319    
## pers_simplifiedM2(JA):partfunctionAccount Management:sortOrder3                                                                      -2.5000000000002718    2.6675489715874621 1091.9999999587630555   -0.94  0.34887    
## pers_simplifiedW1(MC):partfunctionAccount Management:sortOrder3                                                                       2.4999999999994724    2.6675489715874088 1091.9999999586759714    0.94  0.34887    
## pers_simplifiedW2(LM):partfunctionAccount Management:sortOrder3                                                                      -2.0000000000008114    2.6675489715874470 1091.9999999587384991   -0.75  0.45357    
## pers_simplifiedM2(JA):partfunctionAccounting:sortOrder3                                                                               0.4999999999996949    2.2544903630338191 1091.9999999587323600    0.22  0.82453    
## pers_simplifiedW1(MC):partfunctionAccounting:sortOrder3                                                                              -1.0000000000005522    2.2544903630337583 1091.9999999586711965   -0.44  0.65745    
## pers_simplifiedW2(LM):partfunctionAccounting:sortOrder3                                                                               0.4999999999991646    2.2544903630338053 1091.9999999587623734    0.22  0.82453    
## pers_simplifiedM2(JA):partfunctionAdministrative services:sortOrder3                                                                 -1.3333333333320572    2.0044387034113709 1091.9999999648598532   -0.67  0.50607    
## pers_simplifiedW1(MC):partfunctionAdministrative services:sortOrder3                                                                  0.9047619047630627    2.0044387034112336 1091.9999999646317974    0.45  0.65181    
## pers_simplifiedW2(LM):partfunctionAdministrative services:sortOrder3                                                                  2.7142857142872807    2.0044387034113056 1091.9999999507663233    1.35  0.17597    
## pers_simplifiedM2(JA):partfunctionBusiness Development:sortOrder3                                                                     3.1666666666702716    3.5646622550432099 1091.9999999603985543    0.89  0.37455    
## pers_simplifiedW1(MC):partfunctionBusiness Development:sortOrder3                                                                     4.0833333333360651    3.5646622550431792 1091.9999999603612650    1.15  0.25225    
## pers_simplifiedW2(LM):partfunctionBusiness Development:sortOrder3                                                                     6.4166666666684637    3.5646622550429603 1091.9999999512699560    1.80  0.07212 .  
## pers_simplifiedM2(JA):partfunctionCivil Engineering:sortOrder3                                                                        6.6666666666644359    3.5646622550433680 1091.9999999605925041    1.87  0.06172 .  
## pers_simplifiedW1(MC):partfunctionCivil Engineering:sortOrder3                                                                        5.7499999999984057    3.5646622550433600 1091.9999999619851678    1.61  0.10702    
## pers_simplifiedW2(LM):partfunctionCivil Engineering:sortOrder3                                                                        7.2499999999993880    3.5646622550431628 1091.9999999603412562    2.03  0.04221 *  
## pers_simplifiedM2(JA):partfunctionCommunications:sortOrder3                                                                           2.0000000000013474    2.6675489715874661 1091.9999999587291768    0.75  0.45357    
## pers_simplifiedW1(MC):partfunctionCommunications:sortOrder3                                                                           2.0000000000012492    2.6675489715873577 1091.9999999585922978    0.75  0.45357    
## pers_simplifiedW2(LM):partfunctionCommunications:sortOrder3                                                                           4.0000000000016440    2.6675489715874181 1091.9999999586907506    1.50  0.13403    
## pers_simplifiedM2(JA):partfunctionCustomer Experience/Support:sortOrder3                                                              0.1666666666663713    3.1616497857062082 1091.9999999601914169    0.05  0.95797    
## pers_simplifiedW1(MC):partfunctionCustomer Experience/Support:sortOrder3                                                             -0.7500000000001603    3.1616497857061083 1091.9999999600522642   -0.24  0.81253    
## pers_simplifiedW2(LM):partfunctionCustomer Experience/Support:sortOrder3                                                              2.2500000000005098    3.1616497857060479 1091.9999999505369033    0.71  0.47683    
## pers_simplifiedM2(JA):partfunctionData Analysis:sortOrder3                                                                            0.4999999999997289    2.2544903630337965 1091.9999999586884769    0.22  0.82453    
## pers_simplifiedW1(MC):partfunctionData Analysis:sortOrder3                                                                           -0.0000000000005513    2.2544903630337405 1091.9999999567703526    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionData Analysis:sortOrder3                                                                           -0.5000000000008150    2.2544903630337827 1091.9999999587180355   -0.22  0.82453    
## pers_simplifiedM2(JA):partfunctionDesign or creative services:sortOrder3                                                             -4.3333333333320230    2.1780446147584271 1091.9999999600404408   -1.99  0.04689 *  
## pers_simplifiedW1(MC):partfunctionDesign or creative services:sortOrder3                                                              0.3333333333345717    2.1780446147582748 1091.9999999577964900    0.15  0.87839    
## pers_simplifiedW2(LM):partfunctionDesign or creative services:sortOrder3                                                              0.0000000000016268    2.1780446147583707 1091.9999999579886207    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionEducation:sortOrder3                                                                               -3.9999999999987037    2.6675489715874696 1091.9999999587753337   -1.50  0.13403    
## pers_simplifiedW1(MC):partfunctionEducation:sortOrder3                                                                                1.0000000000012086    2.6675489715873582 1091.9999999585925252    0.37  0.70783    
## pers_simplifiedW2(LM):partfunctionEducation:sortOrder3                                                                                3.0000000000016058    2.6675489715874194 1091.9999999586934791    1.12  0.26099    
## pers_simplifiedM2(JA):partfunctionFinancial services:sortOrder3                                                                       0.1666666666666640    3.2670669221375022 1091.9999999624940301    0.05  0.95932    
## pers_simplifiedW1(MC):partfunctionFinancial services:sortOrder3                                                                      -0.2499999999998399    3.2670669221373636 1091.9999999605317953   -0.08  0.93902    
## pers_simplifiedW2(LM):partfunctionFinancial services:sortOrder3                                                                       0.7500000000007693    3.2670669221373920 1091.9999999606229721    0.23  0.81847    
## pers_simplifiedM2(JA):partfunctionHealthcare:sortOrder3                                                                              -5.9999999999986313    2.2544903630337649 1091.9999999568176463   -2.66  0.00790 ** 
## pers_simplifiedW1(MC):partfunctionHealthcare:sortOrder3                                                                              -1.9999999999987390    2.2544903630336242 1091.9999999584108537   -0.89  0.37521    
## pers_simplifiedW2(LM):partfunctionHealthcare:sortOrder3                                                                              -1.9999999999983105    2.2544903630336881 1091.9999999584781563   -0.89  0.37521    
## pers_simplifiedM2(JA):partfunctionHuman Resources:sortOrder3                                                                          0.6666666666679879    2.1780446147584103 1091.9999999580074928    0.31  0.75960    
## pers_simplifiedW1(MC):partfunctionHuman Resources:sortOrder3                                                                          2.6666666666679011    2.1780446147582762 1091.9999999597378064    1.22  0.22109    
## pers_simplifiedW2(LM):partfunctionHuman Resources:sortOrder3                                                                          3.3333333333349580    2.1780446147583579 1091.9999999579624728    1.53  0.12620    
## pers_simplifiedM2(JA):partfunctionInformation Technology (IT):sortOrder3                                                             -4.1904761904746213    2.0044387034113638 1091.9999999648437097   -2.09  0.03679 *  
## pers_simplifiedW1(MC):partfunctionInformation Technology (IT):sortOrder3                                                             -1.9999999999985418    2.0044387034112132 1091.9999999505655524   -1.00  0.31860    
## pers_simplifiedW2(LM):partfunctionInformation Technology (IT):sortOrder3                                                              0.6666666666685207    2.0044387034113051 1091.9999999507658686    0.33  0.73950    
## pers_simplifiedM2(JA):partfunctionLegal services:sortOrder3                                                                           0.0000000000013207    2.6675489715874607 1091.9999999587610091    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionLegal services:sortOrder3                                                                           0.0000000000012333    2.6675489715873435 1091.9999999585686510    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionLegal services:sortOrder3                                                                           0.0000000000016316    2.6675489715874043 1091.9999999586279955    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionMarketing:sortOrder3                                                                                7.6666666666644900    3.7045056825349336 1091.9999999638878307    2.07  0.03873 *  
## pers_simplifiedW1(MC):partfunctionMarketing:sortOrder3                                                                                4.7499999999984608    3.7045056825349230 1091.9999999570879936    1.28  0.20004    
## pers_simplifiedW2(LM):partfunctionMarketing:sortOrder3                                                                                7.2499999999994369    3.7045056825347342 1091.9999999568653948    1.96  0.05059 .  
## pers_simplifiedM2(JA):partfunctionMechanical Engineering:sortOrder3                                                                  -0.5000000000002665    2.6675489715874505 1091.9999999587441835   -0.19  0.85135    
## pers_simplifiedW1(MC):partfunctionMechanical Engineering:sortOrder3                                                                   2.4999999999994662    2.6675489715874017 1091.9999999586636932    0.94  0.34887    
## pers_simplifiedW2(LM):partfunctionMechanical Engineering:sortOrder3                                                                  -0.0000000000008218    2.6675489715874376 1091.9999999587228103    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionOperations:sortOrder3                                                                              -4.0285714285700882    1.8823885574837069 1091.9999999588885657   -2.14  0.03256 *  
## pers_simplifiedW1(MC):partfunctionOperations:sortOrder3                                                                               0.7142857142869579    1.8823885574835457 1091.9999999585550086    0.38  0.70442    
## pers_simplifiedW2(LM):partfunctionOperations:sortOrder3                                                                               1.5428571428587641    1.8823885574836303 1091.9999999587514594    0.82  0.41261    
## pers_simplifiedM2(JA):partfunctionProduct Management:sortOrder3                                                                       0.0000000000013198    2.4000882698935588 1091.9999999597989699    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionProduct Management:sortOrder3                                                                       1.3333333333345656    2.4000882698934336 1091.9999999595709141    0.56  0.57864    
## pers_simplifiedW2(LM):partfunctionProduct Management:sortOrder3                                                                       2.6666666666682968    2.4000882698935047 1091.9999999581032171    1.11  0.26678    
## pers_simplifiedM2(JA):partfunctionProject Management:sortOrder3                                                                      -2.9999999999985785    2.2544903630338027 1091.9999999587000730   -1.33  0.18357    
## pers_simplifiedW1(MC):partfunctionProject Management:sortOrder3                                                                       0.0000000000013443    2.2544903630336703 1091.9999999585002115    0.00  1.00000    
## pers_simplifiedW2(LM):partfunctionProject Management:sortOrder3                                                                       3.0000000000017399    2.2544903630337516 1091.9999999586009380    1.33  0.18357    
## pers_simplifiedM2(JA):partfunctionSales:sortOrder3                                                                                   -2.5833333333321402    1.9740205700657640 1091.9999999583053523   -1.31  0.19092    
## pers_simplifiedW1(MC):partfunctionSales:sortOrder3                                                                                   -1.7499999999988820    1.9740205700656090 1091.9999999579986252   -0.89  0.37553    
## pers_simplifiedW2(LM):partfunctionSales:sortOrder3                                                                                    0.0000000000015092    1.9740205700656930 1091.9999999593651410    0.00  1.00000    
## pers_simplifiedM2(JA):partfunctionAccounting:sortOrder2                                                                               2.0000000000022657    2.4696704550232220 1091.9999999586900685    0.81  0.41822    
## pers_simplifiedW1(MC):partfunctionAccounting:sortOrder2                                                                               0.5000000000017563    2.4696704550232464 1091.9999999587325874    0.20  0.83960    
## pers_simplifiedW2(LM):partfunctionAccounting:sortOrder2                                                                               3.5000000000013993    2.4696704550232074 1091.9999999586159447    1.42  0.15671    
## pers_simplifiedM2(JA):partfunctionAdministrative services:sortOrder2                                                                 -4.4999999999964997    2.7916866625900529 1091.9999999576864411   -1.61  0.10727    
## pers_simplifiedW1(MC):partfunctionAdministrative services:sortOrder2                                                                 -1.1666666666639318    2.7916866625902403 1091.9999999579795258   -0.42  0.67610    
## pers_simplifiedW2(LM):partfunctionAdministrative services:sortOrder2                                                                 -2.9999999999978169    2.7916866625899934 1091.9999999576300524   -1.07  0.28278    
## pers_simplifiedM2(JA):partfunctionCommunications:sortOrder2                                                                           0.0000000000022811    2.2544903630337565 1091.9999999586673312    0.00  1.00000    
## pers_simplifiedW1(MC):partfunctionCommunications:sortOrder2                                                                          -0.9999999999982309    2.2544903630337800 1091.9999999587128059   -0.44  0.65745    
## pers_simplifiedW2(LM):partfunctionCommunications:sortOrder2                                                                          -0.9999999999985816    2.2544903630337401 1091.9999999585788828   -0.44  0.65745    
## pers_simplifiedM2(JA):partfunctionCustomer Experience/Support:sortOrder2                                                             -1.9999999999979421    2.1780446147584138 1091.9999999600133833   -0.92  0.35869    
## pers_simplifiedW1(MC):partfunctionCustomer Experience/Support:sortOrder2                                                             -1.9999999999984543    2.1780446147584538 1091.9999999600936462   -0.92  0.35869    
## pers_simplifiedW2(LM):partfunctionCustomer Experience/Support:sortOrder2                                                             -1.9999999999987779    2.1780446147584178 1091.9999999580836629   -0.92  0.35869    
## pers_simplifiedM2(JA):partfunctionData Analysis:sortOrder2                                                                            1.5000000000022817    2.1387973530259621 1091.9999999535223196    0.70  0.48325    
## pers_simplifiedW1(MC):partfunctionData Analysis:sortOrder2                                                                           -1.2499999999982665    2.1387973530259901 1091.9999999535791630   -0.58  0.55904    
## pers_simplifiedW2(LM):partfunctionData Analysis:sortOrder2                                                                           -1.2499999999986104    2.1387973530259519 1091.9999999535007191   -0.58  0.55904    
## pers_simplifiedM2(JA):partfunctionDesign or creative services:sortOrder2                                                             -6.6666666666631675    3.1076005075171782 1091.9999999557667252   -2.15  0.03215 *  
## pers_simplifiedW1(MC):partfunctionDesign or creative services:sortOrder2                                                             -5.7499999999972164    3.1076005075173372 1091.9999999559900061   -1.85  0.06454 .  
## pers_simplifiedW2(LM):partfunctionDesign or creative services:sortOrder2                                                             -7.2499999999978053    3.1076005075171076 1091.9999999556678176   -2.33  0.01983 *  
## pers_simplifiedM2(JA):partfunctionFinancial services:sortOrder2                                                                       1.0000000000022851    2.0164774825446301 1091.9999999585531896    0.50  0.62005    
## pers_simplifiedW1(MC):partfunctionFinancial services:sortOrder2                                                                      -0.4999999999982305    2.0164774825446501 1091.9999999585966179   -0.25  0.80421    
## pers_simplifiedW2(LM):partfunctionFinancial services:sortOrder2                                                                       0.5000000000014132    2.0164774825446004 1091.9999999700826265    0.25  0.80421    
## pers_simplifiedM2(JA):partfunctionHealthcare:sortOrder2                                                                              -7.5238095238058733    2.8132777549993406 1091.9999999575688889   -2.67  0.00760 ** 
## pers_simplifiedW1(MC):partfunctionHealthcare:sortOrder2                                                                              -3.1071428571399684    2.8132777549995232 1091.9999999566900897   -1.10  0.26964    
## pers_simplifiedW2(LM):partfunctionHealthcare:sortOrder2                                                                              -5.0357142857119399    2.8132777549992425 1091.9999999562539870   -1.79  0.07373 .  
## pers_simplifiedM2(JA):partfunctionHuman Resources:sortOrder2                                                                         -2.9999999999964682    2.8812821975267187 1091.9999999538620159   -1.04  0.29801    
## pers_simplifiedW1(MC):partfunctionHuman Resources:sortOrder2                                                                         -3.0833333333305415    2.8812821975268963 1091.9999999540621047   -1.07  0.28480    
## pers_simplifiedW2(LM):partfunctionHuman Resources:sortOrder2                                                                         -2.9166666666644554    2.8812821975266512 1091.9999999536905761   -1.01  0.31163    
## pers_simplifiedM2(JA):partfunctionInformation Technology (IT):sortOrder2                                                             -7.3333333333296018    2.7611755097269293 1091.9999999610479335   -2.66  0.00803 ** 
## pers_simplifiedW1(MC):partfunctionInformation Technology (IT):sortOrder2                                                             -4.9166666666636791    2.7611755097271113 1091.9999999612980446   -1.78  0.07525 .  
## pers_simplifiedW2(LM):partfunctionInformation Technology (IT):sortOrder2                                                             -5.4166666666642502    2.7611755097268600 1091.9999999609381121   -1.96  0.05005 .  
## pers_simplifiedM2(JA):partfunctionLegal services:sortOrder2                                                                          -3.6666666666631391    3.2670669221372859 1091.9999999604813183   -1.12  0.26198    
## pers_simplifiedW1(MC):partfunctionLegal services:sortOrder2                                                                          -2.7499999999972062    3.2670669221374409 1091.9999999606884558   -0.84  0.40012    
## pers_simplifiedW2(LM):partfunctionLegal services:sortOrder2                                                                          -5.2499999999977858    3.2670669221372233 1091.9999999603971901   -1.61  0.10836    
## pers_simplifiedM2(JA):partfunctionMechanical Engineering:sortOrder2                                                                   1.5000000000023221    2.4696704550231954 1091.9999999585941168    0.61  0.54373    
## pers_simplifiedW1(MC):partfunctionMechanical Engineering:sortOrder2                                                                   2.0000000000017870    2.4696704550232140 1091.9999999586755166    0.81  0.41822    
## pers_simplifiedW2(LM):partfunctionMechanical Engineering:sortOrder2                                                                  -1.4999999999985767    2.4696704550231852 1091.9999999585763817   -0.61  0.54373    
## pers_simplifiedM2(JA):partfunctionOperations:sortOrder2                                                                              -4.8222222222186613    2.6526878588989944 1091.9999999584222223   -1.82  0.06936 .  
## pers_simplifiedW1(MC):partfunctionOperations:sortOrder2                                                                              -1.7499999999971763    2.6526878588991840 1091.9999999587344064   -0.66  0.50958    
## pers_simplifiedW2(LM):partfunctionOperations:sortOrder2                                                                              -3.1833333333311069    2.6526878588989184 1091.9999999582967121   -1.20  0.23038    
## pers_simplifiedM2(JA):partfunctionProduct Management:sortOrder2                                                                      -1.9999999999994278    2.8517298040346959 1091.9999999587430466   -0.70  0.48325    
## pers_simplifiedW1(MC):partfunctionProduct Management:sortOrder2                                                                      -0.9999999999993655    2.8517298040346999 1091.9999999587489583   -0.35  0.72591    
## pers_simplifiedW2(LM):partfunctionProduct Management:sortOrder2                                                                      -0.9999999999990291    2.8517298040346870 1091.9999999587291768   -0.35  0.72591    
## pers_simplifiedM2(JA):partfunctionProject Management:sortOrder2                                                                       1.5000000000022711    2.2544903630337556 1091.9999999586659669    0.67  0.50597    
## pers_simplifiedW1(MC):partfunctionProject Management:sortOrder2                                                                      -2.9999999999982436    2.2544903630337769 1091.9999999586500508   -1.33  0.18357    
## pers_simplifiedW2(LM):partfunctionProject Management:sortOrder2                                                                       1.5000000000014075    2.2544903630337365 1091.9999999585718342    0.67  0.50597    
## pers_simplifiedM2(JA):partfunctionSales:sortOrder2                                                                                   -2.4999999999968674    2.4000882698932036 1091.9999999576052687   -1.04  0.29781    
## pers_simplifiedW1(MC):partfunctionSales:sortOrder2                                                                                   -1.4999999999975646    2.4000882698933381 1091.9999999578003553   -0.62  0.53212    
## pers_simplifiedW2(LM):partfunctionSales:sortOrder2                                                                                   -1.9999999999981612    2.4000882698930921 1091.9999999574019967   -0.83  0.40486    
## pers_simplifiedM2(JA):partfunctionAdministrative services:sortOrder4                                                                  2.8333333333358475    3.6584851918242767 1091.9999999606661731    0.77  0.43883    
## pers_simplifiedW1(MC):partfunctionAdministrative services:sortOrder4                                                                  5.9166666666683723    3.6584851918243131 1091.9999999510037014    1.62  0.10611    
## pers_simplifiedW2(LM):partfunctionAdministrative services:sortOrder4                                                                  4.2500000000006439    3.6584851918240480 1091.9999999604362984    1.16  0.24562    
## pers_simplifiedM2(JA):partfunctionCustomer Experience/Support:sortOrder4                                                              0.1666666666692000    3.5168122695695612 1091.9999999555716386    0.05  0.96221    
## pers_simplifiedW1(MC):partfunctionCustomer Experience/Support:sortOrder4                                                              2.5833333333350832    3.5168122695696162 1091.9999999571275566    0.73  0.46276    
## pers_simplifiedW2(LM):partfunctionCustomer Experience/Support:sortOrder4                                                              0.9166666666673942    3.5168122695693489 1091.9999999643728188    0.26  0.79441    
## pers_simplifiedM2(JA):partfunctionData Analysis:sortOrder4                                                                            0.1666666666690953    3.4683021907355545 1091.9999999598853719    0.05  0.96168    
## pers_simplifiedW1(MC):partfunctionData Analysis:sortOrder4                                                                            3.9166666666683283    3.4683021907356095 1091.9999999615315573    1.13  0.25903    
## pers_simplifiedW2(LM):partfunctionData Analysis:sortOrder4                                                                            2.2500000000006422    3.4683021907353524 1091.9999999596793714    0.65  0.51665    
## pers_simplifiedM2(JA):partfunctionDesign or creative services:sortOrder4                                                              3.1666666666691046    3.7045056825346907 1091.9999999568142357    0.85  0.39284    
## pers_simplifiedW1(MC):partfunctionDesign or creative services:sortOrder4                                                              3.5833333333350001    3.7045056825347435 1091.9999999555359409    0.97  0.33361    
## pers_simplifiedW2(LM):partfunctionDesign or creative services:sortOrder4                                                              4.9166666666673216    3.7045056825345011 1091.9999999565902726    1.33  0.18472    
## pers_simplifiedM2(JA):partfunctionFinancial services:sortOrder4                                                                       1.1666666666690941    3.5646622550431375 1091.9999999603101060    0.33  0.74351    
## pers_simplifiedW1(MC):partfunctionFinancial services:sortOrder4                                                                       5.5833333333349842    3.5646622550431970 1091.9999999603828655    1.57  0.11757    
## pers_simplifiedW2(LM):partfunctionFinancial services:sortOrder4                                                                       4.9166666666673065    3.5646622550429532 1091.9999999600836418    1.38  0.16809    
## pers_simplifiedM2(JA):partfunctionHealthcare:sortOrder4                                                                               1.8333333333358082    3.4437909140500786 1091.9999999629476406    0.53  0.59459    
## pers_simplifiedW1(MC):partfunctionHealthcare:sortOrder4                                                                               4.2500000000017106    3.4437909140501346 1091.9999999535177722    1.23  0.21743    
## pers_simplifiedW2(LM):partfunctionHealthcare:sortOrder4                                                                               4.5833333333340294    3.4437909140498735 1091.9999999626870704    1.33  0.18350    
## pers_simplifiedM2(JA):partfunctionHuman Resources:sortOrder4                                                                          1.3333333333358133    3.5168122695695727 1091.9999999570727596    0.38  0.70466    
## pers_simplifiedW1(MC):partfunctionHuman Resources:sortOrder4                                                                          2.4166666666683625    3.5168122695696287 1091.9999999646736342    0.69  0.49212    
## pers_simplifiedW2(LM):partfunctionHuman Resources:sortOrder4                                                                          2.5833333333340112    3.5168122695693680 1091.9999999553315320    0.73  0.46276    
## pers_simplifiedM2(JA):partfunctionInformation Technology (IT):sortOrder4                                                              1.2666666666691120    3.4780583343135398 1091.9999999620890776    0.36  0.71579    
## pers_simplifiedW1(MC):partfunctionInformation Technology (IT):sortOrder4                                                              2.4833333333350081    3.4780583343135949 1091.9999999622064024    0.71  0.47538    
## pers_simplifiedW2(LM):partfunctionInformation Technology (IT):sortOrder4                                                              1.5166666666673172    3.4780583343133356 1091.9999999618319180    0.44  0.66287    
## pers_simplifiedM2(JA):partfunctionMarketing:sortOrder4                                                                                1.6666666666691135    3.5646622550431495 1091.9999999603246579    0.47  0.64020    
## pers_simplifiedW1(MC):partfunctionMarketing:sortOrder4                                                                                1.5833333333350059    3.5646622550432028 1091.9999999603892320    0.44  0.65700    
## pers_simplifiedW2(LM):partfunctionMarketing:sortOrder4                                                                                4.4166666666673233    3.5646622550429505 1091.9999999600809133    1.24  0.21561    
## pers_simplifiedM2(JA):partfunctionOperations:sortOrder4                                                                               2.8333333333357893    3.4191039225397506 1091.9999999564599875    0.83  0.40747    
## pers_simplifiedW1(MC):partfunctionOperations:sortOrder4                                                                               1.4166666666683372    3.4191039225398017 1091.9999999645424396    0.41  0.67871    
## pers_simplifiedW2(LM):partfunctionOperations:sortOrder4                                                                               2.0833333333339907    3.4191039225395348 1091.9999999657250100    0.61  0.54244    
## pers_simplifiedM2(JA):partfunctionProject Management:sortOrder4                                                                       2.6666666666691090    3.7045056825346965 1091.9999999636079338    0.72  0.47178    
## pers_simplifiedW1(MC):partfunctionProject Management:sortOrder4                                                                       3.0833333333350068    3.7045056825347480 1091.9999999568817657    0.83  0.40541    
## pers_simplifiedW2(LM):partfunctionProject Management:sortOrder4                                                                       1.9166666666673260    3.7045056825345091 1091.9999999552596819    0.52  0.60499    
## pers_simplifiedM2(JA):partfunctionSales:sortOrder4                                                                                    1.6666666666692065    3.2670669221373876 1091.9999999501146704    0.51  0.61006    
## pers_simplifiedW1(MC):partfunctionSales:sortOrder4                                                                                    1.0833333333351085    3.2670669221374777 1091.9999999607375685    0.33  0.74026    
## pers_simplifiedW2(LM):partfunctionSales:sortOrder4                                                                                    2.9166666666674792    3.2670669221372184 1091.9999999621140887    0.89  0.37219    
## deiexpert_fNo one has DEI Quals.:partfunctionAccounting:sortOrder3                                                                   -0.9166666666689773    2.8068178664403547 1091.9999999559634034   -0.33  0.74404    
## deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services:sortOrder3                                                      -2.9452380952382127    2.9267054559715140 1091.9999999596534508   -1.01  0.31448    
## deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services:sortOrder3                                                        1.0714285714307465    2.0521701204424763 1091.9999999666074473    0.52  0.60171    
## deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder3                                                  -1.7500000000009130    3.6930543238148803 1091.9999999614476565   -0.47  0.63569    
## deiexpert_fWoman Has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder3                                                    2.9166666666682137    2.6516231637490693 1091.9999999590143034    1.10  0.27159    
## deiexpert_fNo one has DEI Quals.:partfunctionData Analysis:sortOrder3                                                                -2.4166666666689469    2.7764729980321512 1091.9999999605581706   -0.87  0.38427    
## deiexpert_fWoman Has DEI Quals.:partfunctionDesign or creative services:sortOrder3                                                   -0.7499999999977711    2.2732001474340575 1091.9999999545630089   -0.33  0.74152    
## deiexpert_fNo one has DEI Quals.:partfunctionFinancial services:sortOrder3                                                           -1.7500000000006304    3.7948727591581797 1091.9999999639258021   -0.46  0.64478    
## deiexpert_fWoman Has DEI Quals.:partfunctionFinancial services:sortOrder3                                                             0.3666666666683230    2.6097612741386449 1091.9999999580381882    0.14  0.88829    
## deiexpert_fNo one has DEI Quals.:partfunctionHealthcare:sortOrder3                                                                   -4.6666666666666607    2.8959453059529330 1091.9999999602791831   -1.61  0.10737    
## deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare:sortOrder3                                                                    -3.2857142857119301    2.1331316547205610 1091.9999999666542863   -1.54  0.12377    
## deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources:sortOrder3                                                               0.0833333333332778    2.9250510152197733 1091.9999999692538495    0.03  0.97728    
## deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT):sortOrder3                                                  -5.3642857142855922    2.8085419562017040 1091.9999999589990693   -1.91  0.05640 .  
## deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT):sortOrder3                                                   -0.5238095238071021    1.9617212567448667 1091.9999999565252438   -0.27  0.78951    
## deiexpert_fWoman Has DEI Quals.:partfunctionLegal services:sortOrder3                                                                -0.9999999999977396    2.5705145080536518 1091.9999999617464255   -0.39  0.69733    
## deiexpert_fWoman Has DEI Quals.:partfunctionMarketing:sortOrder3                                                                      4.9166666666683954    2.9824104168891701 1091.9999999620615654    1.65  0.09953 .  
## deiexpert_fNo one has DEI Quals.:partfunctionMechanical Engineering:sortOrder3                                                       -4.4166666666689780    3.1482244605767526 1091.9999999556623607   -1.40  0.16093    
## deiexpert_fWoman Has DEI Quals.:partfunctionOperations:sortOrder3                                                                     1.3071428571450920    1.8750980678863485 1091.9999999562287485    0.70  0.48588    
## deiexpert_fNo one has DEI Quals.:partfunctionProject Management:sortOrder3                                                           -2.5833333333332815    2.9538699477474224 1091.9999999670751549   -0.87  0.38201    
## deiexpert_fNo one has DEI Quals.:partfunctionSales:sortOrder3                                                                        -2.1500000000002522    2.6896866870352825 1091.9999999582669261   -0.80  0.42426    
## deiexpert_fWoman Has DEI Quals.:partfunctionSales:sortOrder3                                                                          0.8452380952400579    2.1528963676066870 1091.9999999625483724    0.39  0.69469    
## deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services:sortOrder2                                                      -3.8333333333329196    1.6464469700155371 1091.9999999593435405   -2.33  0.02008 *  
## deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services:sortOrder2                                                       -0.3333333333328388    1.7941739895489770 1091.9999999575240963   -0.19  0.85265    
## deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder2                                                  -1.4166666666669765    1.9953619532119704 1091.9999999618280526   -0.71  0.47787    
## deiexpert_fNo one has DEI Quals.:partfunctionData Analysis:sortOrder2                                                                 1.4999999999998976    1.7941739895490068 1091.9999999576416485    0.84  0.40332    
## deiexpert_fNo one has DEI Quals.:partfunctionFinancial services:sortOrder2                                                           -0.1666666666667469    1.9524459269744110 1091.9999999555220711   -0.09  0.93199    
## deiexpert_fNo one has DEI Quals.:partfunctionHealthcare:sortOrder2                                                                   -2.8333333333327788    1.4173521996549805 1091.9999999649494384   -2.00  0.04585 *  
## deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare:sortOrder2                                                                    -4.7023809523802349    1.6676263555705408 1091.9999999529093202   -2.82  0.00489 ** 
## deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources:sortOrder2                                                              -2.1666666666662118    1.7941739895491036 1091.9999999592607764   -1.21  0.22746    
## deiexpert_fWoman Has DEI Quals.:partfunctionHuman Resources:sortOrder2                                                               -1.4999999999994214    1.8407836731515066 1091.9999999580506937   -0.81  0.41532    
## deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT):sortOrder2                                                  -5.0666666666660589    1.3145824854242496 1091.9999999619872142   -3.85  0.00012 ***
## deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT):sortOrder2                                                   -4.2595238095231052    1.6235014309092783 1091.9999999596245743   -2.62  0.00882 ** 
## deiexpert_fWoman Has DEI Quals.:partfunctionLegal services:sortOrder2                                                                -3.9166666666660954    2.3101651752337080 1091.9999999608044163   -1.70  0.09028 .  
## deiexpert_fNo one has DEI Quals.:partfunctionOperations:sortOrder2                                                                   -0.9388888888884158    1.2863552954524173 1091.9999999606327492   -0.73  0.46562    
## deiexpert_fWoman Has DEI Quals.:partfunctionOperations:sortOrder2                                                                    -1.4888888888883229    1.5244460112047138 1091.9999999658416527   -0.98  0.32895    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionAccounting:sortOrder3                                             -1.8333333333294104    3.9694398938310460 1091.9999999571466560   -0.46  0.64427    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionAccounting:sortOrder3                                              3.5833333333366255    3.9694398938308861 1091.9999999558033323    0.90  0.36687    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionAccounting:sortOrder3                                              1.9166666666693108    3.9694398938308142 1091.9999999557242063    0.48  0.62929    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services:sortOrder3                                 4.5000000000024221    4.1389865489062974 1091.9999999575572929    1.09  0.27718    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services:sortOrder3                                 4.6785714285730586    4.1389865489061366 1091.9999999595363533    1.13  0.25857    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services:sortOrder3                                 2.6023809523811972    4.1389865489059359 1091.9999999593239863    0.63  0.52965    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services:sortOrder3                                  0.8333333333318008    2.9022068166270083 1091.9999999672561444    0.29  0.77406    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services:sortOrder3                                 -1.4047619047635522    2.9022068166267210 1091.9999999535825737   -0.48  0.62846    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services:sortOrder3                                 -3.7142857142880485    2.9022068166268777 1091.9999999670594661   -1.28  0.20088    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder3                             2.0000000000040039    5.2227675113196241 1091.9999999614649369    0.38  0.70184    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder3                             4.3333333333363138    5.2227675113195655 1091.9999999601097898    0.83  0.40689    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder3                             0.6666666666680424    5.2227675113191365 1091.9999999610570285    0.13  0.89845    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder3                             -3.1666666666668064    3.7499614404769530 1091.9999999594390374   -0.84  0.39860    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder3                             -3.2500000000005271    3.7499614404767434 1091.9999999605031462   -0.87  0.38631    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder3                             -5.2500000000014531    3.7499614404767816 1091.9999999512681370   -1.40  0.16179    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis:sortOrder3                                           0.6666666666705421    3.9265257693797322 1091.9999999605317953    0.17  0.86521    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis:sortOrder3                                           4.4166666666699514    3.9265257693795865 1091.9999999591768756    1.12  0.26091    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis:sortOrder3                                           4.5833333333359496    3.9265257693795088 1091.9999999602835032    1.17  0.24335    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionDesign or creative services:sortOrder3                              4.3333333333317805    3.2147904784901429 1091.9999999551348537    1.35  0.17796    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionDesign or creative services:sortOrder3                              0.1666666666649339    3.2147904784898529 1091.9999999547410425    0.05  0.95866    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionDesign or creative services:sortOrder3                             -1.5000000000024003    3.2147904784900483 1091.9999999567851319   -0.47  0.64088    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services:sortOrder3                                      0.5000000000036074    5.3667605234816396 1091.9999999560875494    0.09  0.92579    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services:sortOrder3                                      3.3333333333359012    5.3667605234815907 1091.9999999560473043    0.62  0.53466    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services:sortOrder3                                      3.1666666666676986    5.3667605234813012 1091.9999999635961103    0.59  0.55528    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionFinancial services:sortOrder3                                      -1.2166666666669468    3.6907597884433168 1091.9999999584606485   -0.33  0.74173    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionFinancial services:sortOrder3                                       0.6499999999993001    3.6907597884430716 1091.9999999581280008    0.18  0.86024    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionFinancial services:sortOrder3                                      -0.9000000000015881    3.6907597884431667 1091.9999999582821602   -0.24  0.80739    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare:sortOrder3                                              7.6666666666689407    4.0954851275693773 1091.9999999468830083    1.87  0.06148 .  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare:sortOrder3                                              5.0833333333348429    4.0954851275692254 1091.9999999601559466    1.24  0.21480    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare:sortOrder3                                              5.9166666666668215    4.0954851275690487 1091.9999999599679086    1.44  0.14883    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare:sortOrder3                                               6.7380952380935408    3.0167037164336277 1091.9999999549850145    2.23  0.02571 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare:sortOrder3                                               3.5476190476172067    3.0167037164333381 1091.9999999545652827    1.18  0.23985    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare:sortOrder3                                               2.8571428571403152    3.0167037164334927 1091.9999999527669843    0.95  0.34379    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources:sortOrder3                                        -0.3333333333310056    4.1366468163570138 1091.9999999583224053   -0.08  0.93579    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources:sortOrder3                                         0.4166666666681969    4.1366468163568726 1091.9999999559563548    0.10  0.91979    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources:sortOrder3                                        -0.4166666666664573    4.1366468163566967 1091.9999999579881660   -0.10  0.91979    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT):sortOrder3                             8.9571428571449125    3.9718781249543538 1091.9999999590436346    2.26  0.02432 *  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT):sortOrder3                             6.9833333333346239    3.9718781249541948 1091.9999999600704541    1.76  0.07899 .  
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT):sortOrder3                             5.5166666666666204    3.9718781249540007 1091.9999999598571776    1.39  0.16514    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT):sortOrder3                              2.2142857142838563    2.7742928068846204 1091.9999999572139586    0.80  0.42496    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT):sortOrder3                              1.9761904761884748    2.7742928068843131 1091.9999999555357135    0.71  0.47642    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT):sortOrder3                             -2.0952380952407634    2.7742928068845081 1091.9999999569997726   -0.76  0.45027    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services:sortOrder3                                           2.9999999999983822    3.6352564795666207 1091.9999999536321411    0.83  0.40941    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services:sortOrder3                                           0.4999999999982173    3.6352564795663813 1091.9999999618271431    0.14  0.89063    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services:sortOrder3                                           0.4999999999975460    3.6352564795665216 1091.9999999634310370    0.14  0.89063    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionMarketing:sortOrder3                                              -10.6666666666670800    4.2177652601277424 1091.9999999623537406   -2.53  0.01158 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionMarketing:sortOrder3                                               -2.7500000000007820    4.2177652601275462 1091.9999999495464635   -0.65  0.51454    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionMarketing:sortOrder3                                               -6.2500000000016840    4.2177652601276234 1091.9999999496260443   -1.48  0.13867    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionMechanical Engineering:sortOrder3                                  6.6666666666705696    4.4522617295423466 1091.9999999574993126    1.50  0.13459    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionMechanical Engineering:sortOrder3                                  5.0833333333366237    4.4522617295422107 1091.9999999573076366    1.14  0.25381    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionMechanical Engineering:sortOrder3                                  5.9166666666693155    4.4522617295421325 1091.9999999685992407    1.33  0.18415    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionOperations:sortOrder3                                               0.9376623376607388    2.6517891183849294 1091.9999999662391019    0.35  0.72371    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionOperations:sortOrder3                                              -2.2597402597420095    2.6517891183846021 1091.9999999577282779   -0.85  0.39431    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionOperations:sortOrder3                                              -3.9064935064959059    2.6517891183847913 1091.9999999580813892   -1.47  0.14100    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionProject Management:sortOrder3                                      6.0000000000021911    4.1774029415907368 1091.9999999671026671    1.44  0.15120    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionProject Management:sortOrder3                                      4.7500000000013873    4.1774029415905822 1091.9999999648334779    1.14  0.25576    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionProject Management:sortOrder3                                     -0.4166666666666009    4.1774029415904090 1091.9999999539120381   -0.10  0.92057    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionSales:sortOrder3                                                   3.9500000000025177    3.8037913913396628 1091.9999999570052296    1.04  0.29930    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionSales:sortOrder3                                                   1.5833333333350608    3.8037913913395425 1091.9999999581380052    0.42  0.67731    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionSales:sortOrder3                                                   3.0666666666671252    3.8037913913393480 1091.9999999566830411    0.81  0.42030    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionSales:sortOrder3                                                   -0.7738095238103739    3.0446552414535777 1091.9999999631627361   -0.25  0.79942    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionSales:sortOrder3                                                    0.3928571428559708    3.0446552414533059 1091.9999999627732450    0.13  0.89736    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionSales:sortOrder3                                                   -3.0000000000020197    3.0446552414534280 1091.9999999507931534   -0.99  0.32468    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services:sortOrder2                                 5.1666666666662229    2.3284276347240631 1091.9999999577041763    2.22  0.02670 *  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services:sortOrder2                                 5.4999999999995763    2.3284276347240636 1091.9999999577055405    2.36  0.01835 *  
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionAdministrative services:sortOrder2                                 4.6666666666660594    2.3284276347240516 1091.9999999576830305    2.00  0.04529 *  
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services:sortOrder2                                  3.8333333333321429    2.5373451892771643 1091.9999999574511094    1.51  0.13114    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services:sortOrder2                                 -1.8333333333342468    2.5373451892772199 1091.9999999589747404   -0.72  0.47012    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionAdministrative services:sortOrder2                                 -0.6666666666673895    2.5373451892771484 1091.9999999588519586   -0.26  0.79280    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder2                             0.1666666666676926    2.8218679360756629 1091.9999999548285814    0.06  0.95291    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder2                             3.5833333333341395    2.8218679360756633 1091.9999999548290361    1.27  0.20441    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionCustomer Experience/Support:sortOrder2                             1.9166666666671086    2.8218679360755630 1091.9999999617125468    0.68  0.49714    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis:sortOrder2                                          -5.9999999999992939    2.5373451892772558 1091.9999999590370408   -2.36  0.01822 *  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis:sortOrder2                                           1.5000000000005453    2.5373451892772652 1091.9999999590531843    0.59  0.55453    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionData Analysis:sortOrder2                                          -1.4999999999998019    2.5373451892771954 1091.9999999575497895   -0.59  0.55453    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services:sortOrder2                                     -3.8333333333326429    2.7611755097273170 1091.9999999616234163   -1.39  0.16533    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services:sortOrder2                                      3.0833333333338255    2.7611755097273250 1091.9999999616741206    1.12  0.26438    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionFinancial services:sortOrder2                                      1.4166666666668286    2.7611755097272725 1091.9999999554447641    0.51  0.60801    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare:sortOrder2                                              5.4404761904755627    2.0044387034114206 1091.9999999510180260    2.71  0.00675 ** 
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare:sortOrder2                                              3.1904761904756116    2.0044387034114166 1091.9999999510089310    1.59  0.11174    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionHealthcare:sortOrder2                                              2.7023809523802353    2.0044387034114046 1091.9999999649339770    1.35  0.17787    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare:sortOrder2                                               8.9952380952366742    2.3583798090186487 1091.9999999645883690    3.81  0.00014 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare:sortOrder2                                               3.9214285714274095    2.3583798090187122 1091.9999999529240995    1.66  0.09665 .  
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionHealthcare:sortOrder2                                               5.8928571428561733    2.3583798090186097 1091.9999999527331056    2.50  0.01261 *  
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources:sortOrder2                                         0.6666666666661534    2.5373451892773877 1091.9999999578351435    0.26  0.79280    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources:sortOrder2                                         4.1666666666661643    2.5373451892773837 1091.9999999592569111    1.64  0.10085    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionHuman Resources:sortOrder2                                         3.8333333333327233    2.5373451892773828 1091.9999999592555469    1.51  0.13114    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionHuman Resources:sortOrder2                                          2.7499999999987357    2.6032612359657845 1091.9999999579854375    1.06  0.29103    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionHuman Resources:sortOrder2                                          2.5833333333322956    2.6032612359658414 1091.9999999593953817    0.99  0.32125    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionHuman Resources:sortOrder2                                          0.6666666666658551    2.6032612359657694 1091.9999999593162556    0.26  0.79793    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT):sortOrder2                             7.2666666666659303    1.8591003797451093 1091.9999999538874818    3.91 0.000099 ***
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT):sortOrder2                             7.2333333333326237    1.8591003797450947 1091.9999999538531483    3.89  0.00011 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionInformation Technology (IT):sortOrder2                             5.7666666666658344    1.8591003797450936 1091.9999999619590199    3.10  0.00197 ** 
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT):sortOrder2                              8.2904761904747364    2.2959777421239806 1091.9999999594811015    3.61  0.00032 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT):sortOrder2                              4.1595238095225824    2.2959777421240308 1091.9999999595761437    1.81  0.07031 .  
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionInformation Technology (IT):sortOrder2                              4.5880952380942377    2.2959777421239478 1091.9999999594181190    2.00  0.04593 *  
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services:sortOrder2                                           7.6666666666653986    3.2670669221375013 1091.9999999624924385    2.35  0.01912 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services:sortOrder2                                           1.2499999999989568    3.2670669221375439 1091.9999999608262442    0.38  0.70209    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionLegal services:sortOrder2                                           6.7499999999991864    3.2670669221374862 1091.9999999624724296    2.07  0.03906 *  
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:partfunctionOperations:sortOrder2                                              3.4888888888883405    1.8191811048592625 1091.9999999605993253    1.92  0.05539 .  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:partfunctionOperations:sortOrder2                                              0.0833333333327959    1.8191811048592499 1091.9999999606127403    0.05  0.96347    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:partfunctionOperations:sortOrder2                                              0.1833333333327156    1.8191811048592539 1091.9999999605784069    0.10  0.91975    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:partfunctionOperations:sortOrder2                                               5.0222222222209627    2.1558922241512350 1091.9999999657636636    2.33  0.02001 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:partfunctionOperations:sortOrder2                                              -0.6500000000010384    2.1558922241512923 1091.9999999519045559   -0.30  0.76309    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:partfunctionOperations:sortOrder2                                               1.5833333333325448    2.1558922241512066 1091.9999999637902874    0.73  0.46285    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 4208 columns / coefficients
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vq ~ pers_simplified * deiexpert_f + sort + partfunction + (1 |      pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 6998
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -3.611 -0.535  0.027  0.577  2.726 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.576    0.759   
##  Residual             1.527    1.236   
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                                                                               Estimate Std. Error        df t value             Pr(>|t|)    
## (Intercept)                                                                                                     5.3822     0.9975  409.7628    5.40  0.00000011571117041 ***
## pers_simplifiedM2(JA)                                                                                          -1.4755     0.1369 1542.0000  -10.78 < 0.0000000000000002 ***
## pers_simplifiedW1(MC)                                                                                          -1.1871     0.1369 1542.0000   -8.67 < 0.0000000000000002 ***
## pers_simplifiedW2(LM)                                                                                          -1.2638     0.1369 1542.0000   -9.23 < 0.0000000000000002 ***
## deiexpert_fNo one has DEI Quals.                                                                               -1.4862     0.1754 1125.9592   -8.47 < 0.0000000000000002 ***
## deiexpert_fWoman Has DEI Quals.                                                                                -1.9485     0.1656 1234.0385  -11.76 < 0.0000000000000002 ***
## sortOrder3                                                                                                      0.0971     0.1214  404.0000    0.80                0.424    
## sortOrder2                                                                                                     -0.2131     0.1244  404.0000   -1.71                0.087 .  
## sortOrder4                                                                                                     -0.1004     0.2046  404.0000   -0.49                0.624    
## partfunctionAccount Management                                                                                 -0.1227     1.1363  403.9999   -0.11                0.914    
## partfunctionAccounting                                                                                          0.2584     1.0287  403.9999    0.25                0.802    
## partfunctionAdministrative Assistant                                                                            0.0302     1.3954  403.9999    0.02                0.983    
## partfunctionAdministrative services                                                                             0.6013     0.9972  403.9999    0.60                0.547    
## partfunctionassistant manger                                                                                   -0.2477     1.3952  403.9999   -0.18                0.859    
## partfunctionBook editor                                                                                         2.1619     1.3899  403.9999    1.56                0.121    
## partfunctionBusiness Development                                                                                0.2713     1.0638  403.9999    0.25                0.799    
## partfunctionCase manager                                                                                       -0.6595     1.3900  403.9999   -0.47                0.635    
## partfunctionchildcare                                                                                           0.6619     1.3899  403.9999    0.48                0.634    
## partfunctionCivil Engineering                                                                                   0.7268     1.0795  403.9999    0.67                0.501    
## partfunctioncollege educator                                                                                    0.7155     1.3900  403.9999    0.51                0.607    
## partfunctionCommunications                                                                                      0.3626     1.0607  403.9999    0.34                0.733    
## partfunctionConstruction                                                                                        2.5994     1.3951  403.9999    1.86                0.063 .  
## partfunctionConstruction, system management                                                                     0.5625     1.3894  403.9999    0.40                0.686    
## partfunctionConsultant                                                                                          0.5000     1.3843  403.9999    0.36                0.718    
## partfunctioncopywriter                                                                                          0.3750     1.3843  403.9999    0.27                0.787    
## partfunctionCustomer Experience/Support                                                                         0.9854     1.0073  403.9999    0.98                0.329    
## partfunctionData Analysis                                                                                       0.7581     1.0070  403.9999    0.75                0.452    
## partfunctiondATA COLLECTION                                                                                     0.9655     1.3900  403.9999    0.69                0.488    
## partfunctionData Processing                                                                                    -0.4977     1.3952  403.9999   -0.36                0.722    
## partfunctionDesign                                                                                              2.9655     1.3900  403.9999    2.13                0.033 *  
## partfunctionDesign or creative services                                                                         0.2801     1.0202  403.9999    0.27                0.784    
## partfunctionDisaster restoration                                                                                0.4744     1.3951  403.9999    0.34                0.734    
## partfunctionEducation                                                                                          -0.0911     1.1354  403.9999   -0.08                0.936    
## partfunctionEducation                                                                                           0.6619     1.3899  403.9999    0.48                0.634    
## partfunctioneducation administration                                                                            1.7522     1.3951  403.9999    1.26                0.210    
## partfunctionEducational instructor                                                                              0.9375     1.3894  403.9999    0.67                0.500    
## partfunctionElectrical Engineering                                                                              0.7244     1.3951  403.9999    0.52                0.604    
## partfunctionElectrical maintenance                                                                              0.0369     1.3899  403.9999    0.03                0.979    
## partfunctionEmployee                                                                                           -0.4978     1.3951  403.9999   -0.36                0.721    
## partfunctionEntertainment                                                                                       1.9655     1.3900  403.9999    1.41                0.158    
## partfunctionEnvironmental science and remediation services                                                      0.3125     1.3894  403.9999    0.22                0.822    
## partfunctionEverything- hiring, firing, operations, purchases for company and office .                          0.2522     1.3951  403.9999    0.18                0.857    
## partfunctionFaculty                                                                                             0.8750     1.3843  403.9999    0.63                0.528    
## partfunctionFinancial services                                                                                  0.6504     1.0035  403.9999    0.65                0.517    
## partfunctionFireplace Installer                                                                                -0.0625     1.3894  403.9999   -0.04                0.964    
## partfunctionFood delivery                                                                                       1.0302     1.3954  403.9999    0.74                0.461    
## partfunctionForman                                                                                              1.3750     1.3843  403.9999    0.99                0.321    
## partfunctionFreelance gigworker                                                                                -0.1228     1.3951  403.9999   -0.09                0.930    
## partfunctiongas fitter                                                                                         -1.1250     1.3843  403.9999   -0.81                0.417    
## partfunctionGeological lab testing                                                                              0.5647     1.3899  403.9999    0.41                0.685    
## partfunctionGrocery Management                                                                                  0.5022     1.3951  403.9999    0.36                0.719    
## partfunctionGrocery Sales                                                                                       1.3750     1.3843  403.9999    0.99                0.321    
## partfunctionHealthcare                                                                                          0.5401     0.9948  403.9999    0.54                0.587    
## partfunctionHomehealth Manager                                                                                  2.8527     1.3987  403.9999    2.04                0.042 *  
## partfunctionHuman Resources                                                                                     0.5656     1.0067  403.9999    0.56                0.575    
## partfunctionI am the rental property owner/manager.                                                             0.6897     1.3899  403.9999    0.50                0.620    
## partfunctionI an associate.                                                                                     0.6619     1.3899  403.9999    0.48                0.634    
## partfunctioni'm a small business owner -- sole proprietorship that provides tutoring and academic consulting    0.2522     1.3951  403.9999    0.18                0.857    
## partfunctionindividual contributor                                                                              1.0647     1.3899  403.9999    0.77                0.444    
## partfunctionInformation Networking                                                                              2.0625     1.3894  403.9999    1.48                0.138    
## partfunctionInformation Security                                                                                0.4744     1.2112  403.9999    0.39                0.696    
## partfunctionInformation Technology (IT)                                                                         0.7362     0.9932  403.9999    0.74                0.459    
## partfunctionjanitor/cleaner                                                                                     1.1875     1.3894  403.9999    0.85                0.393    
## partfunctionLegal services                                                                                      0.4100     1.0427  403.9999    0.39                0.694    
## partfunctionLibrary Assistant                                                                                   1.3772     1.3951  403.9999    0.99                0.324    
## partfunctionlibrary worker                                                                                      0.2802     1.3954  403.9999    0.20                0.841    
## partfunctionmaintenance manager                                                                                 0.8494     1.3951  403.9999    0.61                0.543    
## partfunctionmaintenance mechanic                                                                                0.1027     1.3987  403.9999    0.07                0.941    
## partfunctionManagement                                                                                          0.8750     1.3843  403.9999    0.63                0.528    
## partfunctionmanager                                                                                            -0.0256     1.3951  403.9999   -0.02                0.985    
## partfunctionManual Laborer                                                                                     -0.2723     1.3987  403.9999   -0.19                0.846    
## partfunctionManufacturing                                                                                       0.5647     1.3899  403.9999    0.41                0.685    
## partfunctionMarketing                                                                                           0.8550     1.0438  403.9999    0.82                0.413    
## partfunctionMechanical Engineering                                                                              0.5817     1.0492  403.9999    0.55                0.580    
## partfunctionMedia Clerk                                                                                         2.1027     1.3987  403.9999    1.50                0.134    
## partfunctionOperations                                                                                          0.1717     0.9915  403.9999    0.17                0.863    
## partfunctionPackage delivery                                                                                    1.8527     1.3987  403.9999    1.32                0.186    
## partfunctionPatient recruitment                                                                                -0.4353     1.3899  403.9999   -0.31                0.754    
## partfunctionPersonal assistant                                                                                  1.3147     1.3899  403.9999    0.95                0.345    
## partfunctionPhotographer                                                                                       -0.3381     1.3899  403.9999   -0.24                0.808    
## partfunctionPrinter Operator                                                                                    1.0000     1.3843  403.9999    0.72                0.470    
## partfunctionPrivate Education                                                                                   0.1619     1.3899  403.9999    0.12                0.907    
## partfunctionProduct Management                                                                                  0.5773     1.0432  403.9999    0.55                0.580    
## partfunctionProgram Management                                                                                  0.9763     1.0977  403.9999    0.89                0.374    
## partfunctionProject Management                                                                                  0.4536     1.0198  403.9999    0.44                0.657    
## partfunctionProperty technician                                                                                -0.3103     1.3899  403.9999   -0.22                0.823    
## partfunctionPublic Relations                                                                                    0.1273     1.2081  403.9999    0.11                0.916    
## partfunctionPurchasing agent                                                                                   -0.5948     1.3954  403.9999   -0.43                0.670    
## partfunctionResearch development                                                                               -1.7756     1.3951  403.9999   -1.27                0.204    
## partfunctionSales                                                                                               0.7036     0.9955  403.9999    0.71                0.480    
## partfunctionSchool Safety                                                                                       1.6552     1.3954  403.9999    1.19                0.236    
## partfunctionSchool/Education                                                                                   -0.7478     1.3951  403.9999   -0.54                0.592    
## partfunctionscientific research consulting                                                                      1.0000     1.3843  403.9999    0.72                0.470    
## partfunctionScientist                                                                                           0.4655     1.3900  403.9999    0.33                0.738    
## partfunctionSenior Scientist                                                                                    0.6027     1.3987  403.9999    0.43                0.667    
## partfunctionSkilled tradesman                                                                                  -2.3381     1.3899  403.9999   -1.68                0.093 .  
## partfunctionSocial worker                                                                                      -0.4978     1.3951  403.9999   -0.36                0.721    
## partfunctionSoftware Engineering                                                                                0.6813     1.0318  403.9999    0.66                0.509    
## partfunctionSpecial Education Paraprofessional                                                                 -0.3125     1.3894  403.9999   -0.22                0.822    
## partfunctionState infrastructure                                                                                0.2802     1.3954  403.9999    0.20                0.841    
## partfunctionSupport students with IEPs                                                                          0.3494     1.3951  403.9999    0.25                0.802    
## partfunctionTeach High Shcool                                                                                   1.0647     1.3899  403.9999    0.77                0.444    
## partfunctionteacher                                                                                             0.8527     1.3987  403.9999    0.61                0.542    
## partfunctionTeacher                                                                                            -0.3415     1.2068  403.9999   -0.28                0.777    
## partfunctionTeacher                                                                                             0.8750     1.3843  403.9999    0.63                0.528    
## partfunctionTeacher assistant                                                                                  -0.3448     1.3954  403.9999   -0.25                0.805    
## partfunctionTeaching                                                                                            0.8125     1.3894  403.9999    0.58                0.559    
## partfunctionTeaching English                                                                                    0.9052     1.3954  403.9999    0.65                0.517    
## partfunctiontechnical writer                                                                                    0.0625     1.3894  403.9999    0.04                0.964    
## partfunctionTo do manual labor and greet customers                                                              0.7523     1.3952  403.9999    0.54                0.590    
## partfunctiontranscription                                                                                       0.1619     1.3899  403.9999    0.12                0.907    
## partfunctionTutor/teacher                                                                                      -0.7500     1.3843  403.9999   -0.54                0.588    
## partfunctionVolunteer                                                                                           0.8494     1.3951  403.9999    0.61                0.543    
## partfunctionWarehouse worker                                                                                    2.5022     1.3951  403.9999    1.79                0.074 .  
## partfunctionwarehousing                                                                                        -0.0881     1.3899  403.9999   -0.06                0.949    
## partfunctionWorker                                                                                             -0.0625     1.3894  403.9999   -0.04                0.964    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.                                                          1.5720     0.1913 1542.0000    8.22  0.00000000000000044 ***
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.                                                          1.8333     0.1913 1542.0000    9.58 < 0.0000000000000002 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.                                                          1.9275     0.1913 1542.0000   10.07 < 0.0000000000000002 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                                                           1.6394     0.1882 1542.0000    8.71 < 0.0000000000000002 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                                                           1.5888     0.1882 1542.0000    8.44 < 0.0000000000000002 ***
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                                                           3.3157     0.1882 1542.0000   17.61 < 0.0000000000000002 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vs ~ pers_simplified * deiexpert_f + sort + partfunction + (1 |      pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7307
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -3.179 -0.528  0.048  0.582  2.794 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.91     0.954   
##  Residual             1.71     1.308   
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                                                                                Estimate Std. Error         df t value             Pr(>|t|)    
## (Intercept)                                                                                                     5.35608    1.17773  408.61890    4.55  0.00000715370481560 ***
## pers_simplifiedM2(JA)                                                                                          -1.33129    0.14485 1542.00001   -9.19 < 0.0000000000000002 ***
## pers_simplifiedW1(MC)                                                                                          -0.80061    0.14485 1542.00001   -5.53  0.00000003813713767 ***
## pers_simplifiedW2(LM)                                                                                          -1.14110    0.14485 1542.00001   -7.88  0.00000000000000624 ***
## deiexpert_fNo one has DEI Quals.                                                                               -1.43744    0.19785  986.94202   -7.27  0.00000000000075591 ***
## deiexpert_fWoman Has DEI Quals.                                                                                -1.89821    0.18608 1081.07706  -10.20 < 0.0000000000000002 ***
## sortOrder3                                                                                                     -0.01690    0.14342  403.99998   -0.12                0.906    
## sortOrder2                                                                                                     -0.34449    0.14692  403.99998   -2.34                0.020 *  
## sortOrder4                                                                                                     -0.20483    0.24175  403.99999   -0.85                0.397    
## partfunctionAccount Management                                                                                  0.67349    1.34257  403.99980    0.50                0.616    
## partfunctionAccounting                                                                                          0.13106    1.21546  403.99976    0.11                0.914    
## partfunctionAdministrative Assistant                                                                            0.06756    1.64866  403.99986    0.04                0.967    
## partfunctionAdministrative services                                                                             0.49796    1.17817  403.99975    0.42                0.673    
## partfunctionassistant manger                                                                                   -0.32435    1.64845  403.99986   -0.20                0.844    
## partfunctionBook editor                                                                                         2.03051    1.64217  403.99986    1.24                0.217    
## partfunctionBusiness Development                                                                                0.06968    1.25687  403.99978    0.06                0.956    
## partfunctionCase manager                                                                                       -0.35486    1.64229  403.99987   -0.22                0.829    
## partfunctionchildcare                                                                                           0.65551    1.64217  403.99986    0.40                0.690    
## partfunctionCivil Engineering                                                                                   0.92257    1.27538  403.99978    0.72                0.470    
## partfunctioncollege educator                                                                                    1.02014    1.64229  403.99987    0.62                0.535    
## partfunctionCommunications                                                                                      0.37538    1.25324  403.99978    0.30                0.765    
## partfunctionConstruction                                                                                        2.46217    1.64825  403.99986    1.49                0.136    
## partfunctionConstruction, system management                                                                     0.30666    1.64161  403.99986    0.19                0.852    
## partfunctionConsultant                                                                                          0.50000    1.63558  403.99987    0.31                0.760    
## partfunctioncopywriter                                                                                         -0.75000    1.63558  403.99987   -0.46                0.647    
## partfunctionCustomer Experience/Support                                                                         1.15416    1.19009  403.99975    0.97                0.333    
## partfunctionData Analysis                                                                                       0.99757    1.18974  403.99975    0.84                0.402    
## partfunctiondATA COLLECTION                                                                                     0.64514    1.64229  403.99987    0.39                0.695    
## partfunctionData Processing                                                                                    -0.57435    1.64845  403.99986   -0.35                0.728    
## partfunctionDesign                                                                                              2.64514    1.64229  403.99987    1.61                0.108    
## partfunctionDesign or creative services                                                                         0.58001    1.20533  403.99976    0.48                0.631    
## partfunctionDisaster restoration                                                                                0.83717    1.64825  403.99986    0.51                0.612    
## partfunctionEducation                                                                                          -0.72792    1.34150  403.99980   -0.54                0.588    
## partfunctionEducation                                                                                           0.78051    1.64217  403.99986    0.48                0.635    
## partfunctioneducation administration                                                                            1.72907    1.64827  403.99986    1.05                0.295    
## partfunctionEducational instructor                                                                              1.18166    1.64161  403.99986    0.72                0.472    
## partfunctionElectrical Engineering                                                                              0.46217    1.64825  403.99986    0.28                0.779    
## partfunctionElectrical maintenance                                                                              0.65551    1.64217  403.99986    0.40                0.690    
## partfunctionEmployee                                                                                           -2.39593    1.64827  403.99986   -1.45                0.147    
## partfunctionEntertainment                                                                                       2.02014    1.64229  403.99987    1.23                0.219    
## partfunctionEnvironmental science and remediation services                                                     -1.06834    1.64161  403.99986   -0.65                0.516    
## partfunctionEverything- hiring, firing, operations, purchases for company and office .                          1.47907    1.64827  403.99986    0.90                0.370    
## partfunctionFaculty                                                                                             0.50000    1.63558  403.99987    0.31                0.760    
## partfunctionFinancial services                                                                                  0.68887    1.18564  403.99975    0.58                0.562    
## partfunctionFireplace Installer                                                                                -0.06834    1.64161  403.99986   -0.04                0.967    
## partfunctionFood delivery                                                                                       0.69256    1.64866  403.99986    0.42                0.675    
## partfunctionForman                                                                                              2.00000    1.63558  403.99987    1.22                0.222    
## partfunctionFreelance gigworker                                                                                -0.02093    1.64827  403.99986   -0.01                0.990    
## partfunctiongas fitter                                                                                         -1.37500    1.63558  403.99987   -0.84                0.401    
## partfunctionGeological lab testing                                                                              0.17241    1.64211  403.99986    0.10                0.916    
## partfunctionGrocery Management                                                                                  1.22907    1.64827  403.99986    0.75                0.456    
## partfunctionGrocery Sales                                                                                       2.00000    1.63558  403.99987    1.22                0.222    
## partfunctionHealthcare                                                                                          0.58731    1.17536  403.99975    0.50                0.618    
## partfunctionHomehealth Manager                                                                                  2.88049    1.65253  403.99986    1.74                0.082 .  
## partfunctionHuman Resources                                                                                     0.87139    1.18939  403.99975    0.73                0.464    
## partfunctionI am the rental property owner/manager.                                                             0.54741    1.64211  403.99986    0.33                0.739    
## partfunctionI an associate.                                                                                     0.78051    1.64217  403.99986    0.48                0.635    
## partfunctioni'm a small business owner -- sole proprietorship that provides tutoring and academic consulting    0.22907    1.64827  403.99986    0.14                0.890    
## partfunctionindividual contributor                                                                              0.29741    1.64211  403.99987    0.18                0.856    
## partfunctionInformation Networking                                                                              1.68166    1.64161  403.99986    1.02                0.306    
## partfunctionInformation Security                                                                                0.46217    1.43107  403.99982    0.32                0.747    
## partfunctionInformation Technology (IT)                                                                         0.84082    1.17344  403.99975    0.72                0.474    
## partfunctionjanitor/cleaner                                                                                     2.43166    1.64161  403.99986    1.48                0.139    
## partfunctionLegal services                                                                                      0.34210    1.23189  403.99977    0.28                0.781    
## partfunctionLibrary Assistant                                                                                   0.22907    1.64827  403.99986    0.14                0.890    
## partfunctionlibrary worker                                                                                      0.69256    1.64866  403.99986    0.42                0.675    
## partfunctionmaintenance manager                                                                                 1.71217    1.64825  403.99986    1.04                0.300    
## partfunctionmaintenance mechanic                                                                               -0.11951    1.65253  403.99986   -0.07                0.942    
## partfunctionManagement                                                                                          1.62500    1.63558  403.99987    0.99                0.321    
## partfunctionmanager                                                                                            -0.53783    1.64825  403.99986   -0.33                0.744    
## partfunctionManual Laborer                                                                                      0.25549    1.65253  403.99986    0.15                0.877    
## partfunctionManufacturing                                                                                       0.29741    1.64211  403.99987    0.18                0.856    
## partfunctionMarketing                                                                                           0.91505    1.23329  403.99977    0.74                0.459    
## partfunctionMechanical Engineering                                                                              1.33968    1.23968  403.99977    1.08                0.280    
## partfunctionMedia Clerk                                                                                         2.63049    1.65253  403.99986    1.59                0.112    
## partfunctionOperations                                                                                          0.40502    1.17145  403.99974    0.35                0.730    
## partfunctionPackage delivery                                                                                    1.63049    1.65253  403.99986    0.99                0.324    
## partfunctionPatient recruitment                                                                                -0.45259    1.64211  403.99986   -0.28                0.783    
## partfunctionPersonal assistant                                                                                  1.29741    1.64211  403.99987    0.79                0.430    
## partfunctionPhotographer                                                                                        1.03051    1.64217  403.99986    0.63                0.531    
## partfunctionPrinter Operator                                                                                    3.12500    1.63558  403.99987    1.91                0.057 .  
## partfunctionPrivate Education                                                                                   0.53051    1.64217  403.99986    0.32                0.747    
## partfunctionProduct Management                                                                                  0.87703    1.23259  403.99977    0.71                0.477    
## partfunctionProgram Management                                                                                  1.21936    1.29697  403.99979    0.94                0.348    
## partfunctionProject Management                                                                                  0.20557    1.20485  403.99976    0.17                0.865    
## partfunctionProperty technician                                                                                -1.57759    1.64211  403.99986   -0.96                0.337    
## partfunctionPublic Relations                                                                                   -0.04764    1.42737  403.99982   -0.03                0.973    
## partfunctionPurchasing agent                                                                                   -0.30744    1.64866  403.99986   -0.19                0.852    
## partfunctionResearch development                                                                               -2.41283    1.64825  403.99986   -1.46                0.144    
## partfunctionSales                                                                                               0.80594    1.17617  403.99975    0.69                0.494    
## partfunctionSchool Safety                                                                                       0.81756    1.64866  403.99986    0.50                0.620    
## partfunctionSchool/Education                                                                                   -0.77093    1.64827  403.99986   -0.47                0.640    
## partfunctionscientific research consulting                                                                      1.75000    1.63558  403.99987    1.07                0.285    
## partfunctionScientist                                                                                           0.52014    1.64229  403.99987    0.32                0.752    
## partfunctionSenior Scientist                                                                                    0.88049    1.65253  403.99986    0.53                0.594    
## partfunctionSkilled tradesman                                                                                  -3.21949    1.64217  403.99986   -1.96                0.051 .  
## partfunctionSocial worker                                                                                      -0.52093    1.64827  403.99986   -0.32                0.752    
## partfunctionSoftware Engineering                                                                                0.97300    1.21905  403.99976    0.80                0.425    
## partfunctionSpecial Education Paraprofessional                                                                 -0.06834    1.64161  403.99986   -0.04                0.967    
## partfunctionState infrastructure                                                                                0.44256    1.64866  403.99986    0.27                0.789    
## partfunctionSupport students with IEPs                                                                          0.33717    1.64825  403.99986    0.20                0.838    
## partfunctionTeach High Shcool                                                                                   1.29741    1.64211  403.99987    0.79                0.430    
## partfunctionteacher                                                                                             0.00549    1.65253  403.99986    0.00                0.997    
## partfunctionTeacher                                                                                            -1.17426    1.42581  403.99982   -0.82                0.411    
## partfunctionTeacher                                                                                             1.00000    1.63558  403.99987    0.61                0.541    
## partfunctionTeacher assistant                                                                                  -0.93244    1.64866  403.99986   -0.57                0.572    
## partfunctionTeaching                                                                                            1.05666    1.64161  403.99986    0.64                0.520    
## partfunctionTeaching English                                                                                    1.81756    1.64866  403.99986    1.10                0.271    
## partfunctiontechnical writer                                                                                    0.80666    1.64161  403.99986    0.49                0.623    
## partfunctionTo do manual labor and greet customers                                                              1.42565    1.64845  403.99986    0.86                0.388    
## partfunctiontranscription                                                                                       0.03051    1.64217  403.99986    0.02                0.985    
## partfunctionTutor/teacher                                                                                       0.37500    1.63558  403.99987    0.23                0.819    
## partfunctionVolunteer                                                                                           0.46217    1.64825  403.99986    0.28                0.779    
## partfunctionWarehouse worker                                                                                    2.47907    1.64827  403.99986    1.50                0.133    
## partfunctionwarehousing                                                                                         0.53051    1.64217  403.99986    0.32                0.747    
## partfunctionWorker                                                                                              1.05666    1.64161  403.99986    0.64                0.520    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.                                                          1.41901    0.20244 1542.00001    7.01  0.00000000000356046 ***
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.                                                          1.59301    0.20244 1542.00001    7.87  0.00000000000000667 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.                                                          1.88379    0.20244 1542.00001    9.31 < 0.0000000000000002 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                                                           1.50069    0.19917 1542.00001    7.53  0.00000000000008302 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                                                           1.63941    0.19917 1542.00001    8.23  0.00000000000000039 ***
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                                                           3.17936    0.19917 1542.00001   15.96 < 0.0000000000000002 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

But it does seem like we get some variance across qualification sets

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: rank_r ~ pers_simplified * deiexpert_f * sort + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 5927
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.6952 -0.7117  0.0949  0.5464  2.3785 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.00     0       
##  Residual             1.01     1       
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                                    Estimate Std. Error        df t value             Pr(>|t|)    
## (Intercept)                                                          2.8113     0.1379 2028.0000   20.39 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                               -0.7925     0.1950 2028.0000   -4.06        0.00004991488 ***
## pers_simplifiedW1(MC)                                               -0.7358     0.1950 2028.0000   -3.77              0.00016 ***
## pers_simplifiedW2(LM)                                                0.2830     0.1950 2028.0000    1.45              0.14674    
## deiexpert_fNo one has DEI Quals.                                    -0.0970     0.2073 2028.0000   -0.47              0.63982    
## deiexpert_fWoman Has DEI Quals.                                     -0.3447     0.1892 2028.0000   -1.82              0.06863 .  
## sortOrder3                                                          -0.9517     0.1915 2028.0000   -4.97        0.00000072786 ***
## sortOrder2                                                          -0.4151     0.1950 2028.0000   -2.13              0.03336 *  
## sortOrder4                                                           0.1905     0.2190 2028.0000    0.87              0.38455    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.               0.2210     0.2932 2028.0000    0.75              0.45105    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.               0.4501     0.2932 2028.0000    1.54              0.12489    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.              -0.2830     0.2932 2028.0000   -0.97              0.33453    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                0.2258     0.2675 2028.0000    0.84              0.39882    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                0.3358     0.2675 2028.0000    1.26              0.20952    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                0.8170     0.2675 2028.0000    3.05              0.00229 ** 
## pers_simplifiedM2(JA):sortOrder3                                     1.8275     0.2708 2028.0000    6.75        0.00000000002 ***
## pers_simplifiedW1(MC):sortOrder3                                     1.3148     0.2708 2028.0000    4.85        0.00000129786 ***
## pers_simplifiedW2(LM):sortOrder3                                     0.6643     0.2708 2028.0000    2.45              0.01425 *  
## pers_simplifiedM2(JA):sortOrder2                                     0.9434     0.2757 2028.0000    3.42              0.00063 ***
## pers_simplifiedW1(MC):sortOrder2                                     0.6792     0.2757 2028.0000    2.46              0.01384 *  
## pers_simplifiedW2(LM):sortOrder2                                     0.0377     0.2757 2028.0000    0.14              0.89115    
## pers_simplifiedM2(JA):sortOrder4                                     0.3333     0.3097 2028.0000    1.08              0.28194    
## pers_simplifiedW1(MC):sortOrder4                                     0.1667     0.3097 2028.0000    0.54              0.59055    
## pers_simplifiedW2(LM):sortOrder4                                    -1.2619     0.3097 2028.0000   -4.07        0.00004791538 ***
## deiexpert_fNo one has DEI Quals.:sortOrder3                          0.7906     0.2865 2028.0000    2.76              0.00584 ** 
## deiexpert_fWoman Has DEI Quals.:sortOrder3                           0.0979     0.2640 2028.0000    0.37              0.71080    
## deiexpert_fNo one has DEI Quals.:sortOrder2                         -0.2242     0.2952 2028.0000   -0.76              0.44774    
## deiexpert_fWoman Has DEI Quals.:sortOrder2                          -0.0352     0.2670 2028.0000   -0.13              0.89520    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:sortOrder3   -1.1285     0.4052 2028.0000   -2.79              0.00540 ** 
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:sortOrder3   -1.0504     0.4052 2028.0000   -2.59              0.00960 ** 
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:sortOrder3   -0.9835     0.4052 2028.0000   -2.43              0.01530 *  
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:sortOrder3    -0.4222     0.3734 2028.0000   -1.13              0.25833    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:sortOrder3    -0.0761     0.3734 2028.0000   -0.20              0.83855    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:sortOrder3     0.1066     0.3734 2028.0000    0.29              0.77525    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:sortOrder2   -0.5720     0.4175 2028.0000   -1.37              0.17088    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:sortOrder2    0.2315     0.4175 2028.0000    0.55              0.57939    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:sortOrder2    1.2373     0.4175 2028.0000    2.96              0.00308 ** 
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:sortOrder2    -0.6062     0.3776 2028.0000   -1.61              0.10858    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:sortOrder2     0.1962     0.3776 2028.0000    0.52              0.60351    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:sortOrder2     0.5508     0.3776 2028.0000    1.46              0.14486    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 8 columns / coefficients
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vq ~ pers_simplified * deiexpert_f * sort + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7039
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -3.792 -0.531  0.045  0.589  3.119 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.618    0.786   
##  Residual             1.342    1.158   
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                                    Estimate Std. Error        df t value             Pr(>|t|)    
## (Intercept)                                                          5.8491     0.1923 1562.1144   30.42 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                               -1.8774     0.2250 1521.0000   -8.34 < 0.0000000000000002 ***
## pers_simplifiedW1(MC)                                               -1.4151     0.2250 1521.0000   -6.29      0.0000000004184 ***
## pers_simplifiedW2(LM)                                               -0.8019     0.2250 1521.0000   -3.56              0.00038 ***
## deiexpert_fNo one has DEI Quals.                                    -0.7895     0.2892 1562.1144   -2.73              0.00641 ** 
## deiexpert_fWoman Has DEI Quals.                                     -1.2991     0.2639 1562.1144   -4.92      0.0000009451768 ***
## sortOrder3                                                          -0.0508     0.2671 1562.1144   -0.19              0.84918    
## sortOrder2                                                           0.0755     0.2720 1562.1144    0.28              0.78142    
## sortOrder4                                                          -0.8333     0.3055 1562.1144   -2.73              0.00645 ** 
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.               1.2821     0.3384 1521.0000    3.79              0.00016 ***
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.               1.1413     0.3384 1521.0000    3.37              0.00076 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.               0.4328     0.3384 1521.0000    1.28              0.20112    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                1.0774     0.3088 1521.0000    3.49              0.00050 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                1.0568     0.3088 1521.0000    3.42              0.00064 ***
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                2.2019     0.3088 1521.0000    7.13      0.0000000000015 ***
## pers_simplifiedM2(JA):sortOrder3                                     0.2809     0.3126 1521.0000    0.90              0.36909    
## pers_simplifiedW1(MC):sortOrder3                                     0.9239     0.3126 1521.0000    2.96              0.00317 ** 
## pers_simplifiedW2(LM):sortOrder3                                    -0.3823     0.3126 1521.0000   -1.22              0.22152    
## pers_simplifiedM2(JA):sortOrder2                                     0.9340     0.3182 1521.0000    2.93              0.00339 ** 
## pers_simplifiedW1(MC):sortOrder2                                    -0.2925     0.3182 1521.0000   -0.92              0.35827    
## pers_simplifiedW2(LM):sortOrder2                                    -1.0094     0.3182 1521.0000   -3.17              0.00154 ** 
## pers_simplifiedM2(JA):sortOrder4                                     0.5000     0.3575 1521.0000    1.40              0.16214    
## pers_simplifiedW1(MC):sortOrder4                                     1.8214     0.3575 1521.0000    5.09      0.0000003926068 ***
## pers_simplifiedW2(LM):sortOrder4                                     1.2857     0.3575 1521.0000    3.60              0.00033 ***
## deiexpert_fNo one has DEI Quals.:sortOrder3                         -0.4662     0.3997 1562.1144   -1.17              0.24364    
## deiexpert_fWoman Has DEI Quals.:sortOrder3                          -0.7169     0.3683 1562.1144   -1.95              0.05176 .  
## deiexpert_fNo one has DEI Quals.:sortOrder2                         -1.1350     0.4119 1562.1144   -2.76              0.00592 ** 
## deiexpert_fWoman Has DEI Quals.:sortOrder2                          -1.2320     0.3725 1562.1144   -3.31              0.00096 ***
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:sortOrder3    1.1229     0.4677 1521.0000    2.40              0.01647 *  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:sortOrder3   -0.0543     0.4677 1521.0000   -0.12              0.90757    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:sortOrder3    1.2407     0.4677 1521.0000    2.65              0.00806 ** 
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:sortOrder3     0.6159     0.4310 1521.0000    1.43              0.15319    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:sortOrder3     0.7006     0.4310 1521.0000    1.63              0.10425    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:sortOrder3     1.0388     0.4310 1521.0000    2.41              0.01606 *  
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:sortOrder2   -0.1512     0.4820 1521.0000   -0.31              0.75374    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:sortOrder2    1.2913     0.4820 1521.0000    2.68              0.00746 ** 
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:sortOrder2    3.0660     0.4820 1521.0000    6.36      0.0000000002637 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:sortOrder2     1.0464     0.4359 1521.0000    2.40              0.01649 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:sortOrder2     0.9213     0.4359 1521.0000    2.11              0.03472 *  
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:sortOrder2     2.2980     0.4359 1521.0000    5.27      0.0000001546071 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 8 columns / coefficients

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vs ~ pers_simplified * deiexpert_f * sort + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7442
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -3.295 -0.520  0.054  0.573  2.848 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.981    0.99    
##  Residual             1.551    1.25    
## Number of obs: 2068, groups:  pid, 517
## 
## Fixed effects:
##                                                                    Estimate Std. Error        df t value             Pr(>|t|)    
## (Intercept)                                                          5.8868     0.2186 1398.6280   26.93 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                               -1.6792     0.2420 1521.0000   -6.94      0.0000000000058 ***
## pers_simplifiedW1(MC)                                               -0.8962     0.2420 1521.0000   -3.70              0.00022 ***
## pers_simplifiedW2(LM)                                               -0.6226     0.2420 1521.0000   -2.57              0.01016 *  
## deiexpert_fNo one has DEI Quals.                                    -0.7201     0.3287 1398.6280   -2.19              0.02864 *  
## deiexpert_fWoman Has DEI Quals.                                     -1.2035     0.3000 1398.6280   -4.01      0.0000633466327 ***
## sortOrder3                                                          -0.2377     0.3036 1398.6280   -0.78              0.43390    
## sortOrder2                                                           0.0755     0.3091 1398.6280    0.24              0.80714    
## sortOrder4                                                          -0.9762     0.3472 1398.6280   -2.81              0.00500 ** 
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.               0.9650     0.3639 1521.0000    2.65              0.00809 ** 
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.               0.7534     0.3639 1521.0000    2.07              0.03859 *  
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.               0.5036     0.3639 1521.0000    1.38              0.16658    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                0.9959     0.3320 1521.0000    3.00              0.00275 ** 
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                0.9546     0.3320 1521.0000    2.87              0.00410 ** 
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                1.9226     0.3320 1521.0000    5.79      0.0000000085175 ***
## pers_simplifiedM2(JA):sortOrder3                                     0.1529     0.3361 1521.0000    0.45              0.64918    
## pers_simplifiedW1(MC):sortOrder3                                     0.7296     0.3361 1521.0000    2.17              0.03012 *  
## pers_simplifiedW2(LM):sortOrder3                                    -0.4475     0.3361 1521.0000   -1.33              0.18323    
## pers_simplifiedM2(JA):sortOrder2                                     0.9057     0.3422 1521.0000    2.65              0.00821 ** 
## pers_simplifiedW1(MC):sortOrder2                                    -0.4906     0.3422 1521.0000   -1.43              0.15187    
## pers_simplifiedW2(LM):sortOrder2                                    -1.1132     0.3422 1521.0000   -3.25              0.00117 ** 
## pers_simplifiedM2(JA):sortOrder4                                     0.7381     0.3844 1521.0000    1.92              0.05501 .  
## pers_simplifiedW1(MC):sortOrder4                                     1.9643     0.3844 1521.0000    5.11      0.0000003623490 ***
## pers_simplifiedW2(LM):sortOrder4                                     1.1190     0.3844 1521.0000    2.91              0.00365 ** 
## deiexpert_fNo one has DEI Quals.:sortOrder3                         -0.3120     0.4543 1398.6280   -0.69              0.49233    
## deiexpert_fWoman Has DEI Quals.:sortOrder3                          -0.5263     0.4186 1398.6280   -1.26              0.20886    
## deiexpert_fNo one has DEI Quals.:sortOrder2                         -1.2671     0.4681 1398.6280   -2.71              0.00687 ** 
## deiexpert_fWoman Has DEI Quals.:sortOrder2                          -1.4473     0.4234 1398.6280   -3.42              0.00065 ***
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:sortOrder3    1.2422     0.5029 1521.0000    2.47              0.01361 *  
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:sortOrder3   -0.1293     0.5029 1521.0000   -0.26              0.79718    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:sortOrder3    1.0985     0.5029 1521.0000    2.18              0.02908 *  
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:sortOrder3     0.5465     0.4634 1521.0000    1.18              0.23841    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:sortOrder3     0.6557     0.4634 1521.0000    1.41              0.15730    
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:sortOrder3     1.1959     0.4634 1521.0000    2.58              0.00995 ** 
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.:sortOrder2    0.1086     0.5182 1521.0000    0.21              0.83399    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.:sortOrder2    1.7209     0.5182 1521.0000    3.32              0.00092 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.:sortOrder2    2.8573     0.5182 1521.0000    5.51      0.0000000411702 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.:sortOrder2     0.9416     0.4687 1521.0000    2.01              0.04470 *  
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.:sortOrder2     1.4240     0.4687 1521.0000    3.04              0.00242 ** 
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.:sortOrder2     2.5673     0.4687 1521.0000    5.48      0.0000000503192 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## fit warnings:
## fixed-effect model matrix is rank deficient so dropping 8 columns / coefficients

All Three graphs together so it is easier to visualize differences

Part. gender as a control

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vq ~ targ_gend_f * deiexpert_f + part_gend_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7412
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.8397 -0.5740  0.0341  0.6259  2.4741 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.482    0.694   
##  Residual             1.810    1.345   
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                           Estimate Std. Error        df t value             Pr(>|t|)    
## (Intercept)                                                 5.1992     0.1053  874.8778   49.38 < 0.0000000000000002 ***
## targ_gend_fWoman Target                                    -0.5000     0.1057 1533.0000   -4.73    0.000002442987300 ***
## deiexpert_fNo one has DEI Quals.                           -0.6006     0.1298 1037.2897   -4.63    0.000004156025719 ***
## deiexpert_fWoman Has DEI Quals.                            -1.1361     0.1273 1037.5812   -8.93 < 0.0000000000000002 ***
## part_gend_fMale Participants                               -0.1292     0.0875  508.0000   -1.48                 0.14    
## targ_gend_fWoman Target:deiexpert_fNo one has DEI Quals.    1.1131     0.1481 1533.0000    7.51    0.000000000000097 ***
## targ_gend_fWoman Target:deiexpert_fWoman Has DEI Quals.     1.6484     0.1453 1533.0000   11.34 < 0.0000000000000002 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) tr__WT d_ohDQ d_WHDQ pr__MP tTohDQ
## trg_gnd_fWT -0.502                                   
## dx_NohDEIQ. -0.610  0.407                            
## dxp_WHDEIQ. -0.625  0.415  0.519                     
## prt_gnd_fMP -0.477  0.000 -0.034 -0.028              
## t__WT:_ohDQ  0.358 -0.714 -0.571 -0.296  0.000       
## t__WT:_WHDQ  0.365 -0.727 -0.296 -0.571  0.000  0.519
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vs ~ targ_gend_f * deiexpert_f + part_gend_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7672
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -3.0078 -0.5209  0.0466  0.6087  2.5450 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.876    0.936   
##  Residual             1.898    1.378   
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                          Estimate Std. Error       df t value             Pr(>|t|)    
## (Intercept)                                                 5.242      0.122  771.444   42.93 < 0.0000000000000002 ***
## targ_gend_fWoman Target                                    -0.318      0.108 1533.000   -2.94               0.0034 ** 
## deiexpert_fNo one has DEI Quals.                           -0.619      0.149  890.563   -4.16    0.000035460762448 ***
## deiexpert_fWoman Has DEI Quals.                            -1.118      0.146  890.780   -7.66    0.000000000000049 ***
## part_gend_fMale Participants                               -0.127      0.105  508.000   -1.20               0.2294    
## targ_gend_fWoman Target:deiexpert_fNo one has DEI Quals.    1.055      0.152 1533.000    6.95    0.000000000005340 ***
## targ_gend_fWoman Target:deiexpert_fWoman Has DEI Quals.     1.679      0.149 1533.000   11.28 < 0.0000000000000002 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) tr__WT d_ohDQ d_WHDQ pr__MP tTohDQ
## trg_gnd_fWT -0.443                                   
## dx_NohDEIQ. -0.602  0.364                            
## dxp_WHDEIQ. -0.617  0.371  0.519                     
## prt_gnd_fMP -0.494  0.000 -0.036 -0.030              
## t__WT:_ohDQ  0.316 -0.714 -0.510 -0.265  0.000       
## t__WT:_WHDQ  0.322 -0.727 -0.264 -0.510  0.000  0.519
## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: rank ~ targ_gend_f * deiexpert_f + part_gend_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 6163
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -1.809 -0.905  0.000  0.905  1.809 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.00     0.00    
##  Residual             1.18     1.08    
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                                         Estimate              Std. Error                      df t value             Pr(>|t|)    
## (Intercept)                                                 2.586419753086416584    0.066490702063280616 2040.999999990141759554   38.90 < 0.0000000000000002 ***
## targ_gend_fWoman Target                                    -0.172839506172836471    0.085178226376689176 2040.999999994098061507   -2.03                0.043 *  
## deiexpert_fNo one has DEI Quals.                           -0.044753086419750530    0.084451251978879344 2040.999999992913899405   -0.53                0.596    
## deiexpert_fWoman Has DEI Quals.                             0.375118708452044369    0.082829909530788073 2040.999999986772309057    4.53        0.00000627472 ***
## part_gend_fMale Participants                                0.000000000000000927    0.049064121112677765 2040.999999996511633071    0.00                1.000    
## targ_gend_fWoman Target:deiexpert_fNo one has DEI Quals.    0.089506172839503115    0.119379820572424231 2040.999999994553263605    0.75                0.453    
## targ_gend_fWoman Target:deiexpert_fWoman Has DEI Quals.    -0.750237416904086740    0.117104105218564805 2040.999999987468981999   -6.41        0.00000000018 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) tr__WT d_ohDQ d_WHDQ pr__MP tTohDQ
## trg_gnd_fWT -0.641                                   
## dx_NohDEIQ. -0.634  0.504                            
## dxp_WHDEIQ. -0.648  0.514  0.519                     
## prt_gnd_fMP -0.424  0.000 -0.030 -0.024              
## t__WT:_ohDQ  0.457 -0.714 -0.707 -0.367  0.000       
## t__WT:_WHDQ  0.466 -0.727 -0.367 -0.707  0.000  0.519
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')

Part. gender as a moderator

Each candidate individually

VQ

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vq ~ pers_simplified * part_gend_f * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7163
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -3.535 -0.541  0.040  0.605  2.627 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.554    0.744   
##  Residual             1.530    1.237   
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                                                     Estimate Std. Error       df t value             Pr(>|t|)    
## (Intercept)                                                                            6.058      0.174 1670.023   34.86 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                                                 -1.877      0.211 1518.000   -8.91 < 0.0000000000000002 ***
## pers_simplifiedW1(MC)                                                                 -1.406      0.211 1518.000   -6.68    0.000000000034240 ***
## pers_simplifiedW2(LM)                                                                 -1.428      0.211 1518.000   -6.78    0.000000000017195 ***
## part_gend_fMale Participants                                                          -0.332      0.229 1670.023   -1.45                0.148    
## deiexpert_fNo one has DEI Quals.                                                      -1.510      0.252 1670.023   -6.00    0.000000002344784 ***
## deiexpert_fWoman Has DEI Quals.                                                       -1.872      0.245 1670.023   -7.65    0.000000000000035 ***
## pers_simplifiedM2(JA):part_gend_fMale Participants                                     0.683      0.278 1518.000    2.46                0.014 *  
## pers_simplifiedW1(MC):part_gend_fMale Participants                                     0.347      0.278 1518.000    1.25                0.212    
## pers_simplifiedW2(LM):part_gend_fMale Participants                                     0.261      0.278 1518.000    0.94                0.348    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.                                 1.877      0.305 1518.000    6.16    0.000000000942609 ***
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.                                 1.977      0.305 1518.000    6.49    0.000000000118000 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.                                 2.285      0.305 1518.000    7.50    0.000000000000111 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                                  1.827      0.297 1518.000    6.16    0.000000000948272 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                                  1.506      0.297 1518.000    5.07    0.000000435489166 ***
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                                  3.456      0.297 1518.000   11.65 < 0.0000000000000002 ***
## part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.                          0.194      0.325 1670.023    0.60                0.550    
## part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.                          -0.135      0.318 1670.023   -0.42                0.671    
## pers_simplifiedM2(JA):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.502      0.394 1518.000   -1.28                0.202    
## pers_simplifiedW1(MC):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.204      0.394 1518.000   -0.52                0.605    
## pers_simplifiedW2(LM):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.547      0.394 1518.000   -1.39                0.165    
## pers_simplifiedM2(JA):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.    -0.325      0.385 1518.000   -0.84                0.398    
## pers_simplifiedW1(MC):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.     0.156      0.385 1518.000    0.41                0.685    
## pers_simplifiedW2(LM):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.    -0.214      0.385 1518.000   -0.55                0.579    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

VS

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vs ~ pers_simplified * part_gend_f * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7518
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -3.210 -0.527  0.078  0.604  2.664 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.918    0.958   
##  Residual             1.712    1.309   
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                                                     Estimate Std. Error       df t value             Pr(>|t|)    
## (Intercept)                                                                            5.986      0.195 1482.092   30.65 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                                                 -1.797      0.223 1518.000   -8.07   0.0000000000000015 ***
## pers_simplifiedW1(MC)                                                                 -1.094      0.223 1518.000   -4.91   0.0000010005881465 ***
## pers_simplifiedW2(LM)                                                                 -1.362      0.223 1518.000   -6.12   0.0000000012242688 ***
## part_gend_fMale Participants                                                          -0.254      0.258 1482.092   -0.99               0.3239    
## deiexpert_fNo one has DEI Quals.                                                      -1.239      0.283 1482.092   -4.39   0.0000123873577954 ***
## deiexpert_fWoman Has DEI Quals.                                                       -1.728      0.275 1482.092   -6.28   0.0000000004391783 ***
## pers_simplifiedM2(JA):part_gend_fMale Participants                                     0.797      0.294 1518.000    2.71               0.0068 ** 
## pers_simplifiedW1(MC):part_gend_fMale Participants                                     0.487      0.294 1518.000    1.66               0.0981 .  
## pers_simplifiedW2(LM):part_gend_fMale Participants                                     0.352      0.294 1518.000    1.20               0.2320    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.                                 1.670      0.322 1518.000    5.18   0.0000002527098025 ***
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.                                 1.697      0.322 1518.000    5.26   0.0000001613756706 ***
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.                                 2.124      0.322 1518.000    6.59   0.0000000000615258 ***
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                                  1.811      0.314 1518.000    5.77   0.0000000095854009 ***
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                                  1.723      0.314 1518.000    5.49   0.0000000476089901 ***
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                                  3.319      0.314 1518.000   10.57 < 0.0000000000000002 ***
## part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.                         -0.149      0.365 1482.092   -0.41               0.6835    
## part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.                          -0.235      0.357 1482.092   -0.66               0.5106    
## pers_simplifiedM2(JA):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.432      0.416 1518.000   -1.04               0.2997    
## pers_simplifiedW1(MC):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.142      0.416 1518.000   -0.34               0.7327    
## pers_simplifiedW2(LM):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.361      0.416 1518.000   -0.87               0.3860    
## pers_simplifiedM2(JA):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.    -0.526      0.407 1518.000   -1.29               0.1971    
## pers_simplifiedW1(MC):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.    -0.120      0.407 1518.000   -0.29               0.7689    
## pers_simplifiedW2(LM):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.    -0.202      0.407 1518.000   -0.49               0.6208    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Ranking

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: rank_r ~ pers_simplified * part_gend_f * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 6033
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.5259 -0.8875  0.0683  0.6474  1.9798 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.00     0.00    
##  Residual             1.09     1.05    
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                                                       Estimate Std. Error         df t value             Pr(>|t|)    
## (Intercept)                                                                            2.34783    0.12596 2024.00000   18.64 < 0.0000000000000002 ***
## pers_simplifiedM2(JA)                                                                  0.18841    0.17813 2024.00000    1.06               0.2903    
## pers_simplifiedW1(MC)                                                                 -0.11594    0.17813 2024.00000   -0.65               0.5152    
## pers_simplifiedW2(LM)                                                                  0.53623    0.17813 2024.00000    3.01               0.0026 ** 
## part_gend_fMale Participants                                                          -0.02525    0.16624 2024.00000   -0.15               0.8793    
## deiexpert_fNo one has DEI Quals.                                                       0.06487    0.18232 2024.00000    0.36               0.7220    
## deiexpert_fWoman Has DEI Quals.                                                       -0.30497    0.17749 2024.00000   -1.72               0.0859 .  
## pers_simplifiedM2(JA):part_gend_fMale Participants                                    -0.04862    0.23510 2024.00000   -0.21               0.8362    
## pers_simplifiedW1(MC):part_gend_fMale Participants                                     0.12669    0.23510 2024.00000    0.54               0.5900    
## pers_simplifiedW2(LM):part_gend_fMale Participants                                     0.02291    0.23510 2024.00000    0.10               0.9224    
## pers_simplifiedM2(JA):deiexpert_fNo one has DEI Quals.                                -0.26777    0.25784 2024.00000   -1.04               0.2992    
## pers_simplifiedW1(MC):deiexpert_fNo one has DEI Quals.                                 0.33816    0.25784 2024.00000    1.31               0.1898    
## pers_simplifiedW2(LM):deiexpert_fNo one has DEI Quals.                                -0.32988    0.25784 2024.00000   -1.28               0.2009    
## pers_simplifiedM2(JA):deiexpert_fWoman Has DEI Quals.                                 -0.30269    0.25102 2024.00000   -1.21               0.2280    
## pers_simplifiedW1(MC):deiexpert_fWoman Has DEI Quals.                                  0.45880    0.25102 2024.00000    1.83               0.0677 .  
## pers_simplifiedW2(LM):deiexpert_fWoman Has DEI Quals.                                  1.06377    0.25102 2024.00000    4.24             0.000024 ***
## part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.                          0.24112    0.23546 2024.00000    1.02               0.3059    
## part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.                          -0.00868    0.23033 2024.00000   -0.04               0.9699    
## pers_simplifiedM2(JA):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.11011    0.33298 2024.00000   -0.33               0.7409    
## pers_simplifiedW1(MC):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.36796    0.33298 2024.00000   -1.11               0.2693    
## pers_simplifiedW2(LM):part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.48640    0.33298 2024.00000   -1.46               0.1442    
## pers_simplifiedM2(JA):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.     0.28791    0.32573 2024.00000    0.88               0.3769    
## pers_simplifiedW1(MC):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.    -0.16598    0.32573 2024.00000   -0.51               0.6104    
## pers_simplifiedW2(LM):part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.    -0.08719    0.32573 2024.00000   -0.27               0.7890    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')

Combined men and women

VQ

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vq ~ targ_gend_f * part_gend_f * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7417
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.8360 -0.5893  0.0414  0.6451  2.5014 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.483    0.695   
##  Residual             1.812    1.346   
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                                                         Estimate Std. Error         df t value             Pr(>|t|)    
## (Intercept)                                                                              5.11957    0.14189 1034.16276   36.08 < 0.0000000000000002 ***
## targ_gend_fWoman Target                                                                 -0.47826    0.16206 1530.00000   -2.95               0.0032 ** 
## part_gend_fMale Participants                                                             0.00947    0.18727 1034.16276    0.05               0.9597    
## deiexpert_fNo one has DEI Quals.                                                        -0.57195    0.20539 1034.16276   -2.78               0.0055 ** 
## deiexpert_fWoman Has DEI Quals.                                                         -0.95885    0.19995 1034.16276   -4.80      0.0000018610470 ***
## targ_gend_fWoman Target:part_gend_fMale Participants                                    -0.03787    0.21389 1530.00000   -0.18               0.8595    
## targ_gend_fWoman Target:deiexpert_fNo one has DEI Quals.                                 1.19255    0.23459 1530.00000    5.08      0.0000004158819 ***
## targ_gend_fWoman Target:deiexpert_fWoman Has DEI Quals.                                  1.56755    0.22837 1530.00000    6.86      0.0000000000097 ***
## part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.                           -0.05709    0.26524 1034.16276   -0.22               0.8296    
## part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.                            -0.29741    0.25946 1034.16276   -1.15               0.2520    
## targ_gend_fWoman Target:part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.12404    0.30295 1530.00000   -0.41               0.6823    
## targ_gend_fWoman Target:part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.     0.13385    0.29635 1530.00000    0.45               0.6516    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) tr__WT pr__MP d_ohDQ d_WHDQ t__WTP tTohDQ t_THDQ pPohDQ p_PHDQ tTPohDQ
## trg_gnd_fWT -0.571                                                                       
## prt_gnd_fMP -0.758  0.433                                                                
## dx_NohDEIQ. -0.691  0.395  0.523                                                         
## dxp_WHDEIQ. -0.710  0.405  0.538  0.490                                                  
## tr__WT:__MP  0.433 -0.758 -0.571 -0.299 -0.307                                           
## t__WT:_ohDQ  0.395 -0.691 -0.299 -0.571 -0.280  0.523                                    
## t__WT:_WHDQ  0.405 -0.710 -0.307 -0.280 -0.571  0.538  0.490                             
## p__MP:_ohDQ  0.535 -0.305 -0.706 -0.774 -0.380  0.403  0.442  0.217                      
## p__MP:_WHDQ  0.547 -0.312 -0.722 -0.378 -0.771  0.412  0.216  0.440  0.510               
## t__WT:PohDQ -0.305  0.535  0.403  0.442  0.217 -0.706 -0.774 -0.380 -0.571 -0.291        
## t__WT:_PHDQ -0.312  0.547  0.412  0.216  0.440 -0.722 -0.378 -0.771 -0.291 -0.571  0.510

VS

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: vs ~ targ_gend_f * part_gend_f * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 7674
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -3.0327 -0.5295  0.0532  0.6045  2.5290 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.871    0.933   
##  Residual             1.901    1.379   
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                                                        Estimate Std. Error        df t value             Pr(>|t|)    
## (Intercept)                                                                              5.0870     0.1625  889.6509   31.31 < 0.0000000000000002 ***
## targ_gend_fWoman Target                                                                 -0.3297     0.1660 1530.0000   -1.99              0.04718 *  
## part_gend_fMale Participants                                                             0.1442     0.2145  889.6509    0.67              0.50142    
## deiexpert_fNo one has DEI Quals.                                                        -0.4044     0.2352  889.6509   -1.72              0.08588 .  
## deiexpert_fWoman Has DEI Quals.                                                         -0.8227     0.2290  889.6509   -3.59              0.00034 ***
## targ_gend_fWoman Target:part_gend_fMale Participants                                     0.0206     0.2191 1530.0000    0.09              0.92521    
## targ_gend_fWoman Target:deiexpert_fNo one has DEI Quals.                                 1.0757     0.2403 1530.0000    4.48      0.0000081273741 ***
## targ_gend_fWoman Target:deiexpert_fWoman Has DEI Quals.                                  1.6154     0.2339 1530.0000    6.91      0.0000000000073 ***
## part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.                           -0.3649     0.3037  889.6509   -1.20              0.22998    
## part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.                            -0.4978     0.2971  889.6509   -1.68              0.09421 .  
## targ_gend_fWoman Target:part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.   -0.0356     0.3103 1530.0000   -0.11              0.90855    
## targ_gend_fWoman Target:part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.     0.1022     0.3035 1530.0000    0.34              0.73640    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) tr__WT pr__MP d_ohDQ d_WHDQ t__WTP tTohDQ t_THDQ pPohDQ p_PHDQ tTPohDQ
## trg_gnd_fWT -0.511                                                                       
## prt_gnd_fMP -0.758  0.387                                                                
## dx_NohDEIQ. -0.691  0.353  0.523                                                         
## dxp_WHDEIQ. -0.710  0.362  0.538  0.490                                                  
## tr__WT:__MP  0.387 -0.758 -0.511 -0.267 -0.275                                           
## t__WT:_ohDQ  0.353 -0.691 -0.267 -0.511 -0.250  0.523                                    
## t__WT:_WHDQ  0.362 -0.710 -0.275 -0.250 -0.511  0.538  0.490                             
## p__MP:_ohDQ  0.535 -0.273 -0.706 -0.774 -0.380  0.361  0.396  0.194                      
## p__MP:_WHDQ  0.547 -0.279 -0.722 -0.378 -0.771  0.369  0.193  0.394  0.510               
## t__WT:PohDQ -0.273  0.535  0.361  0.396  0.194 -0.706 -0.774 -0.380 -0.511 -0.260        
## t__WT:_PHDQ -0.279  0.547  0.369  0.193  0.394 -0.722 -0.378 -0.771 -0.260 -0.511  0.510

Ranking

## Linear mixed model fit by REML. t-tests use Satterthwaite's method ['lmerModLmerTest']
## Formula: rank ~ targ_gend_f * part_gend_f * deiexpert_f + (1 | pid)
##    Data: qual_clean_long
## 
## REML criterion at convergence: 6169
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -1.8575 -0.9090 -0.0132  0.9090  1.8575 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev.
##  pid      (Intercept) 0.00     0.00    
##  Residual             1.18     1.08    
## Number of obs: 2048, groups:  pid, 512
## 
## Fixed effects:
##                                                                                        Estimate Std. Error        df t value             Pr(>|t|)    
## (Intercept)                                                                              2.5580     0.0923 2036.0000   27.71 < 0.0000000000000002 ***
## targ_gend_fWoman Target                                                                 -0.1159     0.1306 2036.0000   -0.89              0.37459    
## part_gend_fMale Participants                                                             0.0496     0.1218 2036.0000    0.41              0.68424    
## deiexpert_fNo one has DEI Quals.                                                         0.0690     0.1336 2036.0000    0.52              0.60558    
## deiexpert_fWoman Has DEI Quals.                                                          0.4563     0.1301 2036.0000    3.51              0.00046 ***
## targ_gend_fWoman Target:part_gend_fMale Participants                                    -0.0991     0.1723 2036.0000   -0.58              0.56521    
## targ_gend_fWoman Target:deiexpert_fNo one has DEI Quals.                                -0.1380     0.1890 2036.0000   -0.73              0.46522    
## targ_gend_fWoman Target:deiexpert_fWoman Has DEI Quals.                                 -0.9126     0.1840 2036.0000   -4.96           0.00000076 ***
## part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.                           -0.1861     0.1726 2036.0000   -1.08              0.28105    
## part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.                            -0.1353     0.1688 2036.0000   -0.80              0.42302    
## targ_gend_fWoman Target:part_gend_fMale Participants:deiexpert_fNo one has DEI Quals.    0.3721     0.2440 2036.0000    1.52              0.12745    
## targ_gend_fWoman Target:part_gend_fMale Participants:deiexpert_fWoman Has DEI Quals.     0.2705     0.2387 2036.0000    1.13              0.25723    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) tr__WT pr__MP d_ohDQ d_WHDQ t__WTP tTohDQ t_THDQ pPohDQ p_PHDQ tTPohDQ
## trg_gnd_fWT -0.707                                                                       
## prt_gnd_fMP -0.758  0.536                                                                
## dx_NohDEIQ. -0.691  0.489  0.523                                                         
## dxp_WHDEIQ. -0.710  0.502  0.538  0.490                                                  
## tr__WT:__MP  0.536 -0.758 -0.707 -0.370 -0.380                                           
## t__WT:_ohDQ  0.489 -0.691 -0.370 -0.707 -0.347  0.523                                    
## t__WT:_WHDQ  0.502 -0.710 -0.380 -0.347 -0.707  0.538  0.490                             
## p__MP:_ohDQ  0.535 -0.378 -0.706 -0.774 -0.380  0.499  0.548  0.268                      
## p__MP:_WHDQ  0.547 -0.387 -0.722 -0.378 -0.771  0.510  0.267  0.545  0.510               
## t__WT:PohDQ -0.378  0.535  0.499  0.548  0.268 -0.706 -0.774 -0.380 -0.707 -0.360        
## t__WT:_PHDQ -0.387  0.547  0.510  0.267  0.545 -0.722 -0.378 -0.771 -0.360 -0.707  0.510 
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')
## [[1]]

## 
## [[2]]

## 
## [[3]]

## 
## [[4]]

Rank woman as #1

Here, I compare whether participants ranked a woman as N# 1 (regardless of condition)

## 
## Call:
## lm(formula = rank_wom ~ deiexpert, data = qual_clean)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -0.847 -0.356  0.153  0.526  0.644 
## 
## Coefficients:
##                Estimate Std. Error t value            Pr(>|t|)    
## (Intercept)      0.3558     0.0352    10.1 <0.0000000000000002 ***
## deiexpertnone    0.1179     0.0492     2.4               0.017 *  
## deiexpertwoman   0.4912     0.0484    10.2 <0.0000000000000002 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 0.449 on 514 degrees of freedom
## Multiple R-squared:  0.182,  Adjusted R-squared:  0.179 
## F-statistic: 57.3 on 2 and 514 DF,  p-value: <0.0000000000000002