Load the libraries + functions

library(readr)
library(psych)
library(GPArotation)
library(paran)

The Data

gov_tweets <- read_csv("Gov Tweets_MEM.csv")
head(gov_tweets)
## # A tibble: 6 x 507
##   State Name  Party Segment    WC RawTokenCount extend covid public health
##   <chr> <chr> <chr>   <dbl> <dbl>         <dbl>  <dbl> <dbl>  <dbl>  <dbl>
## 1 GA    Bria~ R           1  1221          1426 0      1.89  0.140   0.351
## 2 CA    Gavi~ D           1  2213          2573 0      0.194 0.117   0.233
## 3 TX    Greg~ R           1  2509          2757 0      0.617 0.326   0.725
## 4 AR    Asa ~ R           1  4163          5184 0.0193 3.22  0.231   0.424
## 5 TN    Bill~ R           1  5500          6412 0.0468 1.78  0.125   0.561
## 6 ND    Doug~ R           1  3581          4278 0.0468 2.62  0.0701  0.397
## # ... with 497 more variables: disaster <dbl>, emergency <dbl>, industry <dbl>,
## #   sector <dbl>, affect <dbl>, crisis <dbl>, important <dbl>, continue <dbl>,
## #   support <dbl>, protect <dbl>, people <dbl>, threat <dbl>, longer <dbl>,
## #   imminent <dbl>, urllink <dbl>, live <dbl>, governor <dbl>, provide <dbl>,
## #   update <dbl>, media <dbl>, hold <dbl>, news <dbl>, conference <dbl>,
## #   X1.30 <dbl>, pm <dbl>, today <dbl>, response <dbl>, watch <dbl>,
## #   faith <dbl>, community <dbl>, effort <dbl>, fight <dbl>, in.person <dbl>,
## #   fellowship <dbl>, church <dbl>, meet <dbl>, remotely <dbl>, present <dbl>,
## #   guidance <dbl>, give <dbl>, house <dbl>, worship <dbl>, option <dbl>,
## #   congregation <dbl>, thank <dbl>, X.walmart <dbl>, quest <dbl>,
## #   diagnostic <dbl>, opening <dbl>, drive.thru <dbl>, test <dbl>, site <dbl>,
## #   central <dbl>, symptomatic <dbl>, care <dbl>, worker <dbl>,
## #   responder <dbl>, increase <dbl>, capacity <dbl>, enhance <dbl>,
## #   gathering <dbl>, data <dbl>, look <dbl>, lift <dbl>, restriction <dbl>,
## #   week <dbl>, encourage <dbl>, weekend <dbl>, thanks <dbl>,
## #   partnership <dbl>, hospital <dbl>, exceed <dbl>, goal <dbl>, conduct <dbl>,
## #   gt <dbl>, X1.500 <dbl>, day <dbl>, accurate <dbl>, sample <dbl>,
## #   number <dbl>, noon <dbl>, surge <dbl>, campaign <dbl>, symptom <dbl>,
## #   wait <dbl>, veteran <dbl>, louis <dbl>, year <dbl>, fought <dbl>,
## #   daughter <dbl>, fellow <dbl>, state <dbl>, throw <dbl>, party <dbl>,
## #   family <dbl>, attend <dbl>, happy <dbl>, birthday <dbl>, serve <dbl>,
## #   fever <dbl>, ...
table(gov_tweets$Party)
## 
##  D  R 
## 23 26
paran(gov_tweets[,7:507], iterations = 100, centile = 95, graph = TRUE)
## 
## Using eigendecomposition of correlation matrix.
## Computing: 10%  20%  30%  40%  50%  60%  70%  80%  90%  100%
## 
## 
## Results of Horn's Parallel Analysis for component retention
## 100 iterations, using the 95 centile estimate
## 
## -------------------------------------------------- 
## Component   Adjusted    Unadjusted    Estimated 
##             Eigenvalue  Eigenvalue    Bias 
## -------------------------------------------------- 
## 1          20.194934   37.068761      16.873827
## 2           5.989285   22.027479      16.038193
## 3           5.573844   21.023141      15.449297
## 4           4.847876   19.816368      14.968492
## 5           3.911669   18.449219      14.537550
## 6           2.749968   16.886234      14.136265
## 7           2.879284   16.676265      13.796980
## 8           2.238142   15.751470      13.513327
## 9           2.164554   15.370526      13.205971
## 10          1.862468   14.702398      12.839930
## 11          1.112515   13.712912      12.600396
## 12          1.295184   13.557384      12.262200
## 13          1.282300   13.214897      11.932596
## -------------------------------------------------- 
## 
## Adjusted eigenvalues > 1 indicate dimensions to retain.
## (13 components retained)

fa.parallel(gov_tweets[,7:507], n.iter = 100, quant=.95, plot=TRUE)

## Parallel analysis suggests that the number of factors =  13  and the number of components =  13

How many factors?

components = principal(gov_tweets[,7:507],nfactors = 13, rotate = 'oblimin')
plot(components$values[1:20], type = "b")

Simple structure - run the PCA

pca_solution1 <- principal(gov_tweets[,7:507], nfactors = 4, rotate = 'oblimin')
pca_solution1
## Principal Components Analysis
## Call: principal(r = gov_tweets[, 7:507], nfactors = 4, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
##                        TC1   TC3   TC2   TC4     h2   u2 com
## extend                0.00 -0.01  0.13  0.19 0.0557 0.94 1.8
## covid                 0.16  0.03 -0.16 -0.25 0.1120 0.89 2.6
## public               -0.02  0.05  0.16  0.02 0.0287 0.97 1.3
## health               -0.08  0.33 -0.08 -0.20 0.1616 0.84 2.0
## disaster              0.00  0.07  0.11  0.47 0.2363 0.76 1.1
## emergency            -0.08  0.23 -0.54  0.18 0.3682 0.63 1.7
## industry              0.24  0.21  0.11 -0.07 0.1211 0.88 2.6
## sector                0.13  0.01  0.13 -0.09 0.0393 0.96 2.7
## affect                0.12  0.30  0.02  0.15 0.1306 0.87 1.8
## crisis                0.18  0.10 -0.35 -0.06 0.1722 0.83 1.7
## important             0.03  0.15  0.15 -0.33 0.1571 0.84 1.9
## continue             -0.25  0.39 -0.05 -0.13 0.2294 0.77 2.0
## support               0.01  0.49 -0.56  0.15 0.5603 0.44 2.1
## protect              -0.14  0.26  0.21 -0.42 0.3177 0.68 2.5
## people               -0.02  0.18  0.11 -0.20 0.0851 0.91 2.6
## threat                0.15  0.17  0.09  0.07 0.0679 0.93 2.9
## longer                0.40  0.10  0.00 -0.01 0.1761 0.82 1.1
## imminent              0.33  0.02  0.07  0.03 0.1143 0.89 1.1
## urllink              -0.07 -0.03  0.14  0.42 0.1990 0.80 1.3
## live                  0.15 -0.33  0.15  0.20 0.1969 0.80 2.6
## governor              0.50 -0.06  0.04  0.06 0.2566 0.74 1.1
## provide               0.63  0.17  0.06  0.29 0.5500 0.45 1.6
## update                0.30 -0.38  0.06  0.30 0.3294 0.67 2.9
## media                 0.83 -0.11 -0.24  0.03 0.7709 0.23 1.2
## hold                  0.40 -0.24  0.05  0.25 0.2863 0.71 2.5
## news                  0.42 -0.13 -0.11  0.41 0.3952 0.60 2.3
## conference            0.37 -0.20  0.03  0.34 0.2994 0.70 2.5
## X1.30                 0.55 -0.16  0.04  0.08 0.3374 0.66 1.2
## pm                    0.42 -0.16 -0.27  0.42 0.4734 0.53 3.0
## today                 0.29 -0.15 -0.04  0.33 0.2308 0.77 2.4
## response              0.27  0.11 -0.03  0.39 0.2564 0.74 1.9
## watch                 0.16 -0.28  0.16  0.39 0.2901 0.71 2.6
## faith                 0.19  0.06  0.16 -0.01 0.0635 0.94 2.2
## community            -0.25  0.11  0.15 -0.22 0.1499 0.85 3.1
## effort               -0.15  0.10  0.14  0.58 0.3780 0.62 1.3
## fight                -0.10 -0.11  0.13  0.26 0.1059 0.89 2.2
## in.person             0.11  0.19 -0.04 -0.04 0.0539 0.95 1.9
## fellowship            0.68  0.04  0.02  0.08 0.4752 0.52 1.0
## church                0.14  0.24  0.02  0.13 0.0983 0.90 2.2
## meet                 -0.09  0.43  0.06 -0.24 0.2554 0.74 1.7
## remotely              0.35 -0.04  0.05 -0.24 0.1722 0.83 1.9
## present               0.27  0.26 -0.05 -0.26 0.2064 0.79 3.1
## guidance              0.01  0.23  0.18 -0.11 0.0992 0.90 2.3
## give                  0.02 -0.19  0.14  0.10 0.0668 0.93 2.5
## house                 0.18  0.51  0.04 -0.25 0.3635 0.64 1.8
## worship               0.11  0.34  0.05  0.22 0.1865 0.81 2.0
## option               -0.01  0.56 -0.09 -0.10 0.3278 0.67 1.1
## congregation          0.40  0.04  0.08 -0.17 0.1872 0.81 1.5
## thank                -0.17 -0.02  0.23  0.20 0.1186 0.88 2.9
## X.walmart             0.24  0.01  0.02  0.11 0.0748 0.93 1.4
## quest                 0.51  0.19 -0.06  0.05 0.3167 0.68 1.3
## diagnostic            0.29  0.13  0.00 -0.14 0.1172 0.88 1.9
## opening               0.08  0.24 -0.01  0.42 0.2509 0.75 1.7
## drive.thru            0.07  0.12  0.09  0.44 0.2216 0.78 1.3
## test                  0.05  0.07 -0.08 -0.01 0.0126 0.99 2.7
## site                 -0.06  0.25  0.04  0.36 0.1920 0.81 1.9
## central               0.68  0.07  0.05  0.04 0.4784 0.52 1.0
## symptomatic           0.66 -0.11 -0.01 -0.10 0.4416 0.56 1.1
## care                 -0.07  0.37 -0.21 -0.26 0.2537 0.75 2.5
## worker               -0.06  0.37  0.21 -0.29 0.2718 0.73 2.6
## responder            -0.12  0.09  0.14 -0.18 0.0763 0.92 3.1
## increase              0.11  0.15 -0.44 -0.21 0.2685 0.73 1.9
## capacity              0.05  0.56  0.01 -0.28 0.3891 0.61 1.5
## enhance               0.04  0.25  0.11 -0.09 0.0833 0.92 1.7
## gathering             0.23  0.36  0.15 -0.14 0.2281 0.77 2.4
## data                  0.13 -0.15  0.11 -0.26 0.1085 0.89 2.6
## look                  0.11  0.12 -0.58 -0.06 0.3726 0.63 1.2
## lift                  0.33  0.14  0.13 -0.25 0.1926 0.81 2.6
## restriction           0.12  0.14  0.10 -0.13 0.0592 0.94 3.8
## week                  0.39 -0.03  0.19 -0.01 0.1855 0.81 1.5
## encourage             0.08  0.07  0.14  0.19 0.0691 0.93 2.5
## weekend              -0.02  0.18  0.06  0.02 0.0362 0.96 1.2
## thanks               -0.05  0.37  0.04  0.17 0.1688 0.83 1.5
## partnership          -0.01  0.43  0.06  0.03 0.1924 0.81 1.0
## hospital             -0.02  0.07 -0.15 -0.32 0.1325 0.87 1.6
## exceed                0.24  0.19  0.03  0.19 0.1398 0.86 2.9
## goal                  0.05  0.22  0.03 -0.24 0.1090 0.89 2.1
## conduct               0.13 -0.14  0.05  0.11 0.0517 0.95 3.2
## gt                   -0.02 -0.15  0.13  0.05 0.0440 0.96 2.2
## X1.500                0.50 -0.02 -0.01 -0.20 0.2780 0.72 1.3
## day                  -0.06 -0.07 -0.76  0.07 0.5922 0.41 1.0
## accurate              0.13  0.09  0.09 -0.03 0.0330 0.97 2.7
## sample                0.32  0.06  0.01 -0.13 0.1209 0.88 1.4
## number                0.25 -0.26  0.16 -0.39 0.2868 0.71 3.0
## noon                  0.08 -0.14  0.11  0.00 0.0338 0.97 2.5
## surge                -0.03  0.25  0.15 -0.08 0.0948 0.91 1.9
## campaign              0.30  0.04  0.01 -0.21 0.1251 0.87 1.8
## symptom               0.18  0.02  0.14 -0.18 0.0816 0.92 2.9
## wait                  0.14 -0.16 -0.86 -0.06 0.7880 0.21 1.1
## veteran               0.22  0.03  0.06 -0.15 0.0697 0.93 2.0
## louis                 0.39 -0.01  0.00  0.06 0.1572 0.84 1.0
## year                  0.28  0.32  0.03 -0.17 0.2155 0.78 2.5
## fought                0.59 -0.05  0.00 -0.05 0.3421 0.66 1.0
## daughter              0.55  0.04 -0.01 -0.14 0.3161 0.68 1.1
## fellow                0.04  0.22  0.11 -0.18 0.0955 0.90 2.6
## state                -0.28 -0.02  0.13  0.16 0.1185 0.88 2.1
## throw                 0.30  0.02  0.11  0.05 0.1050 0.89 1.4
## party                 0.37  0.03  0.04 -0.15 0.1564 0.84 1.4
## family               -0.14  0.19  0.23 -0.42 0.2959 0.70 2.3
## attend                0.21  0.01  0.14  0.14 0.0861 0.91 2.6
## happy                 0.20  0.06  0.04 -0.27 0.1090 0.89 2.0
## birthday              0.23  0.07  0.00 -0.22 0.1010 0.90 2.2
## serve                 0.00  0.74 -0.03  0.17 0.5716 0.43 1.1
## fever                 0.45  0.07  0.07 -0.07 0.2197 0.78 1.2
## cough                 0.22  0.17  0.06  0.10 0.0962 0.90 2.5
## short                 0.38 -0.02  0.01  0.03 0.1482 0.85 1.0
## breath                0.45  0.09  0.07 -0.05 0.2176 0.78 1.2
## outbreak              0.13 -0.03  0.10  0.02 0.0274 0.97 2.0
## participate           0.38 -0.13  0.04  0.01 0.1575 0.84 1.3
## X.2020census          0.47 -0.10  0.01 -0.01 0.2242 0.78 1.1
## respond              -0.04  0.72 -0.04 -0.04 0.5261 0.47 1.0
## census                0.08  0.09  0.08 -0.15 0.0432 0.96 2.9
## submit                0.11  0.26  0.03  0.18 0.1181 0.88 2.2
## phone                 0.28 -0.15  0.05  0.22 0.1563 0.84 2.6
## mail                  0.39  0.03  0.04 -0.35 0.2585 0.74 2.0
## online               -0.03  0.16  0.06  0.15 0.0517 0.95 2.3
## announce              0.02  0.03 -0.70 -0.06 0.5004 0.50 1.0
## creation              0.47  0.03  0.06 -0.05 0.2264 0.77 1.1
## work                 -0.19  0.58  0.05 -0.17 0.4013 0.60 1.4
## group                 0.05  0.08  0.10 -0.03 0.0196 0.98 2.7
## ensure               -0.14  0.51  0.09  0.16 0.3002 0.70 1.4
## adequate              0.47  0.14  0.02 -0.13 0.2573 0.74 1.3
## process               0.01 -0.08 -0.85 -0.09 0.7384 0.26 1.0
## place                 0.15 -0.13  0.21 -0.29 0.1566 0.84 2.9
## pursue                0.28  0.17  0.04  0.09 0.1216 0.88 1.9
## economic              0.01  0.26  0.15  0.22 0.1389 0.86 2.5
## recovery              0.13  0.25  0.05  0.22 0.1355 0.86 2.6
## strategy              0.41  0.45  0.01 -0.08 0.3914 0.61 2.1
## join                 -0.07  0.08  0.21  0.29 0.1362 0.86 2.1
## meeting               0.10 -0.02  0.09  0.56 0.3459 0.65 1.1
## afternoon             0.13 -0.18  0.10  0.38 0.2076 0.79 1.8
## organize              0.54 -0.06 -0.02 -0.03 0.2944 0.71 1.0
## night                 0.14 -0.22  0.10 -0.11 0.0849 0.92 2.8
## town                  0.11  0.37  0.15  0.24 0.2365 0.76 2.3
## tornado               0.47  0.10  0.03  0.10 0.2492 0.75 1.2
## word                  0.09 -0.15  0.19 -0.12 0.0757 0.92 3.1
## spread               -0.21 -0.01  0.18 -0.21 0.1261 0.87 2.9
## donation              0.05 -0.01 -0.83 -0.01 0.6907 0.31 1.0
## arrive                0.30  0.09  0.04  0.09 0.1131 0.89 1.4
## operation             0.23 -0.02 -0.02  0.26 0.1283 0.87 2.0
## full                  0.02  0.05  0.11  0.42 0.1917 0.81 1.2
## restaurant           -0.04  0.13  0.08  0.06 0.0279 0.97 2.3
## X2.500                0.24  0.04  0.08 -0.08 0.0704 0.93 1.6
## free                  0.02  0.29  0.05  0.01 0.0885 0.91 1.1
## spirit                0.26  0.11  0.02  0.17 0.1171 0.88 2.2
## X2.3                  0.38  0.06  0.07  0.22 0.2163 0.78 1.7
## task                  0.28  0.10  0.18 -0.18 0.1482 0.85 2.7
## force                 0.18  0.39  0.11 -0.13 0.2187 0.78 1.8
## X27                   0.23 -0.29  0.06 -0.01 0.1310 0.87 2.0
## leader               -0.04  0.52  0.09  0.07 0.2840 0.72 1.1
## private               0.01  0.19  0.18 -0.11 0.0790 0.92 2.7
## agency                0.00  0.04  0.02  0.11 0.0147 0.99 1.3
## examine               0.80 -0.04 -0.02  0.09 0.6529 0.35 1.0
## impact               -0.12 -0.04 -0.49 -0.32 0.3657 0.63 1.9
## business              0.02  0.39  0.21 -0.03 0.2038 0.80 1.6
## select                0.22  0.16 -0.03 -0.09 0.0848 0.92 2.2
## chairman              0.54  0.06  0.00  0.09 0.3117 0.69 1.1
## X1.3                  0.34  0.03  0.00  0.26 0.1975 0.80 1.9
## create                0.02 -0.09 -0.79 -0.04 0.6375 0.36 1.0
## develop               0.06  0.20 -0.04  0.24 0.1044 0.90 2.1
## recommendation        0.33 -0.01  0.11  0.07 0.1271 0.87 1.3
## effect               -0.05  0.27  0.11  0.37 0.2203 0.78 2.1
## offer                 0.05  0.07  0.13  0.08 0.0319 0.97 2.7
## condolence            0.25 -0.05  0.09 -0.12 0.0821 0.92 1.8
## chief                 0.11 -0.19  0.06  0.16 0.0784 0.92 2.8
## officer               0.15 -0.20  0.11 -0.11 0.0826 0.92 3.1
## native                0.76  0.04 -0.05  0.00 0.5851 0.41 1.0
## lost                  0.09 -0.14  0.05 -0.21 0.0696 0.93 2.3
## life                  0.11  0.12  0.09 -0.30 0.1178 0.88 1.8
## grateful              0.13  0.20 -0.41  0.05 0.2263 0.77 1.7
## service              -0.11  0.41 -0.03  0.41 0.3401 0.66 2.2
## country               0.05  0.27  0.15 -0.14 0.1153 0.88 2.2
## X1st                  0.46  0.21 -0.04 -0.16 0.2799 0.72 1.7
## report                0.06 -0.17  0.01 -0.02 0.0310 0.97 1.3
## medical              -0.01  0.09 -0.58 -0.03 0.3422 0.66 1.1
## advisory              0.49  0.13 -0.04 -0.03 0.2581 0.74 1.2
## committee             0.90  0.03 -0.02  0.02 0.8097 0.19 1.0
## prioritize            0.14  0.23  0.11 -0.07 0.0911 0.91 2.4
## restore               0.16  0.53 -0.11  0.08 0.3338 0.67 1.3
## economy              -0.07  0.03  0.10  0.10 0.0246 0.98 2.9
## timely                0.05  0.26  0.06  0.08 0.0801 0.92 1.4
## fashion               0.75  0.04 -0.01 -0.08 0.5642 0.44 1.0
## vulnerable           -0.14  0.28  0.18  0.00 0.1292 0.87 2.2
## maintain              0.08 -0.08  0.15 -0.07 0.0390 0.96 2.8
## prevent              -0.11  0.04  0.02  0.19 0.0477 0.95 1.8
## resurgence            0.79  0.08  0.07 -0.05 0.6331 0.37 1.0
## X1.2                 -0.04  0.04 -0.02  0.31 0.0980 0.90 1.1
## careful               0.32 -0.09  0.11 -0.21 0.1525 0.85 2.1
## review                0.06 -0.10 -0.81 -0.02 0.6804 0.32 1.0
## X.realdonaldtrump    -0.16  0.07  0.09  0.29 0.1152 0.88 2.0
## model                 0.15  0.33  0.06 -0.09 0.1462 0.85 1.6
## reopening             0.04 -0.09  0.15 -0.13 0.0486 0.95 2.9
## base                  0.12  0.36  0.09 -0.01 0.1577 0.84 1.4
## current               0.37 -0.16  0.11  0.01 0.1647 0.84 1.6
## hope                  0.07  0.29  0.12 -0.26 0.1696 0.83 2.5
## begin                 0.02  0.06  0.12 -0.21 0.0607 0.94 1.8
## launch                0.04  0.33 -0.67 -0.14 0.5768 0.42 1.6
## website               0.03 -0.03  0.07  0.13 0.0251 0.97 1.7
## regularly             0.10 -0.01  0.13 -0.13 0.0394 0.96 2.9
## information          -0.09 -0.19  0.19  0.00 0.0807 0.92 2.4
## regard                0.05 -0.17  0.13  0.37 0.1886 0.81 1.7
## relate               -0.04 -0.14 -0.48  0.06 0.2585 0.74 1.2
## unemployment         -0.02  0.15  0.15 -0.04 0.0456 0.95 2.2
## benefit              -0.09  0.15  0.12  0.09 0.0514 0.95 3.3
## shop                  0.11 -0.17  0.09 -0.10 0.0540 0.95 3.1
## answer                0.13  0.16  0.17 -0.02 0.0709 0.93 2.9
## question              0.23  0.15  0.15  0.14 0.1237 0.88 3.4
## portal                0.28  0.09  0.00 -0.09 0.0913 0.91 1.4
## file                  0.10 -0.15  0.15  0.05 0.0563 0.94 3.1
## claim                -0.03 -0.11 -0.88 -0.07 0.7934 0.21 1.0
## article               0.54  0.08  0.02  0.00 0.2980 0.70 1.0
## time                 -0.13  0.13  0.31 -0.21 0.1754 0.82 2.5
## tomorrow              0.03 -0.13  0.20  0.33 0.1659 0.83 2.0
## discuss              -0.04 -0.04  0.15  0.36 0.1570 0.84 1.4
## future                0.12  0.25  0.10 -0.27 0.1573 0.84 2.7
## finish                0.30  0.03  0.09 -0.14 0.1138 0.89 1.7
## call                 -0.04 -0.02  0.15 -0.10 0.0343 0.97 1.9
## president            -0.02  0.23  0.12  0.19 0.1051 0.89 2.6
## america               0.21 -0.12  0.13 -0.09 0.0775 0.92 2.7
## talk                  0.02 -0.04  0.19  0.13 0.0535 0.95 1.9
## mean                  0.18  0.12  0.14 -0.22 0.1093 0.89 3.4
## daily                 0.11 -0.28 -0.29 -0.03 0.1764 0.82 2.3
## issue                -0.11  0.52  0.17  0.22 0.3532 0.65 1.7
## executive            -0.09  0.15  0.04  0.37 0.1632 0.84 1.5
## order                -0.15 -0.03  0.16  0.22 0.0936 0.91 2.7
## allow                -0.09  0.40 -0.61  0.03 0.5194 0.48 1.8
## front.line            0.15  0.17 -0.06  0.07 0.0655 0.93 2.5
## qualify               0.14 -0.09  0.07 -0.09 0.0373 0.96 3.2
## responsibility        0.07  0.05 -0.01 -0.09 0.0141 0.99 2.6
## contract              0.21  0.28 -0.03 -0.10 0.1329 0.87 2.2
## X2nd                  0.11 -0.11  0.19 -0.09 0.0625 0.94 2.8
## liability             0.78  0.07 -0.06  0.03 0.6234 0.38 1.0
## form                  0.03  0.08  0.12  0.25 0.0888 0.91 1.7
## guide                 0.08 -0.14  0.10 -0.37 0.1637 0.84 1.6
## reach                 0.22  0.18  0.08 -0.26 0.1500 0.85 3.0
## peak                  0.75  0.01  0.08  0.07 0.5802 0.42 1.0
## case                  0.06 -0.43  0.08 -0.24 0.2435 0.76 1.7
## protocol              0.07  0.49 -0.08  0.09 0.2665 0.73 1.2
## avoid                 0.18  0.11  0.14 -0.19 0.0995 0.90 3.5
## bear                  0.71  0.05 -0.04  0.11 0.5309 0.47 1.1
## mind                  0.27 -0.17  0.15  0.08 0.1259 0.87 2.6
## face                  0.04  0.24  0.16 -0.07 0.0882 0.91 2.0
## population           -0.05  0.15  0.16  0.00 0.0527 0.95 2.2
## fully                 0.21  0.28  0.02  0.04 0.1277 0.87 1.9
## represent             0.28  0.01  0.11  0.07 0.0991 0.90 1.4
## center                0.15 -0.03  0.03  0.17 0.0582 0.94 2.1
## negatively            0.24 -0.15  0.05  0.11 0.0948 0.91 2.2
## sure                  0.02  0.04  0.13 -0.22 0.0667 0.93 1.7
## count                 0.22 -0.12  0.13 -0.13 0.0874 0.91 3.0
## dr                   -0.11 -0.06  0.13  0.47 0.2473 0.75 1.3
## faucus               -0.05 -0.05  0.05  0.51 0.2687 0.73 1.1
## recognize             0.00 -0.09 -0.84 -0.06 0.7227 0.28 1.0
## stay                 -0.13 -0.15  0.17 -0.44 0.2711 0.73 1.7
## commit                0.07  0.48 -0.06 -0.08 0.2485 0.75 1.1
## win                  -0.08 -0.09  0.01  0.16 0.0373 0.96 2.1
## tune                 -0.02 -0.19 -0.11  0.01 0.0482 0.95 1.6
## virtual              -0.01 -0.13  0.06  0.10 0.0299 0.97 2.3
## hallway              -0.06  0.10  0.18  0.03 0.0483 0.95 1.8
## X7pm                  0.06  0.04  0.02  0.43 0.1975 0.80 1.1
## appreciate           -0.11 -0.07  0.09  0.61 0.3909 0.61 1.1
## relief                0.01  0.41  0.00  0.06 0.1684 0.83 1.0
## fund                 -0.06  0.14 -0.89  0.13 0.8222 0.18 1.1
## temporarily          -0.11  0.13 -0.10  0.21 0.0763 0.92 2.8
## suspend              -0.11  0.07 -0.07  0.19 0.0509 0.95 2.3
## customer              0.22  0.43 -0.02  0.18 0.2784 0.72 1.9
## pay                   0.08  0.21  0.13 -0.37 0.1992 0.80 2.0
## hardship              0.03  0.20  0.09 -0.20 0.0853 0.91 2.4
## incredibly           -0.01  0.03 -0.84  0.02 0.6983 0.30 1.0
## responsive            0.76 -0.04 -0.02 -0.01 0.5811 0.42 1.0
## partner              -0.10  0.33 -0.43  0.00 0.2884 0.71 2.0
## donate               -0.02 -0.05 -0.81 -0.03 0.6535 0.35 1.0
## neighbor             -0.18 -0.13  0.10 -0.19 0.1024 0.90 3.3
## X2.2                  0.26  0.35 -0.05 -0.10 0.2052 0.79 2.1
## extraordinary         0.70 -0.03  0.03  0.08 0.5069 0.49 1.0
## practice              0.07 -0.09  0.09 -0.24 0.0763 0.92 1.8
## social                0.12  0.07  0.20 -0.32 0.1524 0.85 2.1
## distance              0.08 -0.03  0.16 -0.34 0.1411 0.86 1.6
## flatten               0.02 -0.17  0.07 -0.16 0.0597 0.94 2.4
## curve                -0.07 -0.19  0.12 -0.30 0.1477 0.85 2.2
## evaluate              0.54  0.03  0.01  0.03 0.2997 0.70 1.0
## step                 -0.14  0.04  0.15 -0.10 0.0568 0.94 2.9
## measure               0.05  0.31  0.14 -0.12 0.1324 0.87 1.7
## protection            0.15  0.12  0.12 -0.15 0.0726 0.93 3.8
## prepare              -0.08  0.47  0.11 -0.14 0.2617 0.74 1.3
## mandate               0.09 -0.09  0.13  0.02 0.0322 0.97 2.7
## safety                0.08  0.55  0.12 -0.13 0.3406 0.66 1.3
## commercial            0.24  0.12  0.00  0.13 0.0973 0.90 2.0
## short.term            0.31  0.12  0.00  0.21 0.1661 0.83 2.0
## rental               -0.01  0.05 -0.94 -0.01 0.8901 0.11 1.0
## institution           0.25  0.27 -0.08  0.18 0.1809 0.82 2.9
## request              -0.07  0.25  0.00  0.17 0.0934 0.91 1.9
## federal               0.02  0.51  0.06  0.15 0.2854 0.71 1.2
## assistance           -0.05  0.19 -0.53  0.13 0.3263 0.67 1.4
## result                0.01 -0.13 -0.79 -0.21 0.6948 0.31 1.2
## approve               0.20  0.15  0.11  0.42 0.2652 0.73 1.9
## delegation            0.15  0.42  0.01 -0.04 0.2099 0.79 1.3
## X.fema                0.44  0.04  0.00 -0.14 0.2100 0.79 1.2
## X.potus               0.03 -0.16  0.06  0.49 0.2758 0.72 1.3
## great                -0.04 -0.07  0.22  0.34 0.1704 0.83 1.9
## suggestion            0.58 -0.04 -0.01  0.05 0.3439 0.66 1.0
## positive              0.03 -0.41  0.02 -0.09 0.1770 0.82 1.1
## self.quarantine       0.03  0.14  0.11  0.31 0.1290 0.87 1.7
## leave                 0.03 -0.11  0.00 -0.03 0.0138 0.99 1.3
## designate             0.28 -0.12 -0.03 -0.03 0.0877 0.91 1.4
## friend               -0.17 -0.08  0.13 -0.33 0.1710 0.83 1.9
## member                0.21 -0.11  0.16 -0.02 0.0762 0.92 2.5
## grocery              -0.11 -0.13  0.08 -0.32 0.1413 0.86 1.8
## mitigate              0.13  0.50 -0.01 -0.01 0.2768 0.72 1.1
## virus                -0.10  0.01  0.01  0.16 0.0329 0.97 1.8
## start                -0.10 -0.02 -0.42 -0.18 0.2240 0.78 1.5
## park                  0.51  0.03  0.02 -0.13 0.2738 0.73 1.1
## implement             0.02  0.26  0.03  0.25 0.1322 0.87 2.0
## reduce               -0.06  0.30  0.05 -0.30 0.1895 0.81 2.1
## risk                 -0.07  0.18 -0.52 -0.14 0.3186 0.68 1.4
## discourage            0.38  0.11  0.08 -0.12 0.1729 0.83 1.5
## visitor              -0.01 -0.13 -0.02  0.20 0.0583 0.94 1.7
## out.of.state          0.52 -0.06  0.05  0.01 0.2706 0.73 1.0
## pass                 -0.11 -0.04 -0.03  0.20 0.0522 0.95 1.8
## X.covid19            -0.09 -0.14  0.16  0.38 0.1981 0.80 1.8
## nationwide            0.27  0.08  0.06  0.08 0.0956 0.90 1.4
## twitter               0.02 -0.18  0.05  0.07 0.0386 0.96 1.5
## X5.00                 0.13 -0.01  0.01  0.54 0.3148 0.69 1.1
## reply                 0.19  0.05  0.10  0.03 0.0494 0.95 1.8
## tweet                 0.41  0.03 -0.01  0.12 0.1944 0.81 1.2
## lower                 0.59 -0.13  0.07  0.03 0.3666 0.63 1.1
## project               0.40 -0.10  0.14  0.18 0.2287 0.77 1.8
## suspect               0.48 -0.03  0.04 -0.15 0.2474 0.75 1.2
## child                -0.06  0.30 -0.55 -0.04 0.3875 0.61 1.6
## right                 0.01 -0.08  0.25  0.00 0.0690 0.93 1.2
## team                  0.10  0.21  0.09  0.27 0.1392 0.86 2.5
## procure               0.36 -0.12  0.00 -0.15 0.1504 0.85 1.6
## X.nationaldoctorsday  0.12  0.00  0.05  0.55 0.3274 0.67 1.1
## commend               0.70  0.03  0.01  0.16 0.5358 0.46 1.1
## physician             0.10  0.02  0.00  0.59 0.3713 0.63 1.1
## heal                  0.44 -0.11  0.03 -0.12 0.2054 0.79 1.3
## sacrifice             0.05  0.17  0.11 -0.25 0.1065 0.89 2.3
## doctor                0.03  0.18  0.10  0.12 0.0605 0.94 2.4
## save                 -0.03  0.20  0.09 -0.29 0.1345 0.87 2.1
## guideline             0.28  0.15  0.09  0.08 0.1226 0.88 2.0
## department           -0.07  0.05  0.09  0.22 0.0606 0.94 1.6
## tourism               0.17 -0.07  0.06  0.17 0.0706 0.93 2.6
## resource             -0.07  0.49  0.17  0.24 0.3321 0.67 1.8
## organization          0.01 -0.06 -0.92  0.03 0.8596 0.14 1.0
## individual            0.16  0.13  0.02  0.27 0.1291 0.87 2.2
## sign                  0.00  0.10  0.16  0.14 0.0556 0.94 2.7
## legislation           0.12  0.31 -0.08 -0.09 0.1239 0.88 1.7
## establish             0.06  0.07 -0.85  0.24 0.7912 0.21 1.2
## rainy                 0.90 -0.02 -0.01  0.03 0.8216 0.18 1.0
## passage               0.78  0.01 -0.01 -0.03 0.6050 0.40 1.0
## midnight              0.45  0.04  0.03  0.06 0.2122 0.79 1.1
## tonight              -0.08 -0.01  0.08  0.00 0.0128 0.99 2.0
## bill                  0.20  0.31  0.08 -0.18 0.1731 0.83 2.6
## radio                 0.29  0.07 -0.01 -0.08 0.0970 0.90 1.3
## address               0.14  0.12 -0.59  0.03 0.3880 0.61 1.2
## share                -0.03 -0.05 -0.15 -0.17 0.0540 0.95 2.2
## initiative            0.61  0.15 -0.04  0.07 0.4109 0.59 1.2
## assist                0.40  0.30 -0.03  0.17 0.3002 0.70 2.3
## rural                 0.04  0.23  0.12  0.00 0.0703 0.93 1.6
## treat                 0.04 -0.07  0.03 -0.24 0.0626 0.94 1.3
## patient               0.16 -0.02  0.06 -0.30 0.1121 0.89 1.7
## learn                 0.05  0.15  0.16 -0.14 0.0691 0.93 3.2
## mindful               0.16  0.07  0.01 -0.06 0.0343 0.97 1.7
## space                 0.22 -0.03  0.10 -0.03 0.0597 0.94 1.5
## safe                 -0.13  0.32  0.19 -0.27 0.2347 0.77 3.0
## foot                  0.38  0.16  0.09 -0.13 0.1942 0.81 1.8
## crowd                -0.07  0.12 -0.06  0.01 0.0214 0.98 2.1
## successful            0.13  0.01 -0.01  0.53 0.3064 0.69 1.1
## slow                  0.01  0.04  0.16 -0.18 0.0580 0.94 2.1
## trend                 0.04 -0.06  0.05 -0.15 0.0281 0.97 1.8
## directive             0.18  0.00  0.08 -0.12 0.0490 0.95 2.2
## communication         0.08 -0.09  0.06  0.59 0.3709 0.63 1.1
## senate                0.19  0.27  0.05  0.06 0.1199 0.88 2.0
## confidence            0.12 -0.11  0.06 -0.06 0.0324 0.97 3.0
## employment            0.08  0.47 -0.05  0.24 0.2901 0.71 1.6
## small                -0.14  0.50  0.12 -0.07 0.2823 0.72 1.3
## X4.4                  0.31  0.25 -0.05 -0.06 0.1721 0.83 2.1
## plan                 -0.02  0.01  0.25 -0.02 0.0647 0.94 1.0
## propose               0.39  0.14  0.00 -0.07 0.1787 0.82 1.3
## additional           -0.04 -0.18  0.01  0.18 0.0670 0.93 2.1
## payment               0.03 -0.06  0.12 -0.33 0.1249 0.88 1.3
## X250                  0.29  0.06 -0.03 -0.01 0.0918 0.91 1.1
## direct               -0.01 -0.06  0.04  0.49 0.2483 0.75 1.0
## X500                  0.48  0.12  0.00 -0.10 0.2506 0.75 1.2
## facility              0.02  0.46  0.10 -0.03 0.2226 0.78 1.1
## read                 -0.11 -0.17  0.04  0.26 0.1068 0.89 2.2
## X1.4                  0.36  0.00  0.02  0.08 0.1419 0.86 1.1
## directly              0.18 -0.07  0.06 -0.13 0.0510 0.95 2.5
## burden                0.20  0.42 -0.06  0.26 0.3026 0.70 2.3
## provider              0.09  0.16  0.13  0.20 0.0952 0.90 3.2
## proposal              0.14  0.36 -0.07 -0.20 0.1965 0.80 2.0
## improve               0.10  0.02  0.05  0.27 0.0903 0.91 1.4
## access               -0.03  0.54  0.07 -0.01 0.3030 0.70 1.0
## citizen              -0.09  0.04  0.18 -0.17 0.0714 0.93 2.7
## open                  0.01  0.53 -0.04 -0.01 0.2788 0.72 1.0
## workforce            -0.13  0.15  0.04 -0.24 0.1009 0.90 2.4
## X2.30                 0.00 -0.26 -0.18  0.23 0.1559 0.84 2.8
## screen                0.07  0.06  0.04  0.15 0.0356 0.96 2.0
## administer            0.16  0.36 -0.06  0.06 0.1680 0.83 1.5
## drive.through         0.02  0.30  0.01  0.21 0.1364 0.86 1.8
## urgent                0.19 -0.02  0.08 -0.27 0.1084 0.89 2.0
## nurse                -0.02  0.30  0.03  0.08 0.0989 0.90 1.2
## lab                   0.00 -0.15  0.06  0.10 0.0356 0.96 2.1
## professional         -0.11  0.01  0.06 -0.16 0.0430 0.96 2.1
## demand                0.17 -0.01  0.07 -0.16 0.0532 0.95 2.4
## hard                  0.01  0.45  0.16  0.04 0.2306 0.77 1.3
## behalf                0.25  0.03  0.04  0.25 0.1397 0.86 2.1
## employer              0.02 -0.22  0.10  0.08 0.0629 0.94 1.7
## visit                -0.05 -0.04  0.19  0.11 0.0551 0.94 1.9
## leverage              0.54  0.02 -0.01 -0.13 0.3000 0.70 1.1
## telehealth            0.20  0.28  0.04  0.01 0.1283 0.87 1.9
## minimize             -0.02  0.60 -0.07 -0.16 0.3949 0.61 1.2
## sick                  0.10 -0.11  0.16 -0.15 0.0654 0.93 3.6
## room                  0.16 -0.09  0.04 -0.31 0.1200 0.88 1.7
## blood                 0.21 -0.05  0.09  0.01 0.0515 0.95 1.5
## institute             0.33 -0.20  0.11  0.17 0.1906 0.81 2.5
## collection            0.17  0.42 -0.06 -0.13 0.2309 0.77 1.6
## north                -0.06 -0.01  0.04 -0.11 0.0179 0.98 1.9
## spring                0.68 -0.07  0.03 -0.14 0.4700 0.53 1.1
## consider              0.09  0.03  0.14  0.37 0.1733 0.83 1.4
## due                  -0.13  0.19  0.15 -0.09 0.0833 0.92 3.2
## change                0.03 -0.04  0.17  0.03 0.0338 0.97 1.2
## tax                  -0.05 -0.13  0.10 -0.05 0.0309 0.97 2.6
## deadline              0.05  0.27  0.08 -0.27 0.1570 0.84 2.2
## official             -0.15 -0.16 -0.19  0.19 0.1183 0.88 3.9
## revenue               0.21 -0.05  0.04  0.18 0.0873 0.91 2.2
## forecast              0.87  0.01 -0.02  0.01 0.7599 0.24 1.0
## special               0.14 -0.01  0.13  0.00 0.0366 0.96 2.0
## session               0.54 -0.11  0.00  0.01 0.2959 0.70 1.1
## general              -0.11 -0.15 -0.03  0.35 0.1556 0.84 1.6
## assembly             -0.09 -0.04 -0.08  0.19 0.0507 0.95 1.9
## surplus               0.51  0.00 -0.01 -0.22 0.2965 0.70 1.4
## owner                 0.07  0.04  0.11 -0.27 0.0906 0.91 1.6
## employee             -0.09  0.20  0.03 -0.04 0.0492 0.95 1.5
## personal             -0.02  0.28  0.01 -0.27 0.1540 0.85 2.0
## clean                 0.11 -0.03  0.13 -0.10 0.0377 0.96 3.0
## surface               0.30 -0.09  0.11 -0.17 0.1266 0.87 2.1
## frequently            0.44 -0.08  0.09 -0.07 0.2000 0.80 1.2
## touch                 0.24  0.04  0.06 -0.21 0.1023 0.90 2.2
## require              -0.03  0.25  0.08  0.16 0.0961 0.90 2.0
## close                 0.00  0.08  0.16 -0.25 0.0974 0.90 2.0
## post                  0.15 -0.11  0.07 -0.12 0.0484 0.95 3.3
## shortness             0.24  0.07  0.08 -0.07 0.0735 0.93 1.6
## total                 0.01 -0.35  0.02  0.03 0.1236 0.88 1.0
## X165                  0.87 -0.10 -0.01  0.02 0.7672 0.23 1.0
## large                 0.23  0.12  0.09 -0.35 0.1876 0.81 2.2
## X24                   0.22 -0.28  0.08 -0.25 0.1770 0.82 3.1
## hour                  0.02 -0.19  0.04  0.04 0.0374 0.96 1.2
## period               -0.07 -0.16 -0.83 -0.01 0.7298 0.27 1.1
## see                   0.09 -0.11  0.18 -0.20 0.0856 0.91 3.0
## reflect               0.86  0.03 -0.03 -0.02 0.7350 0.27 1.0
## follow               -0.03 -0.07  0.13 -0.16 0.0485 0.95 2.4
## cdc                   0.20  0.33 -0.01  0.18 0.1961 0.80 2.3
## X118                  0.81 -0.10 -0.03 -0.02 0.6638 0.34 1.0
## X1.000                0.23  0.06  0.06 -0.01 0.0594 0.94 1.3
## hospitalize           0.05 -0.26  0.06 -0.01 0.0711 0.93 1.2
## effective             0.10 -0.03  0.01  0.04 0.0123 0.99 1.5
## walking               0.77 -0.03 -0.02 -0.03 0.5841 0.42 1.0
## hike                  0.55  0.03 -0.01 -0.07 0.3014 0.70 1.0
## fish                  0.55  0.04  0.00 -0.05 0.3072 0.69 1.0
## outdoor               0.36 -0.06  0.01 -0.08 0.1328 0.87 1.2
## activity              0.18  0.32  0.01  0.21 0.1908 0.81 2.3
## consistent            0.69  0.05 -0.04 -0.02 0.4849 0.52 1.0
## top                   0.10  0.31  0.15 -0.13 0.1498 0.85 2.1
## priority              0.08  0.30  0.06 -0.18 0.1369 0.86 1.9
## inform                0.04  0.01  0.08  0.06 0.0122 0.99 2.4
## healthy              -0.03  0.14  0.18  0.01 0.0510 0.95 2.0
## accord                0.29 -0.06  0.06 -0.12 0.0948 0.91 1.5
## best                 -0.14 -0.06  0.15 -0.31 0.1461 0.85 2.0
## expose                0.02  0.07  0.08  0.53 0.2896 0.71 1.1
## thought               0.18  0.21 -0.05 -0.29 0.1570 0.84 2.7
## rise                  0.16 -0.04  0.11 -0.10 0.0472 0.95 2.8
## locate                0.27  0.30 -0.04  0.03 0.1710 0.83 2.0
## isolate               0.06 -0.13  0.07 -0.15 0.0442 0.96 2.8
## expand               -0.08  0.64  0.05  0.05 0.4144 0.59 1.1
## telemedicine          0.15  0.46 -0.01  0.01 0.2396 0.76 1.2
## X1.5                  0.11  0.03  0.14  0.12 0.0493 0.95 2.9
## long.term            -0.02  0.32  0.12  0.01 0.1194 0.88 1.3
## west                 -0.02 -0.11  0.05  0.06 0.0189 0.98 2.1
## activate              0.15  0.16  0.00  0.31 0.1494 0.85 2.0
## national              0.20  0.26  0.12 -0.02 0.1252 0.87 2.4
## guard                 0.17  0.22  0.10  0.05 0.0969 0.90 2.4
## combat               -0.18  0.24  0.01  0.50 0.3236 0.68 1.7
## dedication           -0.01  0.07  0.07  0.51 0.2674 0.73 1.1
## X.vp                 -0.08 -0.03  0.15  0.17 0.0591 0.94 2.5
## pandemic             -0.07 -0.05  0.23 -0.14 0.0798 0.92 2.0
## ease                  0.03  0.06  0.04 -0.03 0.0069 0.99 3.2
## X3.3                  0.20  0.08  0.14  0.09 0.0797 0.92 2.8
## unnecessary           0.18  0.15  0.09 -0.03 0.0674 0.93 2.5
## travel                0.10 -0.15  0.15 -0.17 0.0771 0.92 3.6
## mitigation            0.13  0.03  0.05  0.17 0.0541 0.95 2.1
## student              -0.02  0.11  0.08  0.11 0.0303 0.97 2.9
## educator              0.01 -0.04  0.08  0.27 0.0834 0.92 1.2
## return               -0.15 -0.13 -0.42 -0.13 0.2396 0.76 1.7
## school               -0.07  0.16  0.10  0.18 0.0711 0.93 3.0
## break.                0.23 -0.16 -0.02 -0.22 0.1171 0.88 2.8
## circumstance          0.45  0.00  0.01 -0.09 0.2069 0.79 1.1
## significant           0.00 -0.07  0.05  0.40 0.1689 0.83 1.1
## ongoing               0.03  0.20  0.05  0.22 0.0900 0.91 2.2
## confirm               0.00 -0.33  0.08 -0.31 0.2054 0.79 2.1
## isolation             0.21 -0.10 -0.05 -0.27 0.1188 0.88 2.2
## situation            -0.07 -0.14  0.09 -0.04 0.0355 0.96 2.4
## 
##                         TC1   TC3   TC2   TC4
## SS loadings           36.19 21.86 21.47 20.42
## Proportion Var         0.07  0.04  0.04  0.04
## Cumulative Var         0.07  0.12  0.16  0.20
## Proportion Explained   0.36  0.22  0.21  0.20
## Cumulative Proportion  0.36  0.58  0.80  1.00
## 
##  With component correlations of 
##       TC1   TC3   TC2   TC4
## TC1  1.00  0.05 -0.02  0.07
## TC3  0.05  1.00  0.02 -0.01
## TC2 -0.02  0.02  1.00  0.01
## TC4  0.07 -0.01  0.01  1.00
## 
## Mean item complexity =  1.9
## Test of the hypothesis that 4 components are sufficient.
## 
## The root mean square of the residuals (RMSR) is  0.13 
##  with the empirical chi square  198071.5  with prob <  0 
## 
## Fit based upon off diagonal values = 0.38
pca_solution2 <- principal(gov_tweets[,7:507], nfactors = 2, rotate = 'oblimin')
pca_solution2
## Principal Components Analysis
## Call: principal(r = gov_tweets[, 7:507], nfactors = 2, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
##                        TC1   TC2      h2   u2 com
## extend                0.02  0.06 0.00378 1.00 1.3
## covid                 0.14 -0.05 0.02152 0.98 1.3
## public               -0.02  0.14 0.02080 0.98 1.0
## health               -0.07  0.21 0.05106 0.95 1.2
## disaster              0.08  0.04 0.00755 0.99 1.5
## emergency             0.00 -0.24 0.05983 0.94 1.0
## industry              0.25  0.24 0.11609 0.88 2.0
## sector                0.11  0.11 0.02481 0.98 2.0
## affect                0.18  0.20 0.06917 0.93 2.0
## crisis                0.20 -0.17 0.06856 0.93 1.9
## important            -0.01  0.27 0.07211 0.93 1.0
## continue             -0.22  0.26 0.11852 0.88 2.0
## support               0.12 -0.07 0.01900 0.98 1.6
## protect              -0.18  0.40 0.19802 0.80 1.4
## people               -0.04  0.24 0.05908 0.94 1.0
## threat                0.18  0.17 0.05889 0.94 2.0
## longer                0.41  0.07 0.17342 0.83 1.1
## imminent              0.33  0.06 0.11085 0.89 1.1
## urllink              -0.01  0.00 0.00017 1.00 1.2
## live                  0.14 -0.16 0.04672 0.95 1.9
## governor              0.49 -0.03 0.24428 0.76 1.0
## provide               0.69  0.11 0.48413 0.52 1.1
## update                0.29 -0.28 0.16526 0.83 2.0
## media                 0.83 -0.26 0.76239 0.24 1.2
## hold                  0.40 -0.18 0.19624 0.80 1.4
## news                  0.47 -0.24 0.27944 0.72 1.5
## conference            0.39 -0.17 0.18637 0.81 1.4
## X1.30                 0.54 -0.11 0.30462 0.70 1.1
## pm                    0.48 -0.37 0.37117 0.63 1.9
## today                 0.32 -0.20 0.14427 0.86 1.6
## response              0.34 -0.01 0.11455 0.89 1.0
## watch                 0.18 -0.16 0.05681 0.94 2.0
## faith                 0.18  0.15 0.05605 0.94 2.0
## community            -0.27  0.22 0.12454 0.88 1.9
## effort               -0.06  0.07 0.00779 0.99 2.0
## fight                -0.08 -0.03 0.00772 0.99 1.3
## in.person             0.13  0.11 0.02916 0.97 2.0
## fellowship            0.69  0.02 0.47339 0.53 1.0
## church                0.18  0.16 0.05915 0.94 2.0
## meet                 -0.07  0.39 0.15493 0.85 1.1
## remotely              0.30  0.04 0.09461 0.91 1.0
## present               0.26  0.19 0.10308 0.90 1.9
## guidance              0.02  0.31 0.09436 0.91 1.0
## give                  0.01 -0.05 0.00276 1.00 1.0
## house                 0.20  0.43 0.22675 0.77 1.4
## worship               0.18  0.24 0.09075 0.91 1.8
## option                0.04  0.35 0.12461 0.88 1.0
## congregation          0.37  0.11 0.14980 0.85 1.2
## thank                -0.15  0.11 0.03547 0.96 1.9
## X.walmart             0.26  0.00 0.06543 0.93 1.0
## quest                 0.54  0.08 0.29903 0.70 1.0
## diagnostic            0.28  0.12 0.09070 0.91 1.4
## opening               0.17  0.09 0.03867 0.96 1.5
## drive.thru            0.14  0.07 0.02516 0.97 1.4
## test                  0.06  0.00 0.00313 1.00 1.0
## site                  0.02  0.14 0.02064 0.98 1.0
## central               0.69  0.08 0.47694 0.52 1.0
## symptomatic           0.63 -0.07 0.40057 0.60 1.0
## care                 -0.06  0.17 0.03081 0.97 1.2
## worker               -0.07  0.46 0.21545 0.78 1.1
## responder            -0.14  0.19 0.05600 0.94 1.8
## increase              0.11 -0.16 0.03890 0.96 1.8
## capacity              0.07  0.44 0.20115 0.80 1.1
## enhance               0.05  0.27 0.07270 0.93 1.1
## gathering             0.24  0.38 0.20097 0.80 1.7
## data                  0.07  0.01 0.00532 0.99 1.1
## look                  0.14 -0.31 0.11902 0.88 1.4
## lift                  0.30  0.22 0.13701 0.86 1.9
## restriction           0.11  0.19 0.04655 0.95 1.6
## week                  0.37  0.12 0.15214 0.85 1.2
## encourage             0.11  0.11 0.02357 0.98 2.0
## weekend               0.00  0.16 0.02637 0.97 1.0
## thanks                0.02  0.26 0.06850 0.93 1.0
## partnership           0.05  0.34 0.11916 0.88 1.0
## hospital             -0.06 -0.01 0.00317 1.00 1.0
## exceed                0.29  0.13 0.09716 0.90 1.4
## goal                  0.04  0.22 0.04951 0.95 1.1
## conduct               0.13 -0.08 0.02378 0.98 1.7
## gt                   -0.04 -0.03 0.00215 1.00 1.8
## X1.500                0.47  0.01 0.21710 0.78 1.0
## day                  -0.02 -0.59 0.35066 0.65 1.0
## accurate              0.13  0.13 0.03252 0.97 2.0
## sample                0.31  0.07 0.09930 0.90 1.1
## number                0.15 -0.01 0.02346 0.98 1.0
## noon                  0.05 -0.02 0.00338 1.00 1.4
## surge                -0.02  0.30 0.08879 0.91 1.0
## campaign              0.27  0.07 0.07642 0.92 1.1
## symptom               0.15  0.14 0.04216 0.96 2.0
## wait                  0.15 -0.70 0.51467 0.49 1.1
## veteran               0.19  0.09 0.04548 0.95 1.4
## louis                 0.39 -0.02 0.15562 0.84 1.0
## year                  0.29  0.28 0.16127 0.84 2.0
## fought                0.57 -0.03 0.32618 0.67 1.0
## daughter              0.53  0.05 0.28271 0.72 1.0
## fellow                0.03  0.26 0.07070 0.93 1.0
## state                -0.26  0.05 0.07157 0.93 1.1
## throw                 0.30  0.08 0.09552 0.90 1.1
## party                 0.35  0.07 0.12583 0.87 1.1
## family               -0.19  0.37 0.17498 0.83 1.5
## attend                0.22  0.08 0.05496 0.95 1.3
## happy                 0.16  0.11 0.03892 0.96 1.8
## birthday              0.20  0.08 0.04811 0.95 1.3
## serve                 0.11  0.47 0.23402 0.77 1.1
## fever                 0.45  0.11 0.21000 0.79 1.1
## cough                 0.25  0.14 0.08115 0.92 1.6
## short                 0.38 -0.02 0.14577 0.85 1.0
## breath                0.45  0.12 0.21224 0.79 1.1
## outbreak              0.12  0.05 0.01761 0.98 1.3
## participate           0.36 -0.07 0.13416 0.87 1.1
## X.2020census          0.45 -0.06 0.20796 0.79 1.0
## respond               0.04  0.49 0.24489 0.76 1.0
## census                0.07  0.15 0.02559 0.97 1.4
## submit                0.17  0.17 0.05740 0.94 2.0
## phone                 0.29 -0.11 0.09850 0.90 1.3
## mail                  0.33  0.11 0.12148 0.88 1.2
## online                0.01  0.13 0.01767 0.98 1.0
## announce              0.05 -0.46 0.21725 0.78 1.0
## creation              0.46  0.07 0.21742 0.78 1.0
## work                 -0.15  0.48 0.25179 0.75 1.2
## group                 0.05  0.13 0.01916 0.98 1.4
## ensure               -0.06  0.39 0.15882 0.84 1.0
## adequate              0.47  0.13 0.23340 0.77 1.1
## process               0.03 -0.63 0.39847 0.60 1.0
## place                 0.08  0.11 0.01809 0.98 1.9
## pursue                0.31  0.13 0.10965 0.89 1.3
## economic              0.07  0.25 0.06664 0.93 1.1
## recovery              0.19  0.17 0.06510 0.93 2.0
## strategy              0.45  0.34 0.31299 0.69 1.9
## join                 -0.02  0.16 0.02466 0.98 1.0
## meeting               0.18 -0.05 0.03391 0.97 1.1
## afternoon             0.16 -0.12 0.04025 0.96 1.8
## organize              0.53 -0.05 0.28268 0.72 1.0
## night                 0.09 -0.07 0.01297 0.99 1.8
## town                  0.18  0.32 0.13687 0.86 1.6
## tornado               0.49  0.07 0.24429 0.76 1.0
## word                  0.04  0.04 0.00378 1.00 2.0
## spread               -0.25  0.16 0.08683 0.91 1.7
## donation              0.08 -0.58 0.34969 0.65 1.0
## arrive                0.32  0.07 0.10662 0.89 1.1
## operation             0.27 -0.07 0.07653 0.92 1.2
## full                  0.08  0.04 0.00816 0.99 1.5
## restaurant           -0.02  0.14 0.01981 0.98 1.0
## X2.500                0.23  0.10 0.06140 0.94 1.4
## free                  0.06  0.24 0.06018 0.94 1.1
## spirit                0.29  0.06 0.08990 0.91 1.1
## X2.3                  0.42  0.05 0.17600 0.82 1.0
## task                  0.26  0.22 0.11646 0.88 2.0
## force                 0.20  0.37 0.17760 0.82 1.5
## X27                   0.19 -0.16 0.06213 0.94 1.9
## leader                0.03  0.42 0.17479 0.83 1.0
## private               0.01  0.27 0.07443 0.93 1.0
## agency                0.02  0.02 0.00103 1.00 2.0
## examine               0.80 -0.06 0.64737 0.35 1.0
## impact               -0.15 -0.31 0.11854 0.88 1.4
## business              0.05  0.43 0.18794 0.81 1.0
## select                0.23  0.11 0.06271 0.94 1.4
## chairman              0.56  0.03 0.30950 0.69 1.0
## X1.3                  0.38 -0.02 0.14519 0.85 1.0
## create                0.04 -0.61 0.37509 0.62 1.0
## develop               0.12  0.07 0.01887 0.98 1.6
## recommendation        0.33  0.06 0.11213 0.89 1.1
## effect                0.03  0.21 0.04297 0.96 1.0
## offer                 0.06  0.12 0.01940 0.98 1.5
## condolence            0.22  0.05 0.05228 0.95 1.1
## chief                 0.11 -0.12 0.02559 0.97 2.0
## officer               0.11 -0.05 0.01403 0.99 1.4
## native                0.76 -0.01 0.58021 0.42 1.0
## lost                  0.04 -0.03 0.00236 1.00 1.8
## life                  0.07  0.19 0.04165 0.96 1.3
## grateful              0.18 -0.15 0.05485 0.95 1.9
## service               0.00  0.20 0.03940 0.96 1.0
## country               0.06  0.31 0.10091 0.90 1.1
## X1st                  0.46  0.15 0.22752 0.77 1.2
## report                0.04 -0.11 0.01286 0.99 1.3
## medical               0.02 -0.34 0.11329 0.89 1.0
## advisory              0.49  0.07 0.24795 0.75 1.0
## committee             0.90  0.00 0.80511 0.19 1.0
## prioritize            0.15  0.25 0.08409 0.92 1.7
## restore               0.24  0.28 0.13516 0.86 2.0
## economy              -0.05  0.07 0.00819 0.99 1.8
## timely                0.09  0.21 0.05192 0.95 1.4
## fashion               0.74  0.03 0.54526 0.45 1.0
## vulnerable           -0.12  0.32 0.11875 0.88 1.3
## maintain              0.06  0.06 0.00645 0.99 2.0
## prevent              -0.08  0.01 0.00647 0.99 1.1
## resurgence            0.78  0.10 0.62075 0.38 1.0
## X1.2                  0.01 -0.04 0.00182 1.00 1.2
## careful               0.27  0.04 0.07694 0.92 1.1
## review                0.08 -0.63 0.40963 0.59 1.0
## X.realdonaldtrump    -0.11  0.07 0.01694 0.98 1.6
## model                 0.17  0.29 0.11324 0.89 1.6
## reopening             0.00  0.06 0.00361 1.00 1.0
## base                  0.16  0.32 0.12563 0.87 1.4
## current               0.34 -0.04 0.11833 0.88 1.0
## hope                  0.06  0.33 0.11210 0.89 1.1
## begin                -0.02  0.16 0.02650 0.97 1.0
## launch                0.09 -0.21 0.05287 0.95 1.3
## website               0.05  0.00 0.00234 1.00 1.0
## regularly             0.07  0.10 0.01558 0.98 1.8
## information          -0.12 -0.01 0.01414 0.99 1.0
## regard                0.08 -0.10 0.01570 0.98 1.9
## relate               -0.02 -0.44 0.19698 0.80 1.0
## unemployment         -0.01  0.21 0.04562 0.95 1.0
## benefit              -0.06  0.18 0.03513 0.96 1.2
## shop                  0.07 -0.04 0.00677 0.99 1.5
## answer                0.14  0.23 0.07051 0.93 1.6
## question              0.26  0.18 0.09894 0.90 1.8
## portal                0.27  0.08 0.07890 0.92 1.2
## file                  0.09 -0.01 0.00788 0.99 1.0
## claim                -0.01 -0.68 0.46214 0.54 1.0
## article               0.54  0.07 0.29691 0.70 1.0
## time                 -0.16  0.34 0.14349 0.86 1.4
## tomorrow              0.05 -0.01 0.00287 1.00 1.1
## discuss               0.01  0.02 0.00038 1.00 1.5
## future                0.10  0.29 0.09377 0.91 1.3
## finish                0.28  0.11 0.08717 0.91 1.3
## call                 -0.06  0.11 0.01647 0.98 1.6
## president             0.03  0.21 0.04703 0.95 1.0
## america               0.18  0.02 0.03189 0.97 1.0
## talk                  0.02  0.08 0.00665 0.99 1.2
## mean                  0.15  0.22 0.07135 0.93 1.8
## daily                 0.08 -0.40 0.16489 0.84 1.1
## issue                -0.02  0.45 0.20071 0.80 1.0
## executive            -0.02  0.08 0.00632 0.99 1.1
## order                -0.12  0.05 0.01804 0.98 1.3
## allow                -0.01 -0.15 0.02232 0.98 1.0
## front.line            0.19  0.07 0.03913 0.96 1.3
## qualify               0.11  0.00 0.01208 0.99 1.0
## responsibility        0.06  0.04 0.00547 0.99 1.8
## contract              0.23  0.19 0.08746 0.91 1.9
## X2nd                  0.07  0.07 0.01063 0.99 2.0
## liability             0.79  0.00 0.62086 0.38 1.0
## form                  0.07  0.10 0.01500 0.98 1.8
## guide                 0.00  0.03 0.00082 1.00 1.0
## reach                 0.20  0.22 0.08930 0.91 2.0
## peak                  0.75  0.05 0.56848 0.43 1.0
## case                 -0.03 -0.21 0.04361 0.96 1.0
## protocol              0.15  0.28 0.09924 0.90 1.5
## avoid                 0.16  0.21 0.06935 0.93 1.9
## bear                  0.73 -0.01 0.52814 0.47 1.0
## mind                  0.25 -0.03 0.06338 0.94 1.0
## face                  0.05  0.29 0.08506 0.91 1.1
## population           -0.04  0.22 0.05107 0.95 1.1
## fully                 0.24  0.21 0.09973 0.90 1.9
## represent             0.29  0.07 0.08698 0.91 1.1
## center                0.17 -0.03 0.03055 0.97 1.1
## negatively            0.24 -0.09 0.06615 0.93 1.3
## sure                 -0.01  0.16 0.02520 0.97 1.0
## count                 0.18  0.02 0.03146 0.97 1.0
## dr                   -0.05 -0.03 0.00366 1.00 1.6
## faucus                0.02 -0.08 0.00700 0.99 1.1
## recognize             0.02 -0.64 0.41290 0.59 1.0
## stay                 -0.22  0.09 0.05818 0.94 1.3
## commit                0.11  0.31 0.11036 0.89 1.2
## win                  -0.06 -0.08 0.01067 0.99 1.9
## tune                 -0.03 -0.21 0.04508 0.95 1.0
## virtual              -0.02 -0.07 0.00506 0.99 1.1
## hallway              -0.05  0.19 0.04027 0.96 1.1
## X7pm                  0.13 -0.03 0.01670 0.98 1.1
## appreciate           -0.03 -0.09 0.00859 0.99 1.2
## relief                0.07  0.28 0.08285 0.92 1.1
## fund                  0.02 -0.54 0.29727 0.70 1.0
## temporarily          -0.06 -0.01 0.00391 1.00 1.0
## suspend              -0.06 -0.03 0.00503 0.99 1.4
## customer              0.30  0.25 0.15233 0.85 2.0
## pay                   0.04  0.30 0.09211 0.91 1.0
## hardship              0.01  0.23 0.05354 0.95 1.0
## incredibly            0.03 -0.57 0.32314 0.68 1.0
## responsive            0.75 -0.04 0.56873 0.43 1.0
## partner              -0.04 -0.06 0.00613 0.99 1.8
## donate                0.01 -0.59 0.34831 0.65 1.0
## neighbor             -0.23  0.01 0.05240 0.95 1.0
## X2.2                  0.29  0.22 0.13165 0.87 1.9
## extraordinary         0.70 -0.02 0.49687 0.50 1.0
## practice              0.02  0.04 0.00165 1.00 1.5
## social                0.07  0.24 0.06084 0.94 1.2
## distance              0.01  0.15 0.02141 0.98 1.0
## flatten              -0.02 -0.04 0.00239 1.00 1.6
## curve                -0.14  0.00 0.02037 0.98 1.0
## evaluate              0.55  0.02 0.29863 0.70 1.0
## step                 -0.16  0.15 0.04822 0.95 2.0
## measure               0.06  0.33 0.11461 0.89 1.1
## protection            0.14  0.19 0.05605 0.94 1.8
## prepare              -0.05  0.43 0.19056 0.81 1.0
## mandate               0.08  0.02 0.00697 0.99 1.2
## safety                0.12  0.49 0.25319 0.75 1.1
## commercial            0.28  0.06 0.07882 0.92 1.1
## short.term            0.36  0.04 0.12808 0.87 1.0
## rental                0.04 -0.62 0.38973 0.61 1.0
## institution           0.31  0.10 0.10438 0.90 1.2
## request              -0.02  0.15 0.02370 0.98 1.0
## federal               0.10  0.38 0.15064 0.85 1.1
## assistance            0.02 -0.26 0.06818 0.93 1.0
## result                0.00 -0.61 0.36814 0.63 1.0
## approve               0.28  0.11 0.08841 0.91 1.3
## delegation            0.19  0.32 0.13605 0.86 1.7
## X.fema                0.42  0.05 0.18146 0.82 1.0
## X.potus               0.08 -0.15 0.03011 0.97 1.5
## great                -0.01  0.05 0.00246 1.00 1.1
## suggestion            0.58 -0.05 0.33909 0.66 1.0
## positive             -0.04 -0.27 0.07203 0.93 1.0
## self.quarantine       0.09  0.12 0.02174 0.98 1.8
## leave                 0.02 -0.07 0.00555 0.99 1.1
## designate             0.26 -0.10 0.07631 0.92 1.3
## friend               -0.23  0.09 0.06233 0.94 1.3
## member                0.18  0.03 0.03385 0.97 1.1
## grocery              -0.18  0.02 0.03316 0.97 1.0
## mitigate              0.19  0.35 0.15472 0.85 1.5
## virus                -0.08 -0.01 0.00629 0.99 1.0
## start                -0.11 -0.28 0.08828 0.91 1.3
## park                  0.49  0.05 0.24381 0.76 1.0
## implement             0.08  0.16 0.03327 0.97 1.5
## reduce               -0.08  0.30 0.09429 0.91 1.1
## risk                 -0.05 -0.21 0.04648 0.95 1.1
## discourage            0.37  0.15 0.15691 0.84 1.3
## visitor               0.01 -0.14 0.01991 0.98 1.0
## out.of.state          0.51 -0.01 0.25673 0.74 1.0
## pass                 -0.09 -0.08 0.01467 0.99 2.0
## X.covid19            -0.05 -0.05 0.00517 0.99 2.0
## nationwide            0.29  0.09 0.09096 0.91 1.2
## twitter               0.01 -0.10 0.01059 0.99 1.0
## X5.00                 0.21 -0.09 0.05279 0.95 1.3
## reply                 0.19  0.10 0.04535 0.95 1.5
## tweet                 0.43  0.00 0.18817 0.81 1.0
## lower                 0.58 -0.05 0.33464 0.67 1.0
## project               0.41  0.00 0.16763 0.83 1.0
## suspect               0.45  0.03 0.20535 0.79 1.0
## child                 0.00 -0.16 0.02575 0.97 1.0
## right                -0.01  0.11 0.01314 0.99 1.0
## team                  0.16  0.17 0.05288 0.95 2.0
## procure               0.32 -0.06 0.10387 0.90 1.1
## X.nationaldoctorsday  0.20 -0.06 0.04287 0.96 1.2
## commend               0.72 -0.01 0.52465 0.48 1.0
## physician             0.19 -0.09 0.04334 0.96 1.4
## heal                  0.40 -0.04 0.16370 0.84 1.0
## sacrifice             0.03  0.24 0.05899 0.94 1.0
## doctor                0.07  0.18 0.03708 0.96 1.3
## save                 -0.06  0.26 0.06966 0.93 1.1
## guideline             0.30  0.15 0.11524 0.88 1.5
## department           -0.03  0.06 0.00436 1.00 1.5
## tourism               0.18 -0.04 0.03547 0.96 1.1
## resource              0.02  0.43 0.18114 0.82 1.0
## organization          0.05 -0.69 0.48148 0.52 1.0
## individual            0.22  0.06 0.05214 0.95 1.2
## sign                  0.02  0.16 0.02565 0.97 1.0
## legislation           0.15  0.17 0.05048 0.95 1.9
## establish             0.14 -0.59 0.36771 0.63 1.1
## rainy                 0.90 -0.03 0.81360 0.19 1.0
## passage               0.77  0.00 0.59329 0.41 1.0
## midnight              0.46  0.04 0.21053 0.79 1.0
## tonight              -0.08  0.05 0.00973 0.99 1.7
## bill                  0.20  0.30 0.13000 0.87 1.7
## radio                 0.29  0.05 0.08517 0.91 1.1
## address               0.18 -0.34 0.14771 0.85 1.5
## share                -0.05 -0.11 0.01456 0.99 1.4
## initiative            0.63  0.07 0.40310 0.60 1.0
## assist                0.46  0.16 0.23671 0.76 1.2
## rural                 0.06  0.25 0.06382 0.94 1.1
## treat                 0.00  0.01 0.00016 1.00 1.0
## patient               0.11  0.07 0.01740 0.98 1.7
## learn                 0.04  0.24 0.05766 0.94 1.1
## mindful               0.16  0.06 0.02886 0.97 1.3
## space                 0.21  0.05 0.04645 0.95 1.1
## safe                 -0.14  0.41 0.18714 0.81 1.2
## foot                  0.37  0.20 0.17664 0.82 1.5
## crowd                -0.05  0.04 0.00431 1.00 2.0
## successful            0.22 -0.09 0.05480 0.95 1.3
## slow                 -0.02  0.17 0.02979 0.97 1.0
## trend                 0.01  0.02 0.00026 1.00 1.3
## directive             0.15  0.07 0.02911 0.97 1.4
## communication         0.15 -0.12 0.03791 0.96 1.9
## senate                0.23  0.21 0.09518 0.90 2.0
## confidence            0.10 -0.02 0.01021 0.99 1.1
## employment            0.17  0.25 0.09259 0.91 1.7
## small                -0.10  0.45 0.20902 0.79 1.1
## X4.4                  0.33  0.15 0.13176 0.87 1.4
## plan                 -0.03  0.18 0.03513 0.96 1.1
## propose               0.39  0.11 0.16521 0.83 1.2
## additional           -0.04 -0.15 0.02287 0.98 1.1
## payment              -0.03  0.10 0.01012 0.99 1.2
## X250                  0.30  0.03 0.08921 0.91 1.0
## direct                0.06 -0.10 0.01343 0.99 1.6
## X500                  0.47  0.10 0.23219 0.77 1.1
## facility              0.06  0.40 0.16034 0.84 1.0
## read                 -0.09 -0.13 0.02565 0.97 1.8
## X1.4                  0.37  0.00 0.13762 0.86 1.0
## directly              0.14  0.01 0.02074 0.98 1.0
## burden                0.29  0.20 0.12772 0.87 1.8
## provider              0.14  0.17 0.04790 0.95 1.9
## proposal              0.16  0.24 0.08232 0.92 1.7
## improve               0.14  0.01 0.01955 0.98 1.0
## access                0.03  0.44 0.19088 0.81 1.0
## citizen              -0.12  0.18 0.04826 0.95 1.8
## open                  0.07  0.34 0.12144 0.88 1.1
## workforce            -0.15  0.18 0.05452 0.95 1.9
## X2.30                 0.01 -0.35 0.12269 0.88 1.0
## screen                0.10  0.05 0.01186 0.99 1.5
## administer            0.22  0.20 0.08720 0.91 2.0
## drive.through         0.08  0.18 0.04058 0.96 1.4
## urgent                0.14  0.09 0.02723 0.97 1.7
## nurse                 0.03  0.23 0.05169 0.95 1.0
## lab                   0.00 -0.08 0.00672 0.99 1.0
## professional         -0.13  0.07 0.02341 0.98 1.5
## demand                0.14  0.07 0.02374 0.98 1.5
## hard                  0.06  0.42 0.18070 0.82 1.0
## behalf                0.29  0.01 0.08325 0.92 1.0
## employer              0.00 -0.10 0.00977 0.99 1.0
## visit                -0.05  0.09 0.01078 0.99 1.5
## leverage              0.52  0.02 0.27061 0.73 1.0
## telehealth            0.23  0.23 0.10438 0.90 2.0
## minimize              0.03  0.40 0.16288 0.84 1.0
## sick                  0.06  0.06 0.00643 0.99 2.0
## room                  0.10  0.02 0.00991 0.99 1.1
## blood                 0.20  0.03 0.03887 0.96 1.0
## institute             0.32 -0.10 0.11398 0.89 1.2
## collection            0.20  0.27 0.11493 0.89 1.8
## north                -0.08  0.04 0.00798 0.99 1.4
## spring                0.64 -0.01 0.41554 0.58 1.0
## consider              0.14  0.05 0.02296 0.98 1.3
## due                  -0.13  0.25 0.08063 0.92 1.5
## change                0.02  0.09 0.00812 0.99 1.1
## tax                  -0.07 -0.01 0.00559 0.99 1.0
## deadline              0.03  0.29 0.08691 0.91 1.0
## official             -0.13 -0.27 0.09310 0.91 1.5
## revenue               0.23 -0.04 0.05544 0.94 1.1
## forecast              0.87 -0.01 0.75413 0.25 1.0
## special               0.13  0.09 0.02520 0.97 1.7
## session               0.52 -0.08 0.28050 0.72 1.0
## general              -0.07 -0.18 0.03788 0.96 1.3
## assembly             -0.06 -0.12 0.01721 0.98 1.5
## surplus               0.47  0.02 0.22582 0.77 1.0
## owner                 0.03  0.16 0.02491 0.98 1.1
## employee             -0.07  0.17 0.03425 0.97 1.4
## personal             -0.03  0.25 0.06367 0.94 1.0
## clean                 0.08  0.09 0.01456 0.99 2.0
## surface               0.25  0.04 0.06646 0.93 1.1
## frequently            0.41  0.02 0.16663 0.83 1.0
## touch                 0.21  0.11 0.05434 0.95 1.5
## require               0.02  0.21 0.04282 0.96 1.0
## close                -0.04  0.22 0.04793 0.95 1.1
## post                  0.11  0.00 0.01252 0.99 1.0
## shortness             0.23  0.11 0.06763 0.93 1.5
## total                -0.03 -0.24 0.05792 0.94 1.0
## X165                  0.86 -0.09 0.74866 0.25 1.0
## large                 0.19  0.21 0.07828 0.92 2.0
## X24                   0.14 -0.10 0.03068 0.97 1.8
## hour                  0.01 -0.11 0.01266 0.99 1.0
## period               -0.05 -0.70 0.48602 0.51 1.0
## see                   0.03  0.08 0.00730 0.99 1.4
## reflect               0.85 -0.01 0.72650 0.27 1.0
## follow               -0.07  0.06 0.00881 0.99 2.0
## cdc                   0.27  0.20 0.11157 0.89 1.8
## X118                  0.79 -0.09 0.64047 0.36 1.0
## X1.000                0.23  0.08 0.05885 0.94 1.2
## hospitalize           0.02 -0.14 0.02066 0.98 1.0
## effective             0.10 -0.02 0.01035 0.99 1.0
## walking               0.75 -0.03 0.56923 0.43 1.0
## hike                  0.54  0.02 0.28900 0.71 1.0
## fish                  0.55  0.04 0.29889 0.70 1.0
## outdoor               0.33 -0.03 0.11316 0.89 1.0
## activity              0.25  0.20 0.10081 0.90 1.9
## consistent            0.69  0.00 0.47838 0.52 1.0
## top                   0.11  0.35 0.13350 0.87 1.2
## priority              0.08  0.29 0.08865 0.91 1.2
## inform                0.04  0.05 0.00480 1.00 1.9
## healthy              -0.02  0.22 0.04773 0.95 1.0
## accord                0.26  0.02 0.06572 0.93 1.0
## best                 -0.20  0.12 0.05290 0.95 1.7
## expose                0.10  0.01 0.01105 0.99 1.0
## thought               0.16  0.16 0.05201 0.95 2.0
## rise                  0.13  0.07 0.02220 0.98 1.5
## locate                0.31  0.17 0.12384 0.88 1.6
## isolate               0.02 -0.02 0.00073 1.00 1.9
## expand                0.00  0.48 0.22952 0.77 1.0
## telemedicine          0.20  0.32 0.13978 0.86 1.7
## X1.5                  0.12  0.10 0.02487 0.98 1.9
## long.term             0.02  0.31 0.09583 0.90 1.0
## west                 -0.03 -0.05 0.00363 1.00 1.5
## activate              0.21  0.06 0.04769 0.95 1.2
## national              0.22  0.27 0.11894 0.88 1.9
## guard                 0.20  0.22 0.08728 0.91 2.0
## combat               -0.07  0.10 0.01509 0.98 1.8
## dedication            0.08  0.01 0.00579 0.99 1.0
## X.vp                 -0.06  0.06 0.00745 0.99 2.0
## pandemic             -0.11  0.15 0.03490 0.97 1.8
## ease                  0.03  0.07 0.00654 0.99 1.4
## X3.3                  0.21  0.14 0.06591 0.93 1.8
## unnecessary           0.19  0.17 0.06658 0.93 2.0
## travel                0.05  0.02 0.00285 1.00 1.4
## mitigation            0.16  0.02 0.02555 0.97 1.0
## student               0.00  0.12 0.01367 0.99 1.0
## educator              0.04 -0.02 0.00205 1.00 1.4
## return               -0.16 -0.37 0.15997 0.84 1.4
## school               -0.03  0.16 0.02547 0.97 1.1
## break.                0.18 -0.10 0.04164 0.96 1.5
## circumstance          0.43  0.02 0.18903 0.81 1.0
## significant           0.06 -0.08 0.00984 0.99 1.8
## ongoing               0.09  0.14 0.02619 0.97 1.7
## confirm              -0.08 -0.13 0.02318 0.98 1.7
## isolation             0.15 -0.05 0.02663 0.97 1.2
## situation            -0.09 -0.03 0.00974 0.99 1.2
## 
##                         TC1   TC2
## SS loadings           36.64 22.46
## Proportion Var         0.07  0.04
## Cumulative Var         0.07  0.12
## Proportion Explained   0.62  0.38
## Cumulative Proportion  0.62  1.00
## 
##  With component correlations of 
##       TC1   TC2
## TC1  1.00 -0.01
## TC2 -0.01  1.00
## 
## Mean item complexity =  1.3
## Test of the hypothesis that 2 components are sufficient.
## 
## The root mean square of the residuals (RMSR) is  0.14 
##  with the empirical chi square  235831.3  with prob <  0 
## 
## Fit based upon off diagonal values = 0.27

Adequate solution

fa.stats(gov_tweets[,7:507], f=pca_solution1)$rms
## [1] 0.1272145
fa.stats(gov_tweets[,7:507], f=pca_solution2)$rms
## [1] 0.1386145
fa.stats(gov_tweets[,7:507], f=pca_solution1)$RMSEA
##      RMSEA      lower      upper confidence 
##       0.00       0.00       0.00       0.95
fa.stats(gov_tweets[,7:507], f=pca_solution2)$RMSEA
##      RMSEA      lower      upper confidence 
##       0.00       0.00       0.00       0.95
fa.stats(gov_tweets[,7:507], f=pca_solution1)$TLI
## [1] 0.3225481
fa.stats(gov_tweets[,7:507], f=pca_solution2)$TLI
## [1] 0.2241667

Themes

dim(pca_solution1$loadings)
## [1] 501   4
df <- as.data.frame(pca_solution1$loadings[1:501, 1:4])
theme1 <- subset(df[order(df$TC1, decreasing = T),], TC1 > 0, select = c(TC1))
theme1
##                               TC1
## rainy                0.9042087569
## committee            0.8962845121
## X165                 0.8726562795
## forecast             0.8696215890
## reflect              0.8552673332
## media                0.8336347451
## X118                 0.8132166096
## examine              0.7974901509
## resurgence           0.7889113183
## passage              0.7786595292
## liability            0.7775338325
## walking              0.7662166317
## responsive           0.7634154864
## native               0.7601631216
## peak                 0.7503556382
## fashion              0.7500034012
## bear                 0.7055918458
## commend              0.7016791305
## extraordinary        0.7013662508
## consistent           0.6917159288
## spring               0.6804823284
## central              0.6792470075
## fellowship           0.6757802345
## symptomatic          0.6599467196
## provide              0.6300043114
## initiative           0.6063283106
## lower                0.5930305438
## fought               0.5867560679
## suggestion           0.5814615359
## fish                 0.5518564257
## X1.30                0.5517223942
## daughter             0.5504743386
## hike                 0.5477229832
## organize             0.5427981488
## evaluate             0.5426104685
## leverage             0.5402977912
## chairman             0.5386157595
## session              0.5378484235
## article              0.5358265203
## out.of.state         0.5174583945
## park                 0.5135185035
## quest                0.5132721253
## surplus              0.5123582705
## X1.500               0.5016371466
## governor             0.4971164543
## advisory             0.4857478735
## suspect              0.4840604017
## X500                 0.4770929249
## adequate             0.4745436530
## creation             0.4713423720
## X.2020census         0.4686793344
## tornado              0.4674006979
## X1st                 0.4569579136
## fever                0.4546361127
## circumstance         0.4521524269
## midnight             0.4493095277
## breath               0.4491012504
## X.fema               0.4424453119
## heal                 0.4371209165
## frequently           0.4353170506
## pm                   0.4230478249
## news                 0.4192386115
## tweet                0.4145223145
## strategy             0.4137577374
## longer               0.4049021600
## project              0.4015051698
## assist               0.4009212000
## congregation         0.3999121033
## hold                 0.3950231811
## propose              0.3897455825
## week                 0.3888089272
## louis                0.3877200530
## mail                 0.3874765565
## short                0.3818768598
## X2.3                 0.3811546939
## foot                 0.3793471379
## discourage           0.3780636890
## participate          0.3774649302
## party                0.3722184459
## conference           0.3689518684
## current              0.3667680447
## X1.4                 0.3626196763
## outdoor              0.3579057782
## procure              0.3553706925
## remotely             0.3517096385
## X1.3                 0.3387745626
## institute            0.3271880769
## recommendation       0.3271767001
## imminent             0.3269043581
## lift                 0.3259680216
## careful              0.3233082202
## sample               0.3226033861
## short.term           0.3124026287
## X4.4                 0.3111312177
## finish               0.3008820446
## surface              0.2985947497
## arrive               0.2975073062
## campaign             0.2971151906
## throw                0.2965800398
## update               0.2962207884
## radio                0.2939354194
## X250                 0.2921323629
## today                0.2904611586
## diagnostic           0.2861926387
## accord               0.2853148043
## year                 0.2847399986
## task                 0.2844001039
## represent            0.2826418049
## phone                0.2815112232
## guideline            0.2810911542
## pursue               0.2775127255
## portal               0.2762007784
## designate            0.2761165420
## nationwide           0.2740119407
## locate               0.2673102392
## present              0.2660391113
## mind                 0.2659998521
## response             0.2655319463
## X2.2                 0.2613747650
## spirit               0.2571786874
## condolence           0.2529727794
## number               0.2525725928
## behalf               0.2491142095
## institution          0.2477606063
## negatively           0.2438744467
## commercial           0.2429023423
## shortness            0.2425850540
## touch                0.2404687066
## X2.500               0.2403446139
## industry             0.2401191250
## X.walmart            0.2399970286
## exceed               0.2378336607
## large                0.2332864438
## birthday             0.2314067548
## break.               0.2309243373
## operation            0.2302830807
## gathering            0.2297107876
## X27                  0.2294557954
## X1.000               0.2287000025
## question             0.2254699943
## reach                0.2243440905
## space                0.2235965371
## select               0.2213025690
## customer             0.2205699902
## count                0.2177742725
## cough                0.2176418158
## veteran              0.2175575263
## X24                  0.2170538688
## revenue              0.2120752002
## america              0.2119462263
## contract             0.2092499769
## fully                0.2062244678
## attend               0.2061550307
## member               0.2055966972
## isolation            0.2054639877
## blood                0.2054334192
## cdc                  0.2046863015
## burden               0.2041908987
## telehealth           0.2022393787
## approve              0.2012406285
## national             0.1983930459
## happy                0.1982897472
## X3.3                 0.1976466534
## bill                 0.1961349654
## senate               0.1898975854
## urgent               0.1884997624
## reply                0.1853350614
## faith                0.1851369337
## avoid                0.1848526564
## unnecessary          0.1845700405
## house                0.1845161559
## thought              0.1833816263
## activity             0.1824670491
## symptom              0.1814617956
## crisis               0.1813539485
## force                0.1810072333
## mean                 0.1796493122
## directive            0.1777684648
## directly             0.1755286366
## tourism              0.1705213802
## collection           0.1691887464
## guard                0.1683718892
## demand               0.1680214376
## individual           0.1648077480
## administer           0.1644278295
## covid                0.1643567459
## patient              0.1625225620
## mindful              0.1623077708
## restore              0.1616500006
## rise                 0.1607865436
## room                 0.1587267689
## watch                0.1583044078
## protection           0.1546791100
## live                 0.1543290512
## place                0.1541675404
## front.line           0.1538498481
## officer              0.1537349360
## delegation           0.1521666251
## threat               0.1516891827
## center               0.1506328947
## model                0.1478932291
## telemedicine         0.1476466715
## post                 0.1473623972
## activate             0.1454280450
## prioritize           0.1432378696
## wait                 0.1426831940
## proposal             0.1425467916
## special              0.1413771404
## night                0.1410329716
## church               0.1388921320
## qualify              0.1386875428
## address              0.1374127061
## successful           0.1348685194
## data                 0.1345240504
## sector               0.1332361621
## mitigation           0.1321793963
## X5.00                0.1321174843
## grateful             0.1318096161
## recovery             0.1313922351
## conduct              0.1306566397
## accurate             0.1303096978
## outbreak             0.1296986485
## answer               0.1292514914
## afternoon            0.1289542734
## mitigate             0.1274891231
## confidence           0.1242709910
## affect               0.1218755151
## future               0.1213046505
## legislation          0.1200723882
## base                 0.1192916817
## restriction          0.1186130904
## social               0.1179494317
## X.nationaldoctorsday 0.1159106867
## in.person            0.1133993539
## shop                 0.1121009764
## look                 0.1118649453
## submit               0.1117072214
## X2nd                 0.1104344374
## worship              0.1100400740
## clean                0.1097554231
## town                 0.1091487883
## chief                0.1074098566
## daily                0.1072069698
## X1.5                 0.1067109588
## life                 0.1065877423
## increase             0.1053120713
## file                 0.1048011987
## sick                 0.1025949442
## regularly            0.1017617708
## team                 0.1014979219
## effective            0.0994071616
## travel               0.0993219178
## top                  0.0989043295
## improve              0.0988060633
## meeting              0.0983960969
## physician            0.0964165740
## mandate              0.0948020781
## provider             0.0946460902
## lost                 0.0912724397
## consider             0.0883687521
## word                 0.0877787277
## see                  0.0863529089
## maintain             0.0849477152
## census               0.0838322673
## opening              0.0811322525
## pay                  0.0808065008
## guide                0.0806215958
## priority             0.0801304047
## safety               0.0786894868
## distance             0.0771817455
## employment           0.0770010927
## encourage            0.0768174152
## communication        0.0758642458
## noon                 0.0753282893
## protocol             0.0742313933
## owner                0.0716148381
## practice             0.0704684448
## hope                 0.0699482357
## screen               0.0684679282
## drive.thru           0.0676442850
## responsibility       0.0665167690
## commit               0.0653387871
## report               0.0620204604
## case                 0.0611700033
## develop              0.0590637076
## isolate              0.0581040623
## establish            0.0564525070
## review               0.0557623668
## X7pm                 0.0552197660
## group                0.0548415997
## hospitalize          0.0538385496
## timely               0.0536444048
## sacrifice            0.0534685664
## country              0.0532769274
## learn                0.0520588063
## offer                0.0507552231
## goal                 0.0502892990
## capacity             0.0496898413
## donation             0.0492893981
## deadline             0.0483475563
## regard               0.0483325990
## measure              0.0482081937
## test                 0.0466325759
## treat                0.0447946067
## reopening            0.0425517071
## face                 0.0422965440
## launch               0.0401175018
## enhance              0.0397408409
## fellow               0.0390749697
## trend                0.0381781456
## rural                0.0374203111
## inform               0.0365597217
## doctor               0.0349684140
## ease                 0.0343242176
## website              0.0340773410
## ongoing              0.0335524402
## leave                0.0325615008
## payment              0.0317426914
## important            0.0312052142
## change               0.0303795313
## self.quarantine      0.0300193660
## tomorrow             0.0272987426
## form                 0.0259963782
## X.potus              0.0256103752
## hardship             0.0253176965
## positive             0.0251483543
## announce             0.0245101759
## flatten              0.0244896589
## free                 0.0239353083
## sure                 0.0237006326
## hour                 0.0235687836
## federal              0.0228640063
## business             0.0217573308
## twitter              0.0216110633
## expose               0.0201328169
## create               0.0183630607
## give                 0.0179011314
## talk                 0.0170235796
## facility             0.0169263080
## employer             0.0168291553
## implement            0.0164223018
## full                 0.0158476942
## drive.through        0.0156711235
## begin                0.0153204387
## right                0.0138685645
## guidance             0.0135482693
## process              0.0132213043
## relief               0.0127099064
## private              0.0125495054
## support              0.0121820743
## slow                 0.0116665061
## result               0.0111034532
## hard                 0.0101959832
## total                0.0097998419
## economic             0.0085839051
## open                 0.0067096113
## educator             0.0065144691
## organization         0.0058229314
## lab                  0.0045709517
## significant          0.0045117410
## confirm              0.0045103697
## disaster             0.0023840074
## agency               0.0006023704
theme2 <- subset(df[order(df$TC2, decreasing = T),], TC2 > 0, select = c(TC2))
theme2
##                               TC2
## time                 0.3116443188
## plan                 0.2522344571
## right                0.2502978970
## thank                0.2292997637
## family               0.2290609101
## pandemic             0.2274129752
## great                0.2242622627
## business             0.2148644636
## protect              0.2114701932
## place                0.2098537566
## join                 0.2085633773
## worker               0.2074955113
## tomorrow             0.1987153403
## social               0.1984233098
## visit                0.1948078986
## week                 0.1939901459
## word                 0.1903786449
## safe                 0.1902010452
## X2nd                 0.1887328961
## information          0.1861258501
## talk                 0.1853699132
## hallway              0.1845777581
## task                 0.1821120380
## spread               0.1788940673
## see                  0.1768754671
## guidance             0.1760122111
## vulnerable           0.1759560680
## healthy              0.1753441050
## private              0.1752398628
## citizen              0.1750452597
## change               0.1748034646
## stay                 0.1699218457
## issue                0.1682527195
## resource             0.1681858592
## answer               0.1656593583
## number               0.1647159556
## population           0.1646631843
## X.covid19            0.1625257851
## close                0.1612138859
## distance             0.1609489577
## faith                0.1608824236
## member               0.1593478020
## hard                 0.1590622864
## watch                0.1584041382
## slow                 0.1581912428
## sick                 0.1571162612
## public               0.1566733688
## face                 0.1564007969
## order                0.1562912864
## sign                 0.1560721213
## learn                0.1556850684
## top                  0.1548159404
## X.vp                 0.1535327159
## mind                 0.1518080673
## live                 0.1517663512
## best                 0.1516787183
## community            0.1510618378
## important            0.1507279638
## file                 0.1506215037
## surge                0.1500517751
## town                 0.1500285474
## question             0.1498691443
## maintain             0.1494768890
## reopening            0.1493439959
## call                 0.1490036882
## discuss              0.1489754765
## travel               0.1485633368
## unemployment         0.1475802039
## step                 0.1475323060
## due                  0.1462253938
## economic             0.1461068858
## gathering            0.1457859499
## country              0.1456143724
## X3.3                 0.1446878139
## X1.5                 0.1433672019
## give                 0.1425441233
## avoid                0.1421426079
## urllink              0.1404208549
## symptom              0.1404115015
## project              0.1396330638
## responder            0.1389000033
## attend               0.1388172558
## encourage            0.1381446507
## mean                 0.1378914741
## consider             0.1366381636
## measure              0.1358579788
## effort               0.1353800126
## extend               0.1349794052
## state                0.1338715594
## america              0.1338132357
## clean                0.1320920909
## gt                   0.1314111601
## special              0.1314082526
## sure                 0.1298348852
## provider             0.1298295199
## offer                0.1293137414
## pay                  0.1286805107
## friend               0.1281386752
## mandate              0.1277938204
## count                0.1272757538
## follow               0.1270807918
## dr                   0.1268737015
## sector               0.1268264896
## regard               0.1265104643
## fight                0.1263380716
## regularly            0.1254255173
## lift                 0.1250493399
## president            0.1239142097
## benefit              0.1229145347
## form                 0.1227151789
## national             0.1211789215
## long.term            0.1203893412
## begin                0.1200780810
## rural                0.1196390226
## curve                0.1185964896
## protection           0.1182416285
## hope                 0.1182191451
## small                0.1181195804
## safety               0.1179334059
## payment              0.1172111166
## sacrifice            0.1149122179
## rise                 0.1144898704
## full                 0.1144823502
## fellow               0.1135541214
## owner                0.1129563637
## recommendation       0.1126090291
## people               0.1123649037
## institute            0.1116856717
## officer              0.1116186390
## current              0.1113011853
## throw                0.1111697478
## approve              0.1106146541
## industry             0.1103601996
## enhance              0.1093842414
## surface              0.1080051014
## prioritize           0.1078784677
## data                 0.1077749204
## effect               0.1071424759
## disaster             0.1070747885
## force                0.1065276714
## prepare              0.1064569811
## careful              0.1060511536
## represent            0.1058893239
## noon                 0.1058546412
## self.quarantine      0.1055920312
## reply                0.1049812004
## night                0.1048919764
## guard                0.1044361972
## school               0.1043477762
## space                0.1023688231
## afternoon            0.1020893711
## tax                  0.1019429790
## doctor               0.1006095078
## restriction          0.0998151622
## neighbor             0.0997492277
## economy              0.0993370359
## outbreak             0.0989798928
## future               0.0988965090
## group                0.0985979852
## employer             0.0976954334
## facility             0.0964809669
## guide                0.0964640120
## save                 0.0931661025
## unnecessary          0.0931405221
## foot                 0.0929315458
## team                 0.0928763884
## shop                 0.0927833170
## frequently           0.0927449611
## condolence           0.0927182740
## base                 0.0917496025
## blood                0.0916188567
## X.realdonaldtrump    0.0915889645
## large                0.0909033743
## threat               0.0903293014
## meeting              0.0902866830
## finish               0.0898313423
## guideline            0.0891722144
## appreciate           0.0891377411
## situation            0.0883087386
## drive.thru           0.0879577291
## life                 0.0876452593
## department           0.0875731253
## ensure               0.0874960610
## leader               0.0869345351
## practice             0.0868685136
## hardship             0.0856227928
## accurate             0.0851595471
## census               0.0844199910
## peak                 0.0830262866
## congregation         0.0819059329
## X2.500               0.0802608677
## restaurant           0.0802386438
## student              0.0799934551
## X24                  0.0798888830
## inform               0.0797675226
## tonight              0.0788568285
## urgent               0.0787965239
## bill                 0.0786327006
## grocery              0.0785351245
## require              0.0784789145
## discourage           0.0783345583
## expose               0.0779544928
## deadline             0.0773070595
## confirm              0.0773020216
## shortness            0.0772905033
## case                 0.0764915270
## reach                0.0764748568
## educator             0.0758863274
## directive            0.0754025646
## fever                0.0741212755
## qualify              0.0727942882
## flatten              0.0727022327
## post                 0.0712775242
## imminent             0.0710876378
## access               0.0709619475
## demand               0.0707357546
## breath               0.0707200774
## dedication           0.0692830653
## isolate              0.0682567938
## website              0.0666510669
## X2.3                 0.0666288987
## resurgence           0.0657037030
## lower                0.0651146699
## model                0.0640415027
## nationwide           0.0638581196
## confidence           0.0637383280
## provide              0.0635931464
## chief                0.0635760413
## tourism              0.0634808827
## X.potus              0.0632911283
## update               0.0618161653
## communication        0.0601565948
## online               0.0601549782
## X27                  0.0599919774
## federal              0.0594736809
## patient              0.0594236933
## veteran              0.0592465511
## professional         0.0586627791
## creation             0.0585979157
## priority             0.0585479120
## directly             0.0584622179
## timely               0.0583312781
## cough                0.0582852202
## lab                  0.0581178905
## touch                0.0580039752
## X1.000               0.0579193125
## partnership          0.0576909474
## virtual              0.0575226721
## accord               0.0569223148
## hospitalize          0.0567004040
## meet                 0.0562222841
## weekend              0.0551725487
## improve              0.0546374085
## central              0.0543306897
## faucus               0.0538464355
## worship              0.0533850693
## work                 0.0531633709
## trend                0.0520078795
## ongoing              0.0516013734
## phone                0.0508354942
## free                 0.0508016777
## expand               0.0500961842
## lost                 0.0500090742
## west                 0.0497879676
## significant          0.0496643064
## conduct              0.0492281750
## twitter              0.0492198750
## out.of.state         0.0491851452
## remotely             0.0491522391
## senate               0.0491339429
## reduce               0.0483747369
## X.nationaldoctorsday 0.0482316043
## mitigation           0.0471546343
## recovery             0.0466982199
## negatively           0.0458944830
## hold                 0.0454131200
## screen               0.0448747220
## read                 0.0448238079
## executive            0.0440339142
## mail                 0.0440078227
## participate          0.0438625217
## behalf               0.0438025998
## workforce            0.0429236695
## ease                 0.0426156518
## party                0.0425644128
## governor             0.0424714129
## house                0.0424206179
## room                 0.0418471879
## suspect              0.0411892254
## happy                0.0406992814
## thanks               0.0405496447
## telehealth           0.0402024668
## direct               0.0399969032
## site                 0.0387540550
## pursue               0.0375673389
## X1.30                0.0372901093
## revenue              0.0372402053
## north                0.0371810710
## hour                 0.0367387491
## arrive               0.0353745971
## year                 0.0346449271
## nurse                0.0341824184
## extraordinary        0.0337443823
## conference           0.0337441459
## exceed               0.0331454506
## midnight             0.0326322448
## treat                0.0323653939
## spring               0.0322122309
## goal                 0.0307579931
## employee             0.0307519517
## tornado              0.0293442878
## center               0.0283829054
## implement            0.0277686400
## submit               0.0277339682
## heal                 0.0274185875
## fully                0.0243093585
## X.walmart            0.0229404058
## X1.4                 0.0220726208
## spirit               0.0213370033
## church               0.0203401409
## X7pm                 0.0199438795
## total                0.0194933133
## individual           0.0193856864
## agency               0.0193258542
## adequate             0.0192368105
## prevent              0.0191663515
## park                 0.0177017623
## fellowship           0.0176116103
## article              0.0167943436
## positive             0.0165031080
## affect               0.0158516787
## combat               0.0147067889
## effective            0.0143491033
## delegation           0.0143084334
## virus                0.0141331588
## evaluate             0.0140170819
## report               0.0139084015
## X.2020census         0.0133231493
## X5.00                0.0133226162
## additional           0.0124651570
## strategy             0.0109296738
## sample               0.0104085327
## win                  0.0103763989
## personal             0.0101543341
## drive.through        0.0097094270
## short                0.0096170401
## circumstance         0.0080164450
## mindful              0.0078151410
## campaign             0.0074711354
## outdoor              0.0066603320
## commend              0.0059284837
## activity             0.0058625563
## capacity             0.0057492103
## relief               0.0048430291
## fought               0.0047304539
## procure              0.0043719877
## chairman             0.0041003911
## physician            0.0037412943
## diagnostic           0.0035846176
## leave                0.0029413269
## X1.3                 0.0027032474
## longer               0.0026760900
## request              0.0026014313
## session              0.0020009168
## fish                 0.0013323861
## X.fema               0.0008581208
theme3 <- subset(df[order(df$TC3, decreasing = T),], TC3 > 0, select = c(TC3))
theme3
##                           TC3
## serve             0.738597141
## respond           0.724152083
## expand            0.638203442
## minimize          0.604048807
## work              0.580588591
## option            0.557957981
## capacity          0.555476756
## safety            0.546499427
## access            0.544949960
## restore           0.529324719
## open              0.526484916
## leader            0.520380182
## issue             0.518691588
## house             0.511539915
## federal           0.507502593
## ensure            0.505859952
## mitigate          0.504696551
## small             0.496366777
## protocol          0.493963875
## resource          0.492657403
## support           0.488132640
## commit            0.482452648
## prepare           0.474442847
## employment        0.468895295
## telemedicine      0.459812198
## facility          0.458074620
## strategy          0.448285970
## hard              0.447904683
## partnership       0.433260407
## meet              0.432006933
## customer          0.427622980
## delegation        0.424155830
## collection        0.422754809
## burden            0.417181905
## service           0.410173172
## relief            0.405391911
## allow             0.395461438
## force             0.391662057
## business          0.390953416
## continue          0.387963064
## care              0.374634191
## worker            0.373194027
## thanks            0.370404628
## town              0.368582763
## proposal          0.363330361
## base              0.361071052
## gathering         0.360860128
## administer        0.357415489
## X2.2              0.345958921
## worship           0.343764123
## cdc               0.333169190
## launch            0.331960712
## model             0.330397573
## health            0.328051402
## partner           0.326902275
## activity          0.324418446
## long.term         0.321600327
## safe              0.321023260
## year              0.320152784
## top               0.312281622
## measure           0.310393194
## bill              0.307968213
## legislation       0.305619086
## nurse             0.303625301
## priority          0.303531793
## child             0.302158321
## drive.through     0.301833751
## assist            0.301250314
## reduce            0.298473291
## locate            0.297510772
## affect            0.297215350
## free              0.290014591
## hope              0.288738382
## telehealth        0.282998414
## vulnerable        0.281624632
## personal          0.278636162
## fully             0.277032925
## contract          0.276480839
## deadline          0.273307983
## effect            0.272321384
## country           0.266534451
## senate            0.266372144
## institution       0.266158811
## present           0.263558326
## implement         0.262402590
## economic          0.261622493
## submit            0.260730470
## protect           0.259308763
## national          0.257636518
## timely            0.256786238
## X4.4              0.253195228
## request           0.252417705
## require           0.252000032
## surge             0.251786391
## recovery          0.249194079
## site              0.248460538
## future            0.247511687
## enhance           0.246727109
## combat            0.243684007
## opening           0.242166947
## church            0.238292508
## face              0.236038618
## guidance          0.234293536
## rural             0.230109157
## prioritize        0.227833888
## emergency         0.227668455
## president         0.227617746
## guard             0.224875039
## goal              0.223911026
## fellow            0.218465093
## pay               0.211320121
## industry          0.210915033
## X1st              0.210110412
## team              0.206697379
## thought           0.205531817
## grateful          0.202923361
## save              0.202458501
## employee          0.198003338
## develop           0.196540832
## ongoing           0.195245851
## hardship          0.195078786
## exceed            0.193625597
## family            0.192453463
## in.person         0.190321012
## due               0.188195882
## quest             0.186192626
## private           0.185713661
## assistance        0.185501794
## doctor            0.183729671
## people            0.181715760
## reach             0.180082980
## weekend           0.179692151
## risk              0.176228637
## front.line        0.173730824
## provide           0.172586607
## sacrifice         0.168212920
## cough             0.168087780
## threat            0.166458495
## pursue            0.166086833
## foot              0.162940830
## select            0.162819384
## provider          0.162670951
## online            0.162601078
## activate          0.162142356
## school            0.159552419
## answer            0.157398708
## workforce         0.154495861
## executive         0.153864963
## increase          0.153634581
## approve           0.151258729
## initiative        0.150935225
## important         0.150693428
## population        0.149925178
## benefit           0.149381801
## question          0.149307212
## unnecessary       0.148939158
## guideline         0.148625686
## learn             0.147876223
## unemployment      0.145841473
## propose           0.142320717
## fund              0.139721538
## self.quarantine   0.138092806
## lift              0.137639508
## adequate          0.135839730
## restriction       0.135580167
## healthy           0.135501654
## individual        0.134715529
## diagnostic        0.132467722
## restaurant        0.131203023
## temporarily       0.130331440
## time              0.128122165
## advisory          0.126420585
## mean              0.124689744
## large             0.123520165
## protection        0.121223796
## crowd             0.120201490
## look              0.120161061
## X500              0.119945681
## address           0.119238808
## commercial        0.116074069
## drive.thru        0.115962384
## short.term        0.115557943
## life              0.115038860
## discourage        0.113264468
## avoid             0.112352010
## student           0.111359494
## spirit            0.111271866
## response          0.110619072
## community         0.108126688
## sign              0.103544719
## tornado           0.100749986
## task              0.098602906
## effort            0.098086040
## hallway           0.097401503
## crisis            0.096965037
## longer            0.096088181
## arrive            0.093217653
## breath            0.092636934
## portal            0.089518280
## medical           0.089432901
## census            0.087838270
## accurate          0.086750580
## responder         0.086089018
## X3.3              0.084923305
## close             0.084577097
## form              0.084023030
## join              0.081496905
## article           0.081314674
## nationwide        0.078347406
## group             0.077237483
## resurgence        0.075582074
## central           0.072072051
## liability         0.071311262
## X.realdonaldtrump 0.071211948
## fever             0.071172805
## suspend           0.070438096
## shortness         0.070340044
## radio             0.068961238
## establish         0.068313196
## offer             0.067604252
## encourage         0.067157893
## hospital          0.066956703
## test              0.066686369
## birthday          0.066343320
## dedication        0.065987463
## expose            0.065961934
## mindful           0.065799535
## social            0.065524283
## disaster          0.065235221
## screen            0.064820314
## X250              0.064479157
## chairman          0.063425164
## X2.3              0.063381121
## sample            0.062979477
## begin             0.060976509
## happy             0.060264463
## faith             0.057498822
## X1.000            0.055641880
## ease              0.055539555
## public            0.053748434
## bear              0.053028922
## responsibility    0.052597117
## rental            0.048583865
## department        0.047848905
## full              0.047793012
## reply             0.046024848
## consistent        0.045916624
## X2.500            0.044378314
## prevent           0.044323916
## fish              0.043977803
## slow              0.043948443
## touch             0.043684458
## owner             0.043592711
## campaign          0.043304692
## X.fema            0.043218977
## sure              0.043005501
## citizen           0.042450122
## fellowship        0.042020943
## agency            0.041461001
## X7pm              0.041207734
## daughter          0.041140288
## step              0.038113820
## congregation      0.037958314
## native            0.037209886
## fashion           0.036972075
## midnight          0.035601543
## X1.2              0.035026277
## behalf            0.034399801
## tweet             0.034159592
## X1.3              0.033770856
## veteran           0.033761393
## creation          0.033222051
## X1.5              0.031941065
## evaluate          0.031550519
## consider          0.030886113
## finish            0.030327395
## mail              0.028796608
## economy           0.028591644
## covid             0.028318603
## party             0.027747729
## reflect           0.027663120
## incredibly        0.027064981
## announce          0.025594008
## hike              0.025357741
## mitigation        0.025320748
## park              0.025280277
## commend           0.025207123
## committee         0.025156815
## improve           0.023226467
## imminent          0.023178072
## symptom           0.021791750
## leverage          0.018903514
## physician         0.017430501
## throw             0.017319939
## inform            0.013090614
## forecast          0.012713043
## passage           0.012432864
## X.walmart         0.010810955
## attend            0.010650656
## sector            0.009815516
## virus             0.009363155
## peak              0.008812003
## represent         0.007928961
## successful        0.007540397
## professional      0.006221905
## plan              0.005513152
## directive         0.002137227
theme4 <- subset(df[order(df$TC4, decreasing = T),], TC4 > 0, select = c(TC4))
theme4
##                              TC4
## appreciate           0.611035157
## physician            0.594427435
## communication        0.589351499
## effort               0.581767326
## meeting              0.564876088
## X.nationaldoctorsday 0.549628781
## X5.00                0.535610963
## successful           0.527198498
## expose               0.525783525
## faucus               0.513594019
## dedication           0.508031398
## combat               0.500054376
## direct               0.492645832
## X.potus              0.492488284
## dr                   0.469580244
## disaster             0.468321928
## drive.thru           0.436247641
## X7pm                 0.434386874
## opening              0.424289346
## urllink              0.419407934
## pm                   0.417918665
## approve              0.417697544
## full                 0.417110480
## service              0.414589784
## news                 0.412337176
## significant          0.401095484
## response             0.394799949
## watch                0.392904529
## X.covid19            0.383786478
## afternoon            0.379891254
## consider             0.374248354
## regard               0.371860484
## executive            0.368109447
## effect               0.367087738
## discuss              0.364230869
## site                 0.360203480
## general              0.353534238
## great                0.336317307
## conference           0.335541237
## today                0.333513752
## tomorrow             0.326351686
## X1.2                 0.311620992
## self.quarantine      0.308958459
## activate             0.306441710
## update               0.299885457
## provide              0.290163149
## X.realdonaldtrump    0.287301822
## join                 0.287189609
## educator             0.274942885
## individual           0.274163487
## improve              0.269825721
## team                 0.267192240
## burden               0.263415721
## fight                0.262787547
## X1.3                 0.260662341
## operation            0.257508335
## read                 0.255867498
## behalf               0.254504943
## hold                 0.253767834
## form                 0.253131455
## implement            0.248208783
## establish            0.244516499
## resource             0.241844447
## develop              0.241203582
## employment           0.240435825
## town                 0.239538488
## X2.30                0.233413359
## issue                0.222246996
## order                0.222086229
## X2.3                 0.220959030
## department           0.219062575
## economic             0.216806523
## recovery             0.216690843
## worship              0.215722140
## ongoing              0.215201736
## phone                0.215108846
## drive.through        0.210998976
## temporarily          0.208761216
## short.term           0.206925401
## activity             0.205150548
## live                 0.202311877
## visitor              0.201256661
## thank                0.198459002
## pass                 0.197595236
## provider             0.195476848
## president            0.192970401
## assembly             0.192565776
## extend               0.192018829
## encourage            0.191251576
## official             0.190332722
## prevent              0.189728730
## exceed               0.185406874
## suspend              0.185327790
## revenue              0.184122206
## additional           0.183936434
## emergency            0.183832388
## project              0.183077134
## customer             0.181920262
## cdc                  0.179815357
## submit               0.177609347
## school               0.177064680
## institution          0.175846522
## center               0.174711322
## thanks               0.174076746
## mitigation           0.173865969
## institute            0.172786925
## tourism              0.172027298
## X.vp                 0.171460393
## spirit               0.171338344
## request              0.167250241
## assist               0.166735487
## serve                0.166168189
## require              0.162010557
## state                0.161530010
## chief                0.160518725
## commend              0.159164520
## ensure               0.157426283
## win                  0.155580736
## virus                0.155383352
## support              0.154367297
## screen               0.150903537
## federal              0.147221142
## affect               0.146813309
## online               0.146585876
## question             0.142921202
## attend               0.142486121
## sign                 0.139951311
## website              0.134613325
## assistance           0.134529779
## commercial           0.133376012
## fund                 0.133313817
## talk                 0.129123028
## church               0.128093593
## X1.5                 0.119352798
## doctor               0.116452033
## tweet                0.115068322
## bear                 0.114793999
## visit                0.114665718
## X.walmart            0.112118507
## agency               0.112114266
## conduct              0.110227467
## negatively           0.107928467
## student              0.105505131
## give                 0.104405658
## cough                0.103366289
## lab                  0.100119558
## economy              0.100048916
## tornado              0.096693900
## virtual              0.095587382
## X3.3                 0.092819015
## arrive               0.091937539
## protocol             0.091913999
## pursue               0.089407398
## benefit              0.088207401
## chairman             0.087980829
## examine              0.085642215
## X1.30                0.084967854
## restore              0.084822703
## employer             0.084640909
## extraordinary        0.084565264
## offer                0.082475561
## guideline            0.082277669
## fellowship           0.080491062
## mind                 0.080298427
## X1.4                 0.078523128
## nationwide           0.075745480
## timely               0.075488287
## nurse                0.075378106
## represent            0.074448758
## recommendation       0.072256711
## threat               0.071257566
## twitter              0.069942191
## leader               0.068427700
## initiative           0.067621444
## day                  0.067232230
## front.line           0.066557796
## peak                 0.066431630
## senate               0.063554789
## inform               0.062898929
## administer           0.062873447
## west                 0.060493198
## louis                0.060479202
## relief               0.058944469
## relate               0.057585218
## midnight             0.057046335
## governor             0.056631241
## restaurant           0.055522260
## file                 0.053901197
## throw                0.051797247
## gt                   0.050323939
## quest                0.048323157
## guard                0.047300280
## expand               0.046976267
## suggestion           0.045627125
## grateful             0.045363789
## central              0.040211222
## hard                 0.039110123
## fully                0.038538217
## hour                 0.036332809
## effective            0.035511513
## address              0.033411792
## locate               0.032332302
## allow                0.032214437
## media                0.031103864
## short                0.031011221
## total                0.030790361
## rainy                0.030133146
## organization         0.029935245
## change               0.029733518
## liability            0.029171964
## reply                0.028337971
## hallway              0.028228001
## lower                0.027320557
## evaluate             0.026189295
## partnership          0.025888455
## imminent             0.025340344
## public               0.024984618
## X165                 0.022786094
## outbreak             0.022327778
## weekend              0.020095853
## committee            0.019068873
## incredibly           0.017637884
## mandate              0.016696158
## tune                 0.014479725
## long.term            0.014046522
## forecast             0.013355916
## participate          0.011936420
## telehealth           0.010240430
## healthy              0.009103978
## out.of.state         0.008924379
## blood                0.007899409
## session              0.007603258
## telemedicine         0.007476223
## free                 0.007271517
## crowd                0.005658971
## current              0.005098813
## special              0.003498777
## article              0.003136813
## right                0.002489989

Group Differences

gov_tweets$theme1 <- apply(gov_tweets[,row.names(theme1)], MARGIN = 1, sum)
summary(gov_tweets$theme1)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   2.667  10.069  11.562  11.780  13.042  30.093
gov_tweets$theme2 <- apply(gov_tweets[,row.names(theme2)], MARGIN = 1, sum)
summary(gov_tweets$theme2)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   2.381  17.273  19.111  19.420  21.367  28.895
gov_tweets$theme3 <- apply(gov_tweets[,row.names(theme3)], MARGIN = 1, sum)
summary(gov_tweets$theme3)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   5.835  10.736  12.695  12.884  15.173  21.400
gov_tweets$theme4 <- apply(gov_tweets[,row.names(theme4)], MARGIN = 1, sum)
summary(gov_tweets$theme4)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   5.333  10.928  13.093  14.717  18.643  27.241
describeBy(gov_tweets[,c('theme1','theme2','theme3','theme4')], gov_tweets$Party)
## 
##  Descriptive statistics by group 
## group: D
##        vars  n  mean   sd median trimmed  mad  min   max range  skew kurtosis
## theme1    1 23 10.99 2.27  11.32   11.20 1.18 2.67 14.42 11.75 -1.88     5.33
## theme2    2 23 17.67 3.97  18.44   18.05 1.95 2.38 24.48 22.10 -2.22     7.05
## theme3    3 23 12.58 3.02  12.17   12.60 3.16 7.12 19.03 11.91 -0.04    -0.60
## theme4    4 23 11.98 3.53  12.04   11.77 1.96 5.33 19.80 14.47  0.50    -0.10
##          se
## theme1 0.47
## theme2 0.83
## theme3 0.63
## theme4 0.74
## ------------------------------------------------------------ 
## group: R
##        vars  n  mean   sd median trimmed  mad   min   max range skew kurtosis
## theme1    1 26 12.48 4.36  12.46   12.04 2.39  5.77 30.09 24.33 2.28     7.58
## theme2    2 26 20.97 3.58  20.35   20.88 4.02 15.19 28.89 13.70 0.28    -0.92
## theme3    3 26 13.15 3.81  13.48   13.07 3.91  5.84 21.40 15.56 0.11    -0.73
## theme4    4 26 17.14 5.12  17.16   17.04 6.02  7.98 27.24 19.26 0.13    -1.00
##          se
## theme1 0.86
## theme2 0.70
## theme3 0.75
## theme4 1.00
wilcox.test(gov_tweets$theme1~gov_tweets$Party)
## 
##  Wilcoxon rank sum exact test
## 
## data:  gov_tweets$theme1 by gov_tweets$Party
## W = 232, p-value = 0.1845
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(gov_tweets$theme2~gov_tweets$Party)
## 
##  Wilcoxon rank sum exact test
## 
## data:  gov_tweets$theme2 by gov_tweets$Party
## W = 164, p-value = 0.006266
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(gov_tweets$theme3~gov_tweets$Party)
## 
##  Wilcoxon rank sum exact test
## 
## data:  gov_tweets$theme3 by gov_tweets$Party
## W = 274, p-value = 0.6265
## alternative hypothesis: true location shift is not equal to 0
wilcox.test(gov_tweets$theme4~gov_tweets$Party)
## 
##  Wilcoxon rank sum exact test
## 
## data:  gov_tweets$theme4 by gov_tweets$Party
## W = 135, p-value = 0.0007633
## alternative hypothesis: true location shift is not equal to 0

Discussion Questions