EO_5

Author

Jingyi Yang

library(readr)
library(readxl)
library(dplyr)

Attaching package: 'dplyr'
The following objects are masked from 'package:stats':

    filter, lag
The following objects are masked from 'package:base':

    intersect, setdiff, setequal, union
library(readr)
library(stringr)
library(dplyr)
library(devtools)
Loading required package: usethis
library(tidytext)
library(plyr)
------------------------------------------------------------------------------
You have loaded plyr after dplyr - this is likely to cause problems.
If you need functions from both plyr and dplyr, please load plyr first, then dplyr:
library(plyr); library(dplyr)
------------------------------------------------------------------------------

Attaching package: 'plyr'
The following objects are masked from 'package:dplyr':

    arrange, count, desc, failwith, id, mutate, rename, summarise,
    summarize
library(tidyverse)
── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
✔ forcats   1.0.0     ✔ purrr     1.0.4
✔ ggplot2   3.5.2     ✔ tibble    3.2.1
✔ lubridate 1.9.4     ✔ tidyr     1.3.1
── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
✖ plyr::arrange()   masks dplyr::arrange()
✖ purrr::compact()  masks plyr::compact()
✖ plyr::count()     masks dplyr::count()
✖ plyr::desc()      masks dplyr::desc()
✖ plyr::failwith()  masks dplyr::failwith()
✖ dplyr::filter()   masks stats::filter()
✖ plyr::id()        masks dplyr::id()
✖ dplyr::lag()      masks stats::lag()
✖ plyr::mutate()    masks dplyr::mutate()
✖ plyr::rename()    masks dplyr::rename()
✖ plyr::summarise() masks dplyr::summarise()
✖ plyr::summarize() masks dplyr::summarize()
ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(quanteda)
Package version: 4.2.0
Unicode version: 15.1
ICU version: 74.1
Parallel computing: 8 of 8 threads used.
See https://quanteda.io for tutorials and examples.
library(quanteda.textplots)
library(quanteda.textmodels)
library(stm)
stm v1.3.7 successfully loaded. See ?stm for help. 
 Papers, resources, and other materials at structuraltopicmodel.com
library(arsenal)

Attaching package: 'arsenal'

The following object is masked from 'package:lubridate':

    is.Date

Import the dataset

US_Executive_executive_orders_21_3_1_ <- read_csv("US-Executive-executive_orders_21.3 (1).csv")
Rows: 4459 Columns: 18
── Column specification ────────────────────────────────────────────────────────
Delimiter: ","
chr  (3): president, signed_date, description
dbl (15): id, eo_number, pres_party, beg_term, end_term, year, month, day, c...

ℹ Use `spec()` to retrieve the full column specification for this data.
ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
EO_Cap_Code_Mapping <- read_excel("EO Cap Code Mapping.xlsx")
EO_All_WithText <- read_csv("EO_All_WithText.csv")
New names:
Rows: 6648 Columns: 21
── Column specification
──────────────────────────────────────────────────────── Delimiter: "," chr
(14): citation, document_number, html_url, pdf_url, type, subtype, titl... dbl
(4): ...1, end_page, start_page, year lgl (1): not_received_for_publication
date (2): publication_date, signing_date
ℹ Use `spec()` to retrieve the full column specification for this data. ℹ
Specify the column types or set `show_col_types = FALSE` to quiet this message.
• `` -> `...1`

Clean the data

US_Executive_executive_orders_21_3_1_new <- US_Executive_executive_orders_21_3_1_ %>% 
  filter(president %in% c("GWBUSH","OBAMA","TRUMP")) %>% dplyr::rename("executive_order_number"= "eo_number")
EO_Cap_Code_Mapping_new <- EO_Cap_Code_Mapping %>% dplyr::rename("majortopic"= "majortopic_no", "subtopic"="subtopic_no")
eo_data <- EO_All_WithText %>% filter(signing_date >= "2001-01-20" & signing_date <= "2021-01-19")

Merge the dataset

merged_df <- left_join(US_Executive_executive_orders_21_3_1_new, EO_Cap_Code_Mapping_new, by=c("majortopic", "subtopic"))

merged_df <- merged_df %>% mutate(executive_order_number = as.character(executive_order_number)) %>% mutate (month= as.character(month)) %>%  mutate (day = as.character(day))

merged_df_all <- left_join(eo_data, merged_df, by= "executive_order_number")

# Display the first few rows of the merged dataframe to inspect
print(head(merged_df_all))
# A tibble: 6 × 43
   ...1 citation    document_number end_page html_url      pdf_url type  subtype
  <dbl> <chr>       <chr>              <dbl> <chr>         <chr>   <chr> <chr>  
1   329 67 FR 39841 02-14807           39842 https://www.… https:… Pres… Execut…
2   330 67 FR 22337 02-11166           22338 https://www.… https:… Pres… Execut…
3   331 66 FR 8497  01-2851             8498 https://www.… https:… Pres… Execut…
4   332 69 FR 29843 04-11991           29844 https://www.… https:… Pres… Execut…
5   333 68 FR 26981 03-12661           26981 https://www.… https:… Pres… Execut…
6   334 68 FR 55255 03-24217           55256 https://www.… https:… Pres… Execut…
# ℹ 35 more variables: publication_date <date>, signing_date <date>,
#   start_page <dbl>, title <chr>, disposition_notes <chr>,
#   executive_order_number <chr>, not_received_for_publication <lgl>,
#   month.x <chr>, day.x <chr>, year.x <dbl>, full_text_xml_url <chr>,
#   text <chr>, full_text_html_url <chr>, id <dbl>, president <chr>,
#   pres_party <dbl>, beg_term <dbl>, end_term <dbl>, signed_date <chr>,
#   year.y <dbl>, month.y <chr>, day.y <chr>, congress <dbl>, divided <dbl>, …

Check the missing values

# Check for NA values in the columns you mentioned
print(sum(is.na(merged_df_all$majortopic_title)))
[1] 7
print(sum(is.na(merged_df_all$subtopic_title)))
[1] 7
print(sum(is.na(merged_df_all$racial)))
[1] 7
subset(merged_df, is.na(`racial`)) %>% print.data.frame()
    id executive_order_number president pres_party beg_term end_term
1 4112                  13638     OBAMA        100        0        0
2 4126                  13652     OBAMA        100        0        0
3 4129                  13655     OBAMA        100        0        0
4 4459                  13982     TRUMP        200        0        1
  signed_date year month day congress divided commemorative
1    20130315 2013     3  15      113       1             0
2    20130930 2013     9  30      113       1             0
3    20131223 2013    12  23      113       1             0
4     1/19/21 2021     1  19      117       1             0
                                       description.x pap_majortopic
1                Amendments to Executive Order 12777              7
2 Continuance of Certain Federal Advisory Committees              2
3                Adjustments of Certain Rates of Pay              2
4        Care of Veterans With Service in Uzbekistan             16
  pap_subtopic majortopic subtopic majortopic_title subtopic_title
1          710          7      710             <NA>           <NA>
2         2011          2     2011             <NA>           <NA>
3         2004          2     2004             <NA>           <NA>
4         1609         16     1609             <NA>           <NA>
  description.y cap_notes racial
1          <NA>      <NA>   <NA>
2          <NA>      <NA>   <NA>
3          <NA>      <NA>   <NA>
4          <NA>      <NA>   <NA>
subset(merged_df_all, is.na(`racial`))%>% print.data.frame()
  ...1    citation document_number end_page
1 4900 78 FR 80451      2013-31445    80462
2 4915 77 FR 77249      2012-31574    77249
3 4918   78 FR 649      2013-00002      660
4 5067 78 FR 61817      2013-24388    61820
5 5115 78 FR 17589      2013-06712    17590
6 5126 77 FR 76339      2012-31225    76340
7 6623  86 FR 6833      2021-01712     6834
                                                                                                                                                            html_url
1                                                                https://www.federalregister.gov/documents/2013/12/31/2013-31445/adjustments-of-certain-rates-of-pay
2                                                             https://www.federalregister.gov/documents/2012/12/31/2012-31574/reestablishment-of-advisory-commission
3                                                                https://www.federalregister.gov/documents/2013/01/03/2013-00002/adjustments-of-certain-rates-of-pay
4                                                 https://www.federalregister.gov/documents/2013/10/04/2013-24388/continuance-of-certain-federal-advisory-committees
5                                                                https://www.federalregister.gov/documents/2013/03/21/2013-06712/amendments-to-executive-order-12777
6 https://www.federalregister.gov/documents/2012/12/28/2012-31225/closing-of-executive-departments-and-agencies-of-the-federal-government-on-monday-december-24-2012
7                                                        https://www.federalregister.gov/documents/2021/01/25/2021-01712/care-of-veterans-with-service-in-uzbekistan
                                                               pdf_url
1 https://www.govinfo.gov/content/pkg/FR-2013-12-31/pdf/2013-31445.pdf
2 https://www.govinfo.gov/content/pkg/FR-2012-12-31/pdf/2012-31574.pdf
3 https://www.govinfo.gov/content/pkg/FR-2013-01-03/pdf/2013-00002.pdf
4 https://www.govinfo.gov/content/pkg/FR-2013-10-04/pdf/2013-24388.pdf
5 https://www.govinfo.gov/content/pkg/FR-2013-03-21/pdf/2013-06712.pdf
6 https://www.govinfo.gov/content/pkg/FR-2012-12-28/pdf/2012-31225.pdf
7 https://www.govinfo.gov/content/pkg/FR-2021-01-25/pdf/2021-01712.pdf
                   type         subtype publication_date signing_date
1 Presidential Document Executive Order       2013-12-31   2013-12-23
2 Presidential Document Executive Order       2012-12-31   2012-12-21
3 Presidential Document Executive Order       2013-01-03   2012-12-27
4 Presidential Document Executive Order       2013-10-04   2013-09-30
5 Presidential Document Executive Order       2013-03-21   2013-03-15
6 Presidential Document Executive Order       2012-12-28   2012-12-21
7 Presidential Document Executive Order       2021-01-25   2021-01-19
  start_page
1      80451
2      77249
3        649
4      61817
5      17589
6      76339
7       6833
                                                                                                 title
1                                                                  Adjustments of Certain Rates of Pay
2                                                               Reestablishment of Advisory Commission
3                                                                  Adjustments of Certain Rates of Pay
4                                                   Continuance Of Certain Federal Advisory Committees
5                                                                  Amendments to Executive Order 12777
6 Closing of Executive Departments and Agencies of the Federal Government on Monday, December 24, 2012
7                                                          Care of Veterans With Service in Uzbekistan
                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      disposition_notes
1                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Supersedes: EO 13641, April 5, 2013; EO 13686, December 19, 2014
2                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Continued by: EO 13652, September 30, 2013;\n See: EO 13555, October 19, 2010
3                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Supersedes: EO 13594, December 19, 2011;\n Superseded by EO 13641, April 5, 2013
4 Amends: EO 13043, April 16, 1997; EO 13231, October 16, 2001; EO 13515, October 14, 2009; EO 13538, April 19, 2010; EO 13600, February 9, 2012;\n Supersedes in part: EO 13585, September 30, 2011; EO 13591, November 23, 2011;  EO 13708, September 30, 2015\n Continues: EO 11145, March 7, 1964; EO 11183, October 3, 1964; EO 11287, June 28, 1966; EO 11612, July 26, 1971; EO 12131, May 4, 1979; EO 12216, June 19, 1980; EO 12367, June 15, 1982; EO 12382, September 13, 1982; EO 12829, January 6, 1993; EO 12905, March 25, 1994; EO 12994, March 21, 1996; EO 13231, October 16, 2001; EO 13265, June 6, 2002; EO 13515, October 14, 2009; EO 13521, November 24, 2009; EO 13522, December 9, 2009; EO 13532, February 26, 2010; EO 13538, April 19, 2010; EO 13539, April 21, 2010; EO 13540, April 26, 2010; EO 13549, August 18, 2010; EO 13600, February 9, 2012; EO 13621, July 26, 2012; EO 13631, December 7, 2012; EO 13634, December 21, 2012; EO 13640, January 5, 2013;\n ee: EO 13498, February 5, 2009; EO 13544, June 10, 2010; EO 13555, October 19, 2010
5                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <NA>
6                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <NA>
7                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <NA>
  executive_order_number not_received_for_publication month.x day.x year.x
1                  13655                           NA      12    31   2013
2                  13634                           NA      12    31   2012
3                  13635                           NA       1     3   2013
4                  13652                           NA      10     4   2013
5                  13638                           NA       3    21   2013
6                  13633                           NA      12    28   2012
7                  13982                           NA       1    25   2021
                                                                  full_text_xml_url
1 https://www.federalregister.gov/documents/full_text/xml/2013/12/31/2013-31445.xml
2 https://www.federalregister.gov/documents/full_text/xml/2012/12/31/2012-31574.xml
3 https://www.federalregister.gov/documents/full_text/xml/2013/01/03/2013-00002.xml
4 https://www.federalregister.gov/documents/full_text/xml/2013/10/04/2013-24388.xml
5 https://www.federalregister.gov/documents/full_text/xml/2013/03/21/2013-06712.xml
6 https://www.federalregister.gov/documents/full_text/xml/2012/12/28/2012-31225.xml
7 https://www.federalregister.gov/documents/full_text/xml/2021/01/25/2021-01712.xml
                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            text
1                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Executive Order 13655 of December 23, 2013Adjustments of Certain Rates of PayBy the authority vested in me as President by the Constitution and the laws of the United States of America, it is hereby ordered as follows:Section 1\n                    . \n                    Statutory Pay Systems.\n                     The rates of basic pay or salaries of the statutory pay systems (as defined in 5 U.S.C. 5302(1)), as adjusted under 5 U.S.C. 5303, are set forth on the schedules attached hereto and made a part hereof:\n                (a) The General Schedule (5 U.S.C. 5332(a)) at Schedule 1;(b) The Foreign Service Schedule (22 U.S.C. 3963) at Schedule 2; and(c) The schedules for the Veterans Health Administration of the Department of Veterans Affairs (38 U.S.C. 7306, 7404; section 301(a) of Public Law 102-40) at Schedule 3.Sec. 2\n                    . \n                    Senior Executive Service.\n                     The ranges of rates of basic pay for senior executives in the Senior Executive Service, as established pursuant to 5 U.S.C. 5382, are set forth on Schedule 4 attached hereto and made a part hereof.\n                Sec. 3\n                    . \n                    Certain Executive, Legislative, and Judicial Salaries.\n                     The rates of basic pay or salaries for the following offices and positions are set forth on the schedules attached hereto and made a part hereof:\n                (a) The Executive Schedule (5 U.S.C. 5312-5318) at Schedule 5;(b) The Vice President (3 U.S.C. 104) and the Congress (2 U.S.C. 31) at Schedule 6; and(c) Justices and judges (28 U.S.C. 5, 44(d), 135, 252, and 461(a)) at Schedule 7.Sec. 4\n                    . \n                    Uniformed Services.\n                     The rates of monthly basic pay (37 U.S.C. 203(a)) for members of the uniformed services, as adjusted under 37 U.S.C. 1009, and the rate of monthly cadet or midshipman pay (37 U.S.C. 203(c)) are set forth on Schedule 8 attached hereto and made a part hereof.\n                Sec. 5\n                    . \n                    Locality-Based Comparability Payments.\n                     (a) Pursuant to section 5304 of title 5, United States Code, and my authority to implement an alternative level of comparability payments under section 5304a of title 5, United States Code, locality-based comparability payments shall be paid in accordance with Schedule 9 attached hereto and made a part hereof.\n                \n                    (b) The Director of the Office of Personnel Management shall take such actions as may be necessary to implement these payments and to publish appropriate notice of such payments in the \n                    Federal Register.\n                Sec. 6\n                    . \n                    Administrative Law Judges.\n                     Pursuant to section 5372 of title 5, United States Code, the rates of basic pay for administrative law judges are set forth on Schedule 10 attached hereto and made a part hereof.\n                Sec. 7\n                    . \n                    Effective Dates.\n                     Schedule 8 is effective January 1, 2014. The other schedules contained herein are effective on the first day of the first applicable pay period beginning on or after January 1, 2014.\n                Sec. 8\n                    . \n                    Prior Order Superseded.\n                     Executive Order 13641 of April 5, 2013, is superseded as of the effective dates specified in section 7 of this order.\n                OB#1.EPS THE WHITE HOUSE,December 23, 2013.Billing code 3295-F2-PED31DE13.195ED31DE13.196ED31DE13.197ED31DE13.198ED31DE13.199ED31DE13.200ED31DE13.201ED31DE13.202ED31DE13.203ED31DE13.204[FR Doc. 2013-31445Filed 12-30-13; 11:15 a.m.]Billing code 6325-01-C
2                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Title 3—\n                        The President\n                        \n                    Executive Order 13634 of December 21, 2012Reestablishment of Advisory CommissionBy the authority vested in me as President by the Constitution and the laws of the United States of America, it is hereby ordered as follows:Section 1\n                        . \n                        Reestablishing the President's Advisory Commission on Educational Excellence for Hispanics.\n                         The President's Advisory Commission on Educational Excellence for Hispanics (Commission), as set forth under the provisions of Executive Order 13555 of October 19, 2010, is hereby reestablished and shall terminate on September 30, 2013, unless extended by the President. The same members who were serving on the Commission on October 19, 2012, are hereby reappointed to the Commission as reestablished by this order, as if the Commission had continued without termination through the date of this Executive Order.\n                    Sec. 2\n                        . \n                        General Provisions.\n                         (a) Nothing in this order shall be construed to impair or otherwise affect:\n                    (1) the authority granted by law to an executive department, agency, or the head thereof; or(2) the functions of the Director of the Office of Management and Budget relating to budgetary, administrative, or legislative proposals.(b) This order is not intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity by any party against the United States, its departments, agencies, or entities, its officers, employees, or agents, or any other person.OB#1.EPS  THE WHITE HOUSE, Washington, December 21, 2012.[FR Doc. 2012-31574Filed 12-28-12; 11:15 am]Billing code 3295-F3
3                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Executive Order 13635 of December 27, 2012Adjustments of Certain Rates of PayBy the authority vested in me as President by the Constitution and the laws of the United States of America, including section 114(b) of the Continuing Appropriations Resolution, 2013 (Public Law 112-175), which provides that any statutory adjustments to current levels in certain pay schedules for civilian Federal employees may take effect on the first day of the first applicable pay period beginning after the date specified in section 106(3) of Public Law 112-175, it is hereby ordered as follows:Section 1\n                    . \n                    Statutory Pay Systems.\n                     The rates of basic pay or salaries of the statutory pay systems (as defined in 5 U.S.C. 5302(1)), as adjusted under 5 U.S.C. 5303, are set forth on the schedules attached hereto and made a part hereof:\n                (a) The General Schedule (5 U.S.C. 5332(a)) at Schedule 1;(b) The Foreign Service Schedule (22 U.S.C. 3963) at Schedule 2; and(c) The schedules for the Veterans Health Administration of the Department of Veterans Affairs (38 U.S.C. 7306, 7404; section 301(a) of Public Law 102-40) at Schedule 3.Sec. 2\n                    . \n                    Senior Executive Service.\n                     The ranges of rates of basic pay for senior executives in the Senior Executive Service, as established pursuant to 5 U.S.C. 5382, are set forth on Schedule 4 attached hereto and made a part hereof.\n                Sec. 3\n                    . \n                    Certain Executive, Legislative, and Judicial Salaries.\n                     The rates of basic pay or salaries for the following offices and positions are set forth on the schedules attached hereto and made a part hereof:\n                (a) The Executive Schedule (5 U.S.C. 5312-5318) at Schedule 5;(b) The Vice President (3 U.S.C. 104) and the Congress (2 U.S.C. 31) at Schedule 6; and(c) Justices and judges (28 U.S.C. 5, 44(d), 135, 252, and 461(a), and section 140 of Public Law 97-92) at Schedule 7.Sec. 4\n                    . \n                    Uniformed Services.\n                     The rates of monthly basic pay (37 U.S.C. 203(a)) for members of the uniformed services, as adjusted under 37 U.S.C. 1009, and the rate of monthly cadet or midshipman pay (37 U.S.C. 203(c)) are set forth on Schedule 8 attached hereto and made a part hereof.\n                Sec. 5\n                    . \n                    Locality-Based Comparability Payments.\n                     (a) Pursuant to section 5304 of title 5, United States Code, and my authority to implement an alternative level of comparability payments under section 5304a of title 5, United States Code, locality-based comparability payments shall be paid in accordance with Schedule 9 attached hereto and made a part hereof.\n                \n                    (b) The Director of the Office of Personnel Management shall take such actions as may be necessary to implement these payments and to publish appropriate notice of such payments in the \n                    Federal Register\n                    .\n                Sec. 6\n                    . \n                    Administrative Law Judges.\n                     Pursuant to section 5372 of title 5, United States Code, the rates of basic pay for administrative law judges are set forth on Schedule 10 attached hereto and made a part hereof.\n                Sec. 7\n                    . \n                    Effective Dates.\n                     Schedule 8 is effective January 1, 2013. The other schedules contained herein are effective on the first day of the first applicable pay period beginning after the date specified in section 106(3) of Public Law 112-175.\n                    \n                Sec. 8\n                    . \n                    Prior Order Superseded.\n                     Executive Order 13594 of December 19, 2011, is superseded as of the effective dates specified in section 7 of this order.\n                OB#1.EPS THE WHITE HOUSE,Washington, December 27, 2012.Billing code 3295-F3-PED03JA13.079ED03JA13.080ED03JA13.081ED03JA13.082ED03JA13.083ED03JA13.084ED03JA13.085ED03JA13.086ED03JA13.087ED03JA13.088[FR Doc. 2013-00002Filed 1-2-13; 11:15 a.m.]Billing code 6325-01-C
4 Executive Order 13652 of September 30, 2013Continuance Of Certain Federal Advisory CommitteesBy the authority vested in me as President, by the Constitution and the laws of the United States of America, and consistent with the provisions of the Federal Advisory Committee Act, as amended (5 U.S.C. App.), it is hereby ordered as follows: Section 1.\n                     Each advisory committee listed below is continued until September 30, 2015.\n                (a) Committee for the Preservation of the White House; Executive Order 11145, as amended (Department of the Interior).(b) President's Commission on White House Fellowships; Executive Order 11183, as amended (Office of Personnel Management).(c) President's Committee on the National Medal of Science; Executive Order 11287, as amended (National Science Foundation).(d) Federal Advisory Council on Occupational Safety and Health; Executive Order 11612, as amended (Department of Labor).(e) President's Export Council; Executive Order 12131, as amended (Department of Commerce).(f) President's Committee on the International Labor Organization; Executive Order 12216, as amended (Department of Labor).(g) President's Committee on the Arts and the Humanities; Executive Order 12367, as amended (National Endowment for the Arts).(h) President's National Security Telecommunications Advisory Committee; Executive Order 12382, as amended (Department of Homeland Security).(i) National Industrial Security Program Policy Advisory Committee; Executive Order 12829, as amended (National Archives and Records Administration).(j) Trade and Environment Policy Advisory Committee; Executive Order 12905, as amended (Office of the United States Trade Representative).(k) President's Committee for People with Intellectual Disabilities; Executive Order 12994, as amended (Department of Health and Human Services).(l) National Infrastructure Advisory Council; Executive Order 13231, as amended (Department of Homeland Security).(m) President's Council on Fitness, Sports, and Nutrition; Executive Order 13265, as amended (Department of Health and Human Services).(n) President's Advisory Council on Faith-Based and Neighborhood Partnerships; Executive Order 13498, re-established by Executive Order 13569, and continued by Executive Order 13640 (Department of Health and Human Services).(o) President's Advisory Commission on Asian Americans and Pacific Islanders; Executive Order 13515, as amended (Department of Education).(p) Presidential Commission for the Study of Bioethical Issues; Executive Order 13521 (Department of Health and Human Services).\n                    (q) National Council on Federal Labor-Management Relations; Executive Order 13522 (Office of Personnel Management).\n                    \n                (r) President's Board of Advisors on Historically Black Colleges and Universities; Executive Order 13532, as amended (Department of Education).(s) President's Management Advisory Board; Executive Order 13538 (General Services Administration).(t) President's Council of Advisors on Science and Technology; Executive Order 13539, as amended (Department of Energy).(u) Interagency Task Force on Veterans Small Business Development; Executive Order 13540 (Small Business Administration).(v) Advisory Group on Prevention, Health Promotion, and Integrative and Public Health; Executive Order 13544, re-established by Executive Order 13631 (Department of Health and Human Services).(w) State, Local, Tribal, and Private Sector (SLTPS) Policy Advisory Committee; Executive Order 13549, as amended (National Archives and Records Administration).(x) President's Advisory Commission on Educational Excellence for Hispanics; Executive Order 13555, re-established by Executive Order 13634 (Department of Education).(y) President's Global Development Council; Executive Order 13600 (United States Agency for International Development).(z) President's Advisory Commission on Educational Excellence for African Americans; Executive Order 13621 (Department of Education).Sec. 2.\n                     Notwithstanding the provisions of any other Executive Order, the functions of the President under the Federal Advisory Committee Act that are applicable to the committees listed in section 1 of this order shall be performed by the head of the department or agency designated after each committee, in accordance with the regulations, guidelines, and procedures established by the Administrator of General Services.\n                Sec. 3.\n                     Sections 1 and 2 of Executive Order 13585 of September 30, 2011, and sections 1, 2, and 4 of Executive Order 13591 of November 23, 2011, are superseded by sections 1 and 2 of this order.\n                Sec. 4.\n                     Executive Order 13538 of April 19, 2010, is amended in section 4(c) by striking “The Executive Director shall serve as the Designated Federal Officer in accordance with the Federal Advisory Committee Act, as amended (5 U.S.C. App.) (FACA)” and inserting in lieu thereof “The PMAB shall also have a Designated Federal Officer (DFO) in accordance with the Federal Advisory Committee Act, as amended (5 U.S.C. App.) (FACA). The Executive Director may serve as the DFO”.\n                Sec. 5.\n                     Executive Order 13043 of April 16, 1997, is amended by striking section 4 and renumbering the subsequent sections appropriately.\n                Sec. 6.\n                     Executive Order 13231 of October 16, 2001, as amended, is further amended by striking section 3, except subsection (c) thereof, and inserting immediately preceding subsection (c), the following:\n                \n                    “\n                    Sec. 3.\n                      \n                    The National Infrastructure Advisory Council.\n                     The National Infrastructure Advisory Council (NIAC), established on October 16, 2001, shall provide the President, through the Secretary of Homeland Security, with advice on the security and resilience of the critical infrastructure sectors and their functional systems, physical assets, and cyber networks.\n                \n                    “(a) \n                    Membership.\n                     The NIAC shall be composed of not more than 30 members appointed by the President, taking appropriate account of the benefits of having members:\n                \n                    “(i) from the private sector, including individuals with experience in banking and finance, transportation, energy, water, communications, health care services, food and agriculture, government facilities, emergency services organizations, institutions of higher education, environmental and climate resilience, and State, local, and tribal governments;\n                    \n                “(ii) with senior executive leadership responsibilities for the availability and reliability, including security and resilience, of critical infrastructure sectors;“(iii) with expertise relevant to the functions of the NIAC; and“(iv) with experience equivalent to that of a chief executive of an organization.“Unless otherwise determined by the President, no full-time officer or employee of the executive branch shall be appointed to serve as a member of the NIAC. The President shall designate from among the members of the NIAC a Chair and a Vice Chair, who shall perform the functions of the Chair if the Chair is absent or disabled, or in the instance of a vacancy in the Chair.\n                    “(b) \n                    Functions of the NIAC.\n                     The NIAC shall meet periodically to:\n                “(i) enhance the partnership of the public and private sectors in securing and enhancing the security and resilience of critical infrastructure and their supporting functional systems, physical assets, and cyber networks, and provide reports on this issue to the President, through the Secretary of Homeland Security, as appropriate;“(ii) propose and develop ways to encourage private industry to perform periodic risk assessments and implement risk-reduction programs;“(iii) monitor the development and operations of critical infrastructure sector coordinating councils and their information-sharing mechanisms and provide recommendations to the President, through the Secretary of Homeland Security, on how these organizations can best foster improved cooperation among the sectors, the Department of Homeland Security, and other Federal Government entities;“(iv) report to the President through the Secretary of Homeland Security, who shall ensure appropriate coordination with the Assistant to the President for Homeland Security and Counterterrorism, the Assistant to the President for Economic Policy, and the Assistant to the President for National Security Affairs under the terms of this order; and“(v) advise sector-specific agencies with critical infrastructure responsibilities to include issues pertaining to sector and government coordinating councils and their information sharing mechanisms.“In implementing this order, the NIAC shall not advise or otherwise act on matters pertaining to National Security and Emergency Preparedness (NS/EP) Communications and, with respect to any matters to which the NIAC is authorized by this order to provide advice or otherwise act on that may depend on or affect NS/EP Communications, shall coordinate with the National Security and Telecommunications Advisory Committee established by Executive Order 12382 of September 13, 1982, as amended.”.Sec. 7.\n                     Executive Order 13600 of February 9, 2012, is amended in section 3(b) by striking the “and” immediately preceding “the Chief Executive Officer of the Millennium Challenge Corporation” and by adding “, the United States Trade Representative, and the Chief Executive Officer of the Overseas Private Investment Corporation” immediately preceding “shall serve as non-voting members”. Executive Order 13600 is further amended in section 5(c) by adding “administrative” immediately preceding “matters and activities pertaining”.\n                Sec. 8.\n                     Section 3(b) of Executive Order 13515 of October 14, 2009, as amended, is further amended by inserting in the list of agency members “the General Services Administration” and “the National Aeronautics and Space Administration” after “the Small Business Administration”, and redesignating the subsections of section 3(b) as appropriate. Subsection 3(b) is further amended by inserting at the end the following sentence:\n                “The Initiative is encouraged to invite other affected agencies, such as the Consumer Financial Protection Bureau, the Corporation for National and Community Service, the Equal Employment Opportunity Commission, and the Federal Communications Commission to attend meetings and participate in the Initiative as appropriate.”.Sec. 9.\n                     This order shall be effective September 30, 2013.\n                OB#1.EPS THE WHITE HOUSE,September 30, 2013.[FR Doc. 2013-24388Filed 10-3-13; 8:45 am]Billing code 3295-F4
5                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Title 3—\n                        The President\n                        \n                    Executive Order 13638 of March 15, 2013Amendments to Executive Order 12777By the authority vested in me as President by the Constitution and the laws of the United States of America, it is hereby ordered as follows:Section 1\n                        . Section 4 of Executive Order 12777 of October 18, 1991, as amended (Implementation of Section 311 of the Federal Water Pollution Control Act of October 18, 1972, as Amended, and the Oil Pollution Act of 1990) is further amended by striking section 4 in its entirety and inserting in lieu thereof the following:\n                    \n                        “\n                        Sec. 4\n                        . \n                        Liability Limit Adjustment.\n                         (a)(1) The following functions vested in the President by section 1004(d) of OPA are delegated to the Secretary of the department in which the Coast Guard is operating, acting in consultation with the Administrator, the Secretary of Transportation, the Secretary of the Interior, and the Attorney General:\n                    (A) the adjustment of the limits of liability listed in section 1004(a) of OPA for vessels, onshore facilities, and deepwater ports subject to the DPA, to reflect significant increases in the Consumer Price Index;(B) the establishment of limits of liability under section 1004(d)(1), with respect to classes or categories of marine transportation-related onshore facilities, and the adjustment of any such limits of liability established under section 1004(d)(1), and of any limits of liability established under section 1004(d)(2) with respect to deepwater ports subject to the DPA, to reflect significant increases in the Consumer Price Index; and(C) the reporting to Congress on the desirability of adjusting limits of liability, with respect to vessels, marine transportation-related onshore facilities, and deepwater ports subject to the DPA.(2) The Administrator and the Secretary of Transportation will provide necessary regulatory analysis support to ensure timely regulatory Consumer Price Index adjustments by the Secretary of the department in which the Coast Guard is operating of the limits of liability listed in section 1004(a) of OPA for onshore facilities under subparagraph (a)(1)(A) of this section.(b) The following functions vested in the President by section 1004(d) of OPA are delegated to the Administrator, acting in consultation with the Secretary of the department in which the Coast Guard is operating, the Secretary of Transportation, the Secretary of the Interior, the Secretary of Energy, and the Attorney General:(1) the establishment of limits of liability under section 1004(d)(1), with respect to classes or categories of non-transportation-related onshore facilities, and the adjustment of any such limits of liability established under section 1004(d)(1) by the Administrator to reflect significant increases in the Consumer Price Index; and(2) the reporting to Congress on the desirability of adjusting limits of liability with respect to non-transportation-related onshore facilities.(c) The following functions vested in the President by section 1004(d) of OPA are delegated to the Secretary of Transportation, acting in consultation with the Secretary of the department in which the Coast Guard is operating, the Administrator, the Secretary of the Interior, and the Attorney General:\n                        (1) the establishment of limits of liability under section 1004(d)(1), with respect to classes or categories of non-marine transportation-related onshore \n                        \n                        facilities, and the adjustment of any such limits of liability established under section 1004(d)(1) by the Secretary of Transportation to reflect significant increases in the Consumer Price Index; and\n                    (2) the reporting to Congress on the desirability of adjusting limits of liability, with respect to non-marine transportation-related onshore facilities.(d) The following functions vested in the President by section 1004(d) of OPA are delegated to the Secretary of the Interior, acting in consultation with the Secretary of the department in which the Coast Guard is operating, the Administrator, the Secretary of Transportation, and the Attorney General:(1) the adjustment of limits of liability to reflect significant increases in the Consumer Price Index with respect to offshore facilities, including associated pipelines, other than deepwater ports subject to the DPA; and(2) the reporting to Congress on the desirability of adjusting limits of liability with respect to offshore facilities, including associated pipelines, other than deepwater ports subject to the DPA.”Sec. 2\n                        . (a) Nothing in this order shall be construed to impair or otherwise affect:\n                    (i) the authority granted by law to an executive department, agency, or the head thereof; or(ii) the functions of the Director of the Office of Management and Budget relating to budgetary, administrative, or legislative proposals.(b) This order is not intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity by any party against the United States, its departments, agencies, or entities, its officers, employees, or agents, or any other person.OB#1.EPS THE WHITE HOUSE,March 15, 2013.[FR Doc. 2013-06712Filed 3-20-13; 11:15 am]Billing code 3295-F3
6                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Title 3—The President\n        Executive Order 13633 of December 21, 2012Closing of Executive Departments and Agencies of the Federal Government on Monday, December 24, 2012By the authority vested in me as President by the Constitution and the laws of the United States of America, it is hereby ordered as follows:Section 1. All executive branch departments and agencies of the Federal Government shall be closed and their employees excused from duty on Monday, December 24, 2012, the day before Christmas Day, except as provided in section 2 of this order.Sec. 2. The heads of executive branch departments and agencies may determine that certain offices and installations of their organizations, or parts thereof, must remain open and that certain employees must report for duty on December 24, 2012, for reasons of national security, defense, or other public need.Sec. 3. Monday, December 24, 2012, shall be considered as falling within the scope of Executive Order 11582 of February 11, 1971, and of 5 U.S.C. 5546 and 6103(b) and other similar statutes insofar as they relate to the pay and leave of employees of the United States.Sec. 4. The Director of the Office of Personnel Management shall take such actions as may be necessary to implement this order.Sec. 5. General Provisions. (a) This order shall be implemented consistent with applicable law and subject to the availability of appropriations.(b) Nothing in this order shall be construed to impair or otherwise affect:(i) the authority granted by law to an executive department or agency, or the head thereof; or(ii) the functions of the Director of the Office of Management and Budget relating to budgetary, administrative, or legislative proposals.(c) This order is not intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity by any party against the United States, its departments, agencies, or entities, its officers, employees, or agents, or any other person.OB#1.EPS  THE WHITE HOUSE, Washington, December 21, 2012.[FR Doc. 2012-31225Filed 12-21-12; 4:15 pm]Billing code 3295-F3
7                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Executive Order 13982 of January 19, 2021Care of Veterans With Service in UzbekistanBy the authority vested in me as President by the Constitution and the laws of the United States of America, it is hereby ordered as follows:Section 1\n                    . The Secretary of Veterans Affairs, in consultation with the Secretary of Defense, shall consider whether to designate veterans who served on active duty in Uzbekistan between October 1, 2001, and December 31, 2005, as veterans who served on active duty in a theater of combat operations pursuant to section 1710(e)(1)(D) of title 38, United States Code.\n                Sec. 2\n                    . Within 365 days of the date of this order, the Secretary of Defense shall conduct a rigorous study investigating toxic exposure by members of the Armed Forces deployed to the Karshi-Khanabad Air Base, Uzbekistan (Air Base), between October 1, 2001, and December 31, 2005. The Secretary of Defense shall submit a report summarizing the findings of the study to the President, through the Secretary of Veterans Affairs. The study shall include the following elements:\n                (a) A detailed assessment of the conditions at the Air Base between October 1, 2001, and December 31, 2005, including identification of any toxic substances contaminating the Air Base during such period, the exact locations of the toxic substances, the time frames of exposure to the toxic substances, the service members exposed to the toxic substances, and the circumstances of such exposure.(b) A rigorous epidemiological study of any health consequences for members of the Armed Forces deployed to the Air Base between October 1, 2001, and December 31, 2005. This study shall be of equivalent rigor to studies used by the Department of Veterans Affairs to make determinations regarding diseases subject to presumptive service connections.(c) An assessment of any causal link between exposure to any toxic substances identified in subsection (a) of this section and any health consequences studied under subsection (b) of this section.Sec. 3\n                    . \n                    General Provisions.\n                     (a) Nothing in this order shall be construed to impair or otherwise affect:\n                (i) the authority granted by law to an executive department or agency, or the head thereof; or(ii) the functions of the Director of the Office of Management and Budget related to budgetary, administrative, or legislative proposals.(b) This order shall be implemented in a manner consistent with applicable law and subject to the availability of appropriations.(c) This order is not intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity by any party against the United States, its departments, agencies, or entities, its officers, employees, or agents, or any other person.Trump.EPS THE WHITE HOUSE,January 19, 2021.[FR Doc. 2021-01712 Filed 1-22-21; 8:45 am]Billing code 3295-F1-P
  full_text_html_url   id president pres_party beg_term end_term signed_date
1               <NA> 4129     OBAMA        100        0        0    20131223
2               <NA>   NA      <NA>         NA       NA       NA        <NA>
3               <NA>   NA      <NA>         NA       NA       NA        <NA>
4               <NA> 4126     OBAMA        100        0        0    20130930
5               <NA> 4112     OBAMA        100        0        0    20130315
6               <NA>   NA      <NA>         NA       NA       NA        <NA>
7               <NA> 4459     TRUMP        200        0        1     1/19/21
  year.y month.y day.y congress divided commemorative
1   2013      12    23      113       1             0
2     NA    <NA>  <NA>       NA      NA            NA
3     NA    <NA>  <NA>       NA      NA            NA
4   2013       9    30      113       1             0
5   2013       3    15      113       1             0
6     NA    <NA>  <NA>       NA      NA            NA
7   2021       1    19      117       1             0
                                       description.x pap_majortopic
1                Adjustments of Certain Rates of Pay              2
2                                               <NA>             NA
3                                               <NA>             NA
4 Continuance of Certain Federal Advisory Committees              2
5                Amendments to Executive Order 12777              7
6                                               <NA>             NA
7        Care of Veterans With Service in Uzbekistan             16
  pap_subtopic majortopic subtopic majortopic_title subtopic_title
1         2004          2     2004             <NA>           <NA>
2           NA         NA       NA             <NA>           <NA>
3           NA         NA       NA             <NA>           <NA>
4         2011          2     2011             <NA>           <NA>
5          710          7      710             <NA>           <NA>
6           NA         NA       NA             <NA>           <NA>
7         1609         16     1609             <NA>           <NA>
  description.y cap_notes racial
1          <NA>      <NA>   <NA>
2          <NA>      <NA>   <NA>
3          <NA>      <NA>   <NA>
4          <NA>      <NA>   <NA>
5          <NA>      <NA>   <NA>
6          <NA>      <NA>   <NA>
7          <NA>      <NA>   <NA>
merged_df_all <- merged_df_all %>%
  mutate(president = case_when(
    signing_date >= as.Date("2001-01-20") & signing_date < as.Date("2009-01-20") ~ "Bush",
    signing_date >= as.Date("2009-01-20") & signing_date < as.Date("2017-01-20") ~ "Obama",
    signing_date >= as.Date("2017-01-20") & signing_date < as.Date("2021-01-20") ~ "Trump",
    TRUE ~ "Unknown" # Handle dates outside of these ranges if necessary
  ))

Pre-processing

for (i in 1:nrow(merged_df_all)) {merged_df_all$text[i] <- sub(merged_df_all$title[i],"",merged_df_all$text[i])}
glimpse(merged_df_all)
Rows: 788
Columns: 43
$ ...1                         <dbl> 329, 330, 331, 332, 333, 334, 335, 336, 3…
$ citation                     <chr> "67 FR 39841", "67 FR 22337", "66 FR 8497…
$ document_number              <chr> "02-14807", "02-11166", "01-2851", "04-11…
$ end_page                     <dbl> 39842, 22338, 8498, 29844, 26981, 55256, …
$ html_url                     <chr> "https://www.federalregister.gov/document…
$ pdf_url                      <chr> "https://www.govinfo.gov/content/pkg/FR-2…
$ type                         <chr> "Presidential Document", "Presidential Do…
$ subtype                      <chr> "Executive Order", "Executive Order", "Ex…
$ publication_date             <date> 2002-06-11, 2002-05-03, 2001-01-31, 2004…
$ signing_date                 <date> 2002-06-06, 2002-04-29, 2001-01-29, 2004…
$ start_page                   <dbl> 39841, 22337, 8497, 29843, 26981, 55255, …
$ title                        <chr> "President's Council on Physical Fitness …
$ disposition_notes            <chr> "Amended by: EO 13316, September 17, 2003…
$ executive_order_number       <chr> "13265", "13263", "13198", "13341", "1330…
$ not_received_for_publication <lgl> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, N…
$ month.x                      <chr> "6", "5", "1", "5", "5", "9", "7", "8", "…
$ day.x                        <chr> "11", "3", "31", "25", "19", "23", "30", …
$ year.x                       <dbl> 2002, 2002, 2001, 2004, 2003, 2003, 2003,…
$ full_text_xml_url            <chr> "https://www.federalregister.gov/document…
$ text                         <chr> "Title 3—\n                    The Presid…
$ full_text_html_url           <chr> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, N…
$ id                           <dbl> 3742, 3740, 3675, 3818, 3778, 3793, 3787,…
$ president                    <chr> "Bush", "Bush", "Bush", "Bush", "Bush", "…
$ pres_party                   <dbl> 200, 200, 200, 200, 200, 200, 200, 200, 2…
$ beg_term                     <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
$ end_term                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
$ signed_date                  <chr> "20020606", "20020429", "20010129", "2004…
$ year.y                       <dbl> 2002, 2002, 2001, 2004, 2003, 2003, 2003,…
$ month.y                      <chr> "6", "4", "1", "5", "5", "9", "7", "7", "…
$ day.y                        <chr> "6", "29", "29", "20", "14", "17", "28", …
$ congress                     <dbl> 107, 107, 107, 108, 108, 108, 108, 108, 1…
$ divided                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
$ commemorative                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
$ description.x                <chr> "President's Council on Physical Fitness …
$ pap_majortopic               <dbl> 15, 3, 13, 17, 16, 20, 19, 19, 20, 19, 10…
$ pap_subtopic                 <dbl> 1526, 333, 1305, 1708, 1603, 2002, 1921, …
$ majortopic                   <dbl> 15, 3, 13, 17, 16, 20, 19, 19, 20, 19, 10…
$ subtopic                     <dbl> 1526, 333, 1305, 1708, 1603, 2002, 1921, …
$ majortopic_title             <chr> "domestic commerce", "health", "social we…
$ subtopic_title               <chr> "sports regulation", "mental health", "vo…
$ description.y                <chr> "Includes issues related to the regulatio…
$ cap_notes                    <chr> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, N…
$ racial                       <chr> "No", "No", "No", "No", "No", "No", "No",…
summary(merged_df_all)
      ...1          citation         document_number       end_page    
 Min.   : 329.0   Length:788         Length:788         Min.   :    3  
 1st Qu.: 525.8   Class :character   Class :character   1st Qu.:14472  
 Median :4967.5   Mode  :character   Mode  :character   Median :33970  
 Mean   :3759.2                                         Mean   :36411  
 3rd Qu.:6451.2                                         3rd Qu.:56271  
 Max.   :6648.0                                         Max.   :97110  
                                                                       
   html_url           pdf_url              type             subtype         
 Length:788         Length:788         Length:788         Length:788        
 Class :character   Class :character   Class :character   Class :character  
 Mode  :character   Mode  :character   Mode  :character   Mode  :character  
                                                                            
                                                                            
                                                                            
                                                                            
 publication_date      signing_date          start_page       title          
 Min.   :2001-01-31   Min.   :2001-01-29   Min.   :    1   Length:788        
 1st Qu.:2006-01-13   1st Qu.:2006-01-07   1st Qu.:14470   Class :character  
 Median :2011-11-26   Median :2011-11-21   Median :33964   Mode  :character  
 Mean   :2011-09-13   Mean   :2011-09-09   Mean   :36408                     
 3rd Qu.:2017-04-09   3rd Qu.:2017-04-04   3rd Qu.:56253                     
 Max.   :2021-01-25   Max.   :2021-01-19   Max.   :97099                     
                                                                             
 disposition_notes  executive_order_number not_received_for_publication
 Length:788         Length:788             Mode:logical                
 Class :character   Class :character       NA's:788                    
 Mode  :character   Mode  :character                                   
                                                                       
                                                                       
                                                                       
                                                                       
   month.x             day.x               year.x     full_text_xml_url 
 Length:788         Length:788         Min.   :2001   Length:788        
 Class :character   Class :character   1st Qu.:2006   Class :character  
 Mode  :character   Mode  :character   Median :2011   Mode  :character  
                                       Mean   :2011                     
                                       3rd Qu.:2017                     
                                       Max.   :2021                     
                                                                        
     text           full_text_html_url       id        president        
 Length:788         Length:788         Min.   :3675   Length:788        
 Class :character   Class :character   1st Qu.:3871   Class :character  
 Mode  :character   Mode  :character   Median :4066   Mode  :character  
                                       Mean   :4067                     
                                       3rd Qu.:4263                     
                                       Max.   :4459                     
                                       NA's   :3                        
   pres_party       beg_term         end_term      signed_date       
 Min.   :100.0   Min.   :0.0000   Min.   :0.0000   Length:788        
 1st Qu.:100.0   1st Qu.:0.0000   1st Qu.:0.0000   Class :character  
 Median :200.0   Median :0.0000   Median :0.0000   Mode  :character  
 Mean   :165.1   Mean   :0.1083   Mean   :0.1809                     
 3rd Qu.:200.0   3rd Qu.:0.0000   3rd Qu.:0.0000                     
 Max.   :200.0   Max.   :1.0000   Max.   :1.0000                     
 NA's   :3       NA's   :3        NA's   :3                          
     year.y       month.y             day.y              congress    
 Min.   :2001   Length:788         Length:788         Min.   :107.0  
 1st Qu.:2005   Class :character   Class :character   1st Qu.:109.0  
 Median :2011   Mode  :character   Mode  :character   Median :112.0  
 Mean   :2011                                         Mean   :111.9  
 3rd Qu.:2017                                         3rd Qu.:115.0  
 Max.   :2021                                         Max.   :117.0  
 NA's   :3                                            NA's   :3      
    divided       commemorative     description.x      pap_majortopic 
 Min.   :0.0000   Min.   :0.00000   Length:788         Min.   : 1.00  
 1st Qu.:0.0000   1st Qu.:0.00000   Class :character   1st Qu.:10.00  
 Median :1.0000   Median :0.00000   Mode  :character   Median :16.00  
 Mean   :0.5465   Mean   :0.01401                      Mean   :14.24  
 3rd Qu.:1.0000   3rd Qu.:0.00000                      3rd Qu.:19.00  
 Max.   :1.0000   Max.   :1.00000                      Max.   :21.00  
 NA's   :3        NA's   :3                            NA's   :3      
  pap_subtopic    majortopic       subtopic    majortopic_title  
 Min.   : 100   Min.   : 1.00   Min.   : 100   Length:788        
 1st Qu.:1005   1st Qu.:10.00   1st Qu.:1005   Class :character  
 Median :1615   Median :16.00   Median :1615   Mode  :character  
 Mean   :1441   Mean   :14.24   Mean   :1441                     
 3rd Qu.:1926   3rd Qu.:19.00   3rd Qu.:1926                     
 Max.   :2105   Max.   :21.00   Max.   :2105                     
 NA's   :3      NA's   :3       NA's   :3                        
 subtopic_title     description.y       cap_notes            racial         
 Length:788         Length:788         Length:788         Length:788        
 Class :character   Class :character   Class :character   Class :character  
 Mode  :character   Mode  :character   Mode  :character   Mode  :character  
                                                                            
                                                                            
                                                                            
                                                                            
colSums(is.na(merged_df_all))
                        ...1                     citation 
                           0                            0 
             document_number                     end_page 
                           0                            0 
                    html_url                      pdf_url 
                           0                            0 
                        type                      subtype 
                           0                            0 
            publication_date                 signing_date 
                           0                            0 
                  start_page                        title 
                           0                            0 
           disposition_notes       executive_order_number 
                         203                            0 
not_received_for_publication                      month.x 
                         788                            0 
                       day.x                       year.x 
                           0                            0 
           full_text_xml_url                         text 
                           0                            1 
          full_text_html_url                           id 
                         788                            3 
                   president                   pres_party 
                           0                            3 
                    beg_term                     end_term 
                           3                            3 
                 signed_date                       year.y 
                           3                            3 
                     month.y                        day.y 
                           3                            3 
                    congress                      divided 
                           3                            3 
               commemorative                description.x 
                           3                            3 
              pap_majortopic                 pap_subtopic 
                           3                            3 
                  majortopic                     subtopic 
                           3                            3 
            majortopic_title               subtopic_title 
                           7                            7 
               description.y                    cap_notes 
                           7                          784 
                      racial 
                           7 
pres <- c("bush","george bush","george w. bush","GWBOLD", "OB#1","Obama", "barack Obama","trump","donald trump", "donald j. trump","biden", "joe biden", "JOSEPH R. BIDEN JR.", "(Presidential Sig.)")
pres <- str_c(pres, collapse = "|")
merged_df_all$text <- sub(".*?Executive Order", "", merged_df_all$text)

merged_df_all$text <- sub(".*?of the United States of America", "", merged_df_all$text)

merged_df_all$text <- sub("it is hereby ordered as follows", "", merged_df_all$text)

merged_df_all$text <-gsub("\n", "", merged_df_all$text)

merged_df_all$text<- str_remove_all(merged_df_all$text, regex("(?i)sec(tion)?\\.?\\s*\\d+", ignore_case = TRUE))

merged_df_all$text<- str_remove_all(merged_df_all$text, regex(pres, ignore_case = TRUE))

merged_df_all$text <- sub("BTHE WHITE HOUSE.*", "", merged_df_all$text, ignore.case = FALSE)
merged_df_all$text <- sub("\\.EPS.*", "", merged_df_all$text)
data_eo_text <- data.frame(merged_df_all$text)
colSums(is.na(data_eo_text))
merged_df_all.text 
                 1 
set.seed(123)
sampled_data <- merged_df_all %>%
  group_by(president) %>%
  sample_n(10)
sampled_data
# A tibble: 30 × 43
# Groups:   president [3]
    ...1 citation    document_number end_page html_url     pdf_url type  subtype
   <dbl> <chr>       <chr>              <dbl> <chr>        <chr>   <chr> <chr>  
 1   507 72 FR 3919  07-374              3923 https://www… https:… Pres… Execut…
 2   342 69 FR 241   03-32332             241 https://www… https:… Pres… Execut…
 3   523 66 FR 28355 01-13116           28356 https://www… https:… Pres… Execut…
 4   446 71 FR 20519 06-3865            20521 https://www… https:… Pres… Execut…
 5   557 70 FR 2323  05-771              2324 https://www… https:… Pres… Execut…
 6   572 71 FR 77565 06-9895            77567 https://www… https:… Pres… Execut…
 7   618 72 FR 64519 07-5726            64522 https://www… https:… Pres… Execut…
 8   481 66 FR 10183 01-3883            10183 https://www… https:… Pres… Execut…
 9   418 67 FR 42467 02-16040           42468 https://www… https:… Pres… Execut…
10   419 67 FR 42469 02-16041           42470 https://www… https:… Pres… Execut…
# ℹ 20 more rows
# ℹ 35 more variables: publication_date <date>, signing_date <date>,
#   start_page <dbl>, title <chr>, disposition_notes <chr>,
#   executive_order_number <chr>, not_received_for_publication <lgl>,
#   month.x <chr>, day.x <chr>, year.x <dbl>, full_text_xml_url <chr>,
#   text <chr>, full_text_html_url <chr>, id <dbl>, president <chr>,
#   pres_party <dbl>, beg_term <dbl>, end_term <dbl>, signed_date <chr>, …
sampled_data$executive_order_number [1]
[1] "13423"
cat(strwrap(sampled_data$text[1], width = 120), sep = "\n")
, and to strengthen the environmental, energy, and transportation management of Federal agencies, : .Policy . It is the
policy of the United States that Federal agencies conduct their environmental, transportation, and energy-related
activities under the law in support of their respective missions in an environmentally, economically and fiscally
sound, integrated, continuously improving, efficient, and sustainable manner.  .Goals for Agencies . In implementing
the policy set forth in of this order, the head of each agency shall: (a) improve energy efficiency and reduce
greenhouse gas emissions of the agency, through reduction of energy intensity by (i) 3 percent annually through the end
of fiscal year 2015, or (ii) 30 percent by the end of fiscal year 2015, relative to the baseline of the agency's energy
use in fiscal year 2003; (b) ensure that (i) at least half of the statutorily required renewable energy consumed by the
agency in a fiscal year comes from new renewable sources, and (ii) to the extent feasible, the agency implements
renewable energy generation projects on agency property for agency use; (c) beginning in FY 2008, reduce water
consumption intensity, relative to the baseline of the agency's water consumption in fiscal year 2007, through
life-cycle cost-effective measures by 2 percent annually through the end of fiscal year 2015 or 16 percent by the end
of fiscal year 2015; (d) require in agency acquisitions of goods and services (i) use of sustainable environmental
practices, including acquisition of biobased, environmentally preferable, energy-efficient, water-efficient, and
recycled-content products, and (ii) use of paper of at least 30 percent post-consumer fiber content; (e) ensure that
the agency (i) reduces the quantity of toxic and hazardous chemicals and materials acquired, used, or disposed of by
the agency, (ii) increases diversion of solid waste as appropriate, and (iii) maintains cost-effective waste prevention
and recycling programs in its facilities; (f) ensure that (i) new construction and major renovation of agency buildings
comply with the Guiding Principles for Federal Leadership in High Performance and Sustainable Buildings set forth in
the Federal Leadership in High Performance and Sustainable Buildings Memorandum of Understanding (2006) , and (ii) 15
percent of the existing Federal capital asset building inventory of the agency as of the end of fiscal year 2015
incorporates the sustainable practices in the Guiding Principles; (g) ensure that, if the agency operates a fleet of at
least 20 motor vehicles, the agency, relative to agency baselines for fiscal year 2005, (i) reduces the fleet's total
consumption of petroleum products by 2 percent annually through the end of fiscal year 2015, (ii) increases the total
fuel consumption that is non-petroleum-based by 10 percent annually, and (iii) uses plug-in hybrid (PIH) vehicles when
PIH vehicles are commercially available at a cost reasonably comparable, on the basis of life-cycle cost, to non-PIH
vehicles; and (h) ensure that the agency (i) when acquiring an electronic product to meet its requirements, meets at
least 95 percent of those requirements with an Electronic Product Environmental Assessment Tool (EPEAT)-registered
electronic product, unless there is no EPEAT standard for such product, (ii) enables the Energy Star feature on agency
computers and monitors, (iii) establishes and implements policies to extend the useful life of agency electronic
equipment, and (iv) uses environmentally sound practices with respect to disposition of agency electronic equipment
that has reached the end of its useful life. .Duties of Heads of Agencies . In implementing the policy set forth in of
this order, the head of each agency shall: (a) implement within the agency sustainable practices for (i) energy
efficiency, greenhouse gas emissions avoidance or reduction, and petroleum products use reduction, (ii) renewable
energy, including bioenergy, (iii) water conservation, (iv) acquisition, (v) pollution and waste prevention and
recycling, (vi) reduction or elimination of acquisition and use of toxic or hazardous chemicals, (vii) high performance
construction, lease, operation, and maintenance of buildings, (viii) vehicle fleet management, and (ix) electronic
equipment management; (b) implement within the agency environmental management systems (EMS) at all appropriate
organizational levels to ensure (i) use of EMS as the primary management approach for addressing environmental aspects
of internal agency operations and activities, including environmental aspects of energy and transportation functions,
(ii) establishment of agency objectives and targets to ensure implementation of this order, and (iii) collection,
analysis, and reporting of information to measure performance in the implementation of this order; (c) establish within
the agency programs for (i) environmental management training, (ii) environmental compliance review and audit, and
(iii) leadership awards to recognize outstanding environmental, energy, or transportation management performance in the
agency; (d) within 30 days after the date of this order (i) designate a senior civilian officer of the United States,
compensated annually in an amount at or above the amount payable at level IV of the Executive Schedule, to be
responsible for implementation of this order within the agency, (ii) report such designation to the Director of the
Office of Management and Budget and the Chairman of the Council on Environmental Quality, and (iii) assign the
designated official the authority and duty to (A) monitor and report to the head of the agency on agency activities to
carry out subsections (a) and (b) of this section, and (B) perform such other duties relating to the implementation of
this order within the agency as the head of the agency deems appropriate; (e) ensure that contracts entered into after
the date of this order for contractor operation of government-owned facilities or vehicles require the contractor to
comply with the provisions of this order with respect to such facilities or vehicles to the same extent as the agency
would be required to comply if the agency operated the facilities or vehicles; (f) ensure that agreements, permits,
leases, licenses, or other legally-binding obligations between the agency and a tenant or concessionaire entered into
after the date of this order require, to the extent the head of the agency determines appropriate, that the tenant or
concessionaire take actions relating to matters within the scope of the contract that facilitate the agency's
compliance with this order; (g) provide reports on agency implementation of this order to the Chairman of the Council
on such schedule and in such format as the Chairman of the Council may require; and (h) provide information and
assistance to the Director of the Office of Management and Budget, the Chairman of the Council, and the Federal
Environmental Executive. .Additional Duties of the Chairman of the Council on Environmental Quality . In implementing
the policy set forth in of this order, the Chairman of the Council on Environmental Quality: (a) (i) shall establish a
Steering Committee on Strengthening Federal Environmental, Energy, and Transportation Management to advise the Director
of the Office of Management and Budget and the Chairman of the Council on the performance of their functions under this
order that shall consist exclusively of (A) the Federal Environmental Executive, who shall chair, convene and preside
at meetings of, determine the agenda of, and direct the work of, the Steering Committee, and (B) the senior officials
designated under (d)(i) of this order, and (ii) may establish subcommittees of the Steering Committee, to assist the
Steering Committee in developing the advice of the Steering Committee on particular subjects; (b) may, after
consultation with the Director of the Office of Management and Budget and the Steering Committee, issue instructions to
implement this order, other than instructions within the authority of the Director to issue under of this order; and
(c) shall administer a presidential leadership award program to recognize exceptional and outstanding environmental,
energy, or transportation management performance and excellence in agency efforts to implement this order. .Duties of
the Director of the Office of Management and Budget . In implementing the policy set forth in of this order, the
Director of the Office of Management and Budget shall, after consultation with the Chairman of the Council and the
Steering Committee, issue instructions to the heads of agencies concerning: (a) periodic evaluation of agency
implementation of this order; (b) budget and appropriations matters relating to implementation of this order; (c)
implementation of (d) of this order; and (d) amendments of the Federal Acquisition Regulation as necessary to implement
this order. .Duties of the Federal Environmental Executive . A Federal Environmental Executive designated by the
President shall head the Office of the Federal Environmental Executive, which shall be maintained in the Environmental
Protection Agency for funding and administrative purposes. In implementing the policy set forth in of this order, the
Federal Environmental Executive shall: (a) monitor, and advise the Chairman of the Council on, performance by agencies
of functions assigned by sections 2 and 3 of this order; (b) submit a report to the President, through the Chairman of
the Council, not less often than once every 2 years, on the activities of agencies to implement this order; and (c)
advise the Chairman of the Council on the Chairman's exercise of authority granted by sub(c) of this order.
.Limitations . (a) This order shall apply to an agency with respect to the activities, personnel, resources, and
facilities of the agency that are located within the United States. The head of an agency may provide that this order
shall apply in whole or in part with respect to the activities, personnel, resources, and facilities of the agency that
are not located within the United States, if the head of the agency determines that such application is in the interest
of the United States.  (b) The head of an agency shall manage activities, personnel, resources, and facilities of the
agency that are not located within the United States, and with respect to which the head of the agency has not made a
determination under subsection (a) of this section, in a manner consistent with the policy set forth in of this order
to the extent the head of the agency determines practicable. .Exemption Authority . (a) The Director of National
Intelligence may exempt an intelligence activity of the United States, and related personnel, resources, and
facilities, from the provisions of this order, other than this subsection and , to the extent the Director determines
necessary to protect intelligence sources and methods from unauthorized disclosure.  (b) The head of an agency may
exempt law enforcement activities of that agency, and related personnel, resources, and facilities, from the provisions
of this order, other than this subsection and , to the extent the head of an agency determines necessary to protect
undercover operations from unauthorized disclosure. (c) (i) The head of an agency may exempt law enforcement,
protective, emergency response, or military tactical vehicle fleets of that agency from the provisions of this order,
other than this subsection and . (ii) Heads of agencies shall manage fleets to which paragraph (i) of this subsection
refers in a manner consistent with the policy set forth in of this order to the extent they determine practicable. (d)
The head of an agency may submit to the President, through the Chairman of the Council, a request for an exemption of
an agency activity, and related personnel, resources, and facilities, from this order. .Definitions . As used in this
order: (a) “agency” means an executive agency as defined in of title 5, United States Code, excluding the Government
Accountability Office; (b) “Chairman of the Council” means the Chairman of the Council on Environmental Quality,
including in the Chairman's capacity as Director of the Office of Environmental Quality; (c) “Council” means the
Council on Environmental Quality; (d) “environmental” means environmental aspects of internal agency operations and
activities, including those environmental aspects related to energy and transportation functions; (e) “greenhouse
gases” means carbon dioxide, methane, nitrous oxide, hydrofluorocarbons, perfluorocarbons, and sulfur hexafluoride; (f)
“life-cycle cost-effective” means the life-cycle costs of a product, project, or measure are estimated to be equal to
or less than the base case (i.e., current or standard practice or product); (g) “new renewable sources” means sources
of renewable energy placed into service after January 1, 1999; (h) “renewable energy” means energy produced by solar,
wind, biomass, landfill gas, ocean (including tidal, wave, current and thermal), geothermal, municipal solid waste, or
new hydroelectric generation capacity achieved from increased efficiency or additions of new capacity at an existing
hydroelectric project; (i) “energy intensity” means energy consumption per square foot of building space, including
industrial or laboratory facilities; (j) “Steering Committee” means the Steering Committee on Strengthening Federal
Environmental, Energy, and Transportation Management established under sub(b) of this order; (k) “sustainable” means to
create and maintain conditions, under which humans and nature can exist in productive harmony, that permit fulfilling
the social, economic, and other requirements of present and future generations of Americans; and (l) “United States”
when used in a geographical sense, means the fifty states, the District of Columbia, the Commonwealth of Puerto Rico,
Guam, American Samoa, the United States Virgin Islands, and the Northern Mariana Islands, and associated territorial
waters and airspace. .General Provisions . (a) This order shall be implemented in a manner consistent with applicable
law and subject to the availability of appropriations.  (b) Nothing in this order shall be construed to impair or
otherwise affect the functions of the Director of the Office of Management and Budget relating to budget,
administrative, or legislative proposals. (c) This order is intended only to improve the internal management of the
Federal Government and is not intended to, and does not, create any right or benefit, substantive or procedural,
enforceable at law or in equity by a party against the United States, its departments, agencies, instrumentalities,
entities, officers, employees or agents, or any other person. .Revocations; Conforming Provisions . (a) The following
are revoked: (i) Executive Order 13101 of September 14, 1998; (ii) Executive Order 13123 of June 3, 1999; (iii)
Executive Order 13134 of August 12, 1999, as amended; (iv) Executive Order 13148 of April 21, 2000; and (v) Executive
Order 13149 of April 21, 2000. (b) In light of sub(e) of the National Defense Authorization Act for Fiscal Year 2002
(Public Law 107-107), not later than January 1 of each year through and including 2010, the Secretary of Defense shall
submit to the Senate and the House of Representatives a report regarding progress made toward achieving the energy
efficiency goals of the Department of Defense. (c) (b)(vi) of Executive Order 13327 of February 4, 2004, is amended by
striking “Executive Order 13148 of April 21, 2000” and inserting in lieu thereof “other executive orders”.
sampled_data$executive_order_number [2]
[1] "13323"
cat(strwrap(sampled_data$text[2], width = 120), sep = "\n")
, including of the Immigration and Nationality Act (INA), as amended (8 U.S.C. 1185), and of title 3, United States
Code, and to strengthen the national security of the United States through procedures and systems to manage and control
the arrival and departure of persons from the United States, :. Functions of the Secretary of Homeland Security.  The
Secretary of Homeland Security is assigned the functions of the President under (a) of the INA with respect to persons
other than citizens of the United States. In exercising these functions, the Secretary of Homeland Security shall not
issue, amend, or revoke any rules, regulations, or orders without first obtaining the concurrence of the Secretary of
State.  . Functions of the Secretary of State.  The Secretary of State is assigned the functions of the President under
(a) and (b) of the INA with respect to citizens of the United States, including those functions concerning United
States passports. In addition, the Secretary may amend or revoke part 46 of title 22, Code of Federal Regulations,
which concern persons other than citizens of the United States. In exercising these functions, the Secretary of State
shall not issue, amend, or revoke any rules, regulations, or orders without first consulting with the Secretary of
Homeland Security.  . Judicial Review.  This order is not intended to, and does not, create any right or benefit,
substantive or procedural, enforceable at law or in equity by a party against the United States, its departments,
agencies, entities, officers, employees or agents, or any other person.
sampled_data$executive_order_number [3]
[1] "13211"
cat(strwrap(sampled_data$text[3], width = 120), sep = "\n")
, and in order to appropriately weigh and consider the effects of the Federal Government's regulations on the supply,
distribution, and use of energy, :. Policy.  The Federal Government can significantly affect the supply, distribution,
and use of energy. Yet there is often too little information regarding the effects that governmental regulatory action
can have on energy. In order to provide more useful energy-related information and hence improve the quality of agency
decisionmaking, I am requiring that agencies shall prepare a Statement of Energy Effects when undertaking certain
agency actions. As described more fully below, such Statements of Energy Effects shall describe the effects of certain
regulatory actions on energy supply, distribution, or use.  . Preparation of a Statement of Energy Effects.  (a) To the
extent permitted by law, agencies shall prepare and submit a Statement of Energy Effects to the Administrator of the
Office of Information and Regulatory Affairs, Office of Management and Budget, for those matters identified as
significant energy actions.  (b) A Statement of Energy Effects shall consist of a detailed statement by the agency
responsible for the significant energy action relating to:(i) any adverse effects on energy supply, distribution, or
use (including a shortfall in supply, price increases, and increased use of foreign supplies) should the proposal be
implemented, and(ii) reasonable alternatives to the action with adverse energy effects and the expected effects of such
alternatives on energy supply, distribution, and use.(c) The Administrator of the Office of Information and Regulatory
Affairs shall provide guidance to the agencies on the implementation of this order and shall consult with other
agencies as appropriate in the implementation of this order.. Submission and Publication of Statements.  (a) Agencies
shall submit their Statements of Energy Effects to the Administrator of the Office of Information and Regulatory
Affairs, Office of Management and Budget, whenever they present the related submission under Executive Order 12866 of
September 30, 1993, or any successor order.  (b) Agencies shall publish their Statements of Energy Effects, or a
summary thereof, in each related Notice of Proposed Rulemaking and in any resulting Final Rule.. Definitions.  For
purposes of this order: (a) “Regulation” and “rule” have the same meaning as they do in Executive Order 12866 or any
successor order.  (b) “Significant energy action” means any action by an agency (normally published in the Federal
Register ) that promulgates or is expected to lead to the promulgation of a final rule or regulation, including notices
of inquiry, advance notices of proposed rulemaking, and notices of proposed rulemaking: (1)(i) that is a significant
regulatory action under Executive Order 12866 or any successor order, and (ii) is likely to have a significant adverse
effect on the supply, distribution, or use of energy; or(2) that is designated by the Administrator of the Office of
Information and Regulatory Affairs as a significant energy action.(c) “Agency” means any authority of the United States
that is an “agency” under 44 U.S.C. 3502(1), other than those considered to be independent regulatory agencies, as
defined in 44 U.S.C. 3502(5).. Judicial Review.  Nothing in this order shall affect any otherwise available judicial
review of agency action. This order is intended only to improve the internal management of the Federal Government and
does not create any right or benefit, substantive or procedural, enforceable at law or equity by a party against the
United States, its agencies or instrumentalities, its officers or employees, or any other person.
sampled_data$executive_order_number [4]
[1] "13398"
cat(strwrap(sampled_data$text[4], width = 120), sep = "\n")
, :. Policy.  To help keep America competitive, support American talent and creativity, encourage innovation throughout
the American economy, and help State, local, territorial, and tribal governments give the Nation's children and youth
the education they need to succeed, it shall be the policy of the United States to foster greater knowledge of and
improved performance in mathematics among American students.  . Establishment and Mission of Panel.  (a) There is
hereby established within the Department of Education (Department) the National Mathematics Advisory Panel (Panel).
(b) The Panel shall advise the President and the Secretary of Education (Secretary) consistent with this order on means
to implement effectively the policy set forth in , including with respect to the conduct, evaluation, and effective use
of the results of research relating to proven-effective and evidence-based mathematics instruction.. Membership and
Chair of Panel.  (a) The Panel shall consist of no more than 30 members as follows: (i) no more than 20 members from
among individuals not employed by the Federal Government, appointed by the Secretary for such terms as the Secretary
may specify at the time of appointment; and(ii) no more than 10 members from among officers and employees of Federal
agencies, designated by the Secretary after consultation with the heads of the agencies concerned.(b) From among the
members appointed under paragraph(3)(a)(i) of this order, the Secretary shall designate a Chair of the Panel.(c)
Subject to the direction of the Secretary, the Chair of the Panel shall convene and preside at meetings of the Panel,
determine its agenda, direct its work and, as appropriate to deal with particular subject matters, establish and direct
the work of subgroups of the Panel that shall consist exclusively of members of the Panel.. Report to the President on
Strengthening Mathematics Education.  In carrying out sub(b) of this order, the Panel shall submit to the President,
through the Secretary, a preliminary report not later than January 31, 2007, and a final report not later than February
28, 2008. Both reports shall, at a minimum, contain recommendations, based on the best available scientific evidence,
on the following: (a) the critical skills and skill progressions for students to acquire competence in algebra and
readiness for higher levels of mathematics;(b) the role and appropriate design of standards and assessment in promoting
mathematical competence;(c) the processes by which students of various abilities and backgrounds learn mathematics; (d)
instructional practices, programs, and materials that are effective for improving mathematics learning; (e) the
training, selection, placement, and professional development of teachers of mathematics in order to enhance students'
learning of mathematics;(f) the role and appropriate design of systems for delivering instruction in mathematics that
combine the different elements of learning processes, curricula, instruction, teacher training and support, and
standards, assessments, and accountability;(g) needs for research in support of mathematics education;(h) ideas for
strengthening capabilities to teach children and youth basic mathematics, geometry, algebra, and calculus and other
mathematical disciplines;(i) such other matters relating to mathematics education as the Panel deems appropriate;
and(j) such other matters relating to mathematics education as the Secretary may require.. Additional Reports.  The
Secretary may require the Panel, in carrying out sub(b) of this order, to submit such additional reports relating to
the policy set forth in as the Secretary deems appropriate.  . General Provisions.  (a) This order shall be implemented
in a manner consistent with applicable law, including of the Department of Education Organization Act (20 U.S.C. 3403),
and subject to the availability of appropriations.  (b) The Department shall provide such administrative support and
funding for the Panel as the Secretary determines appropriate. To the extent permitted by law, and where practicable,
agencies shall, upon request by the Secretary, provide assistance to the Panel.(c) The Panel shall obtain information
and advice as appropriate in the course of its work from:(i) officers or employees of Federal agencies, unless
otherwise directed by the head of the agency concerned;(ii) State, local, territorial, and tribal officials;(iii)
experts on matters relating to the policy set forth in ;(iv) parents and teachers; and(v) such other individuals as the
Panel deems appropriate or as the Secretary may direct.(d) Members of the Panel who are not officers or employees of
the United States shall serve without compensation and may receive travel expenses, including per diem in lieu of
subsistence, as authorized by law for persons serving intermittently in Government service (5 U.S.C. 5701-5707),
consistent with the availability of funds.(e) Insofar as the Federal Advisory Committee Act, as amended (5 U.S.C. App.)
(the “Act”), may apply to the administration of any portion of this order, any functions of the President under that
Act, except that of reporting to the Congress, shall be performed by the Secretary in accordance with the guidelines
issued by the Administrator of General Services.  (f) This order is not intended to, and does not, create any right or
benefit, substantive or procedural, enforceable by any party at law or in equity against the United States, its
departments, agencies, entities, officers, employees, or agents, or any other person.  . Termination.  Unless hereafter
extended by the President, this Advisory Panel shall terminate 2 years after the date of this order.
sampled_data$executive_order_number[5]
[1] "13369"
cat(strwrap(sampled_data$text[5], width = 120), sep = "\n")
, and to assist in reforming the Federal Internal Revenue Code to benefit all Americans, :. Establishment.  There is
established the President's Advisory Panel on Federal Tax Reform (Advisory Panel).  . Membership.  (a) The Advisory
Panel shall be composed of up to nine members appointed by the President.  (b) The President shall designate one member
of the Advisory Panel to serve as Chair and one member to serve as Vice Chair.. Purpose.  The purpose of the Advisory
Panel shall be to submit to the Secretary of the Treasury in accordance with this order a report with revenue neutral
policy options for reforming the Federal Internal Revenue Code. These options should: (a) simplify Federal tax laws to
reduce the costs and administrative burdens of compliance with such laws;(b) share the burdens and benefits of the
Federal tax structure in an appropriately progressive manner while recognizing the importance of homeownership and
charity in American society; and(c) promote long-run economic growth and job creation, and better encourage work
effort, saving, and investment, so as to strengthen the competitiveness of the United States in the global marketplace.
At least one option submitted by the Advisory Panel should use the Federal income tax as the base for its recommended
reforms.. Administration.  (a) The Department of the Treasury shall provide, to the extent permitted by law,
administrative support and funding for the Advisory Panel. The Advisory Panel is established within the Department of
the Treasury for administrative purposes only.  (b) The Chair of the Advisory Panel shall convene and preside at the
meetings of the Advisory Panel, determine its agenda after consultation with the Vice Chair, and direct its work. The
Advisory Panel shall have a staff headed by an Executive Director who shall be selected by the President and report to
the Chair.(c) Members of the Advisory Panel shall serve without compensation for their work on the Advisory Panel.
Members of the Advisory Panel who are not officers or employees in the executive branch, while engaged in the work of
the Advisory Panel, may be allowed travel expenses, including per diem in lieu of subsistence, as authorized by law for
persons serving intermittently in Government service (5 U.S.C. 5701 through 5707), consistent with the availability of
funds.(d) Consistent with applicable law, heads of executive departments and agencies shall provide to the Advisory
Panel such assistance, including assignment or detail of personnel, and information as may be necessary for the
Advisory Panel to perform its functions.  (e) The Advisory Panel may conduct meetings in appropriate locations
throughout the United States to obtain information and advice from Americans of diverse backgrounds and experience and
from a diverse range of American entities, including large and small for-profit and non-profit organizations, State,
local, and tribal governments, and from other individuals and entities as appropriate. Public hearings shall be held at
the call of the Chair.  (f) Insofar as the Federal Advisory Committee Act, as amended (5 U.S.C. App.) (the “Act”), may
apply to the Advisory Panel, any functions of the President under that Act, except for those in of that Act, shall be
performed by the Secretary of the Treasury in accordance with the guidelines that have been issued by the Administrator
of General Services.. Report.  The Advisory Panel shall submit to the Secretary of the Treasury a report containing
policy options in accordance with of this order as soon as practicable, but not later than July 31, 2005.  .
Provisions.  (a) Nothing in this order shall be construed to impair or otherwise affect the functions of the Director
of the Office of Management and Budget relating to budget, administrative, or legislative proposals.  (b) This order is
not intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity,
against the United States, its departments, agencies, entities, officers, employees or agents, or any other person..
Termination.  The Advisory Panel shall terminate 30 days after submitting its report pursuant to of this order.
sampled_data$executive_order_number[6]
[1] "13419"
cat(strwrap(sampled_data$text[6], width = 120), sep = "\n")
, including of the National Science and Technology Policy, Organization, and Priorities Act of 1976, as amended (42
U.S.C. 6613), (c) of the National Aeronautics and Space Administration Authorization Act of 2005 (Public Law 109-155),
and of title 3, United States Code, :. National Aeronautics Research and Development Policy.  Continued progress in
aeronautics, the science of flight, is essential to America's economic success and the protection of America's security
interests at home and around the globe. Accordingly, it shall be the policy of the United States to facilitate progress
in aeronautics research and development (R&D) through appropriate funding and activities of the Federal Government, in
cooperation with State, territorial, tribal, local, and foreign governments, international organizations, academic and
research institutions, private organizations, and other entities, as appropriate. The Federal Government shall only
undertake roles in supporting aeronautics R&D that are not more appropriately performed by the private sector. The
National Aeronautics Research and Development Policy prepared by the National Science and Technology Council should, to
the extent consistent with this order and its implementation, guide the aeronautics R&D programs of the United States
through 2020.  . Functions of the Director of the Office of Science and Technology Policy.  To implement the policy set
forth in of this order, the Director of the Office of Science and Technology Policy (the “Director”) shall: (a) review
the funding and activities of the Federal Government relating to aeronautics R&D;(b) recommend to the President, the
Director of the Office of Management and Budget, and the heads of executive departments and agencies, as appropriate,
such actions with respect to funding and activities of the Federal Government relating to aeronautics R&D as may be
necessary to(i) advance United States technological leadership in aeronautics;(ii) support innovative research leading
to significant advances in aeronautical concepts, technologies, and capabilities;(iii) pursue and develop advanced
aeronautics concepts and technologies, including those for advanced aircraft systems and air transportation management
systems, to benefit America's security and effective and efficient national airspace management;(iv) maintain and
advance United States aeronautics research, development, test and evaluation infrastructure to provide effective
experimental and computational capabilities in support of aeronautics R&D;(v) facilitate the educational development of
the future aeronautics workforce as needed to further Federal Government interests; (vi) enhance coordination and
communication among executive departments and agencies to maximize the effectiveness of Federal Government R&D
resources; and (vii) ensure appropriate Federal Government coordination with State, territorial, tribal, local, and
foreign governments, international organizations, academic and research institutions, private organizations, and other
entities.. Implementation of National Aeronautics Research and Development Policy.  To implement the policy set forth
in of this order, the Director shall: (a) develop and, not later than 1 year after the date of this order, submit for
approval by the President a plan for national aeronautics R&D and for related infrastructure, (the “plan”), and
thereafter submit, not less often than biennially, to the President for approval any changes to the plan; (b) monitor
and report to the President as appropriate on the implementation of the approved plan;(c) ensure that executive
departments and agencies conducting aeronautics R&D:(i) obtain and exchange information and advice, as appropriate,
from organizations and individuals outside the Federal Government in support of Federal Government planning and
performance of aeronautics R&D;(ii) develop and implement, as appropriate, measures for improving dissemination of R&D
results and facilitating technology transition from R&D to applications; and(iii) identify and promote innovative
policies and approaches that complement and enhance Federal Government aeronautics R&D investment; and(d) report to the
President on the results of the efforts of executive departments and agencies to implement paragraphs (c)(i) through
(iii) of this section.. General Provisions.  (a) In implementing this order, the Director shall: (i) obtain as
appropriate the assistance of the National Science and Technology Council in the performance of the Director's
functions under this order, consistent with Executive Order 12881 of November 23, 1993, as amended; (ii) coordinate as
appropriate with the Director of the Office of Management and Budget; and(iii) obtain information and advice from all
sources as appropriate, including individuals associated with academic and research institutions and private
organizations.(b) The functions of the President under subsection (c) of of the National Aeronautics and Space
Administration Authorization Act of 2005, except the function of designation, are assigned to the Director of the
Office of Science and Technology Policy. In performing these assigned functions, the Director shall, as appropriate,
consult the Administrator of the National Aeronautics and Space Administration, the Secretary of Defense, the Secretary
of Transportation, the Director of the Office of Management and Budget, and other heads of executive departments and
agencies as appropriate. The Director also shall ensure that all actions taken in the performance of such functions are
consistent with the authority set forth in subsections (a) through (d) of of Executive Order 13346 of July 8, 2004.(c)
This order shall be implemented in a manner consistent with: (i) applicable law, including A(i) of the National
Security Act of 1947, as amended (50 U.S.C. 403-1(i)), and subject to the availability of appropriations; and(ii)
statutory authority of the principal officers of executive departments and agencies as the heads of their respective
departments and agencies.  (d) This order shall not be construed to impair or otherwise affect the functions of the
Director of the Office of Management and Budget relating to budget, administrative, and legislative proposals.  (e)
This order is not intended to, and does not, create any rights or benefits, substantive or procedural, enforceable at
law or in equity by a party against the United States, its departments, agencies, instrumentalities, or entities, its
officers, employees, or agents, or any other person.
sampled_data$executive_order_number [7]
[1] "13450"
cat(strwrap(sampled_data$text[7], width = 120), sep = "\n")
, including sections 305 and 306 of title 5, sections 1115, 1116, and 9703 of title 31, and chapter 28 of title 39,
United States Code, and to improve the effectiveness and efficiency of the Federal Government and promote greater
accountability of that Government to the American people, :.Policy . It is the policy of the Federal Government to
spend taxpayer dollars effectively, and more effectively each year. Agencies shall apply taxpayer resources efficiently
in a manner that maximizes the effectiveness of Government programs in serving the American people.  .Definitions . As
used in this order: (a) “agency” means: (i) an executive agency as defined in of title 5, United States Code, other
than the Government Accountability Office; and (ii) the United States Postal Service and the Postal Regulatory
Commission;(b) “agency Performance Improvement Officer” means an employee of an agency who is a member of the Senior
Executive Service or equivalent service, and who is designated by the head of the agency to carry out the duties set
forth in of this order..Duties of Heads of Agencies . To assist in implementing the policy set forth in of this order,
the head of each agency shall, with respect to each program administered in whole or in part by the agency: (a) approve
for implementation: (i) clear annual and long-term goals defined by objectively measurable outcomes; and(ii) specific
plans for achieving the goals, including:(A) assignments to specified agency personnel of: (1) the duties necessary to
achieve the goals; and (2) the authority and resources necessary to fulfill such duties; (B) means to measure: (1)
progress toward achievement of the goals; and (2) efficiency in use of resources in making that progress; and (C)
mechanisms for ensuring continuous accountability of the specified agency personnel to the head of the agency for
achievement of the goals and efficiency in use of resources in achievement of the goals; (b) assist the President,
through the Director of the Office of Management and Budget (Director), in making recommendations to the Congress,
including budget and appropriations recommendations, that are justified based on objective performance information and
accurate estimates of the full costs of achieving the annual and long-term goals approved under subsection (a)(i) of
this section; and (c) ensure that agency Internet websites available to the public include regularly updated and
accurate information on the performance of the agency and its programs, in a readily useable and searchable form, that
sets forth the successes, shortfalls, and challenges of each program and describes the agency's efforts to improve the
performance of the program.  .Additional Duties of the Director of the Office of Management and Budget . (a) To assist
in implementing the policy set forth in of this order, the Director shall issue instructions to the heads of agencies
concerning: (i) the contents, and schedule for approval, of the goals and plans required by of this order; and (ii) the
availability to the public in readily accessible and comprehensible form on the agency's Internet website (or in the
Federal Register for any agency that does not have such a website), of the information approved by the head of each
agency under of this order and other information relating to agency performance.  (b) Instructions issued under
subsection (a) of this section shall facilitate compliance with applicable law, presidential guidance, and Office of
Management and Budget circulars and shall be designed to minimize duplication of effort and to assist in maximizing the
efficiency and effectiveness of agencies and their programs..Duties of Agency Performance Improvement Officers .
Subject to the direction of the head of the agency, each agency Performance Improvement Officer shall: (a) supervise
the performance management activities of the agency, including: (i) development of the goals, specific plans, and
estimates for which of this order provides; and (ii) development of the agency's strategic plans, annual performance
plans, and annual performance reports as required by law;(b) advise the head of the agency, with respect to a program
administered in whole or in part by the agency, whether:(i) goals proposed for the approval of the head of the agency
under (a)(i) of this order are:(A) sufficiently aggressive toward full achievement of the purposes of the program;
and(B) realistic in light of authority and resources assigned to the specified agency personnel referred to in
(a)(ii)(A) of this order with respect to that program; and (ii) means for measurement of progress toward achievement of
the goals are sufficiently rigorous and accurate;(c) convene the specified agency personnel referred to in (a)(ii)(A)
of this order, or appropriate subgroups thereof, regularly throughout each year to: (i) assess performance of each
program administered in whole or in part by the agency; and (ii) consider means to improve the performance and
efficiency of such program;(d) assist the head of the agency in the development and use within the agency of
performance measures in personnel performance appraisals, and, as appropriate, other agency personnel and planning
processes; and(e) report to the head of the agency on the implementation within the agency of the policy set forth in
of this order..Establishment and Operation of Performance Improvement Council . (a) The Director shall establish,
within the Office of Management and Budget for administrative purposes only, a Performance Improvement Council
(Council), consistent with this order.  (b) The Council shall consist exclusively of: (i) the Deputy Director for
Management of the Office of Management and Budget, who shall serve as Chair; (ii) such agency Performance Improvement
Officers, as determined by the Chair; and (iii) such other full-time or permanent part-time employees of an agency, as
determined by the Chair with the concurrence of the head of the agency concerned. (c) The Chair or the Chair's
designee, in implementing subsection (d) of this section, shall convene and preside at the meetings of the Council,
determine its agenda, direct its work, and establish and direct subgroups of the Council, as appropriate to deal with
particular subject matters, that shall consist exclusively of members of the Council.(d) To assist in implementing the
policy set forth in of this order, the Council shall: (i) develop and submit to the Director, or when appropriate to
the President through the Director, at times and in such formats as the Chair may specify, recommendations concerning:
(A) performance management policies and requirements; and (B) criteria for evaluation of program performance; (ii)
facilitate the exchange among agencies of information on performance management, including strategic and annual
planning and reporting, to accelerate improvements in program performance; (iii) coordinate and monitor a continuous
review by heads of agencies of the performance and management of all Federal programs that assesses the clarity of
purpose, quality of strategic and performance planning and goals, management excellence, and results achieved for each
agency's programs, with the results of these assessments and the evidence on which they are based made available to the
public on or through the Internet website referred to in subsection (d)(iv); (iv) to facilitate keeping the public
informed, and with such assistance of heads of agencies as the Director may require, develop an Internet website that
provides the public with information on how well each agency performs and that serves as a comprehensive source of
information on: (A) current program performance; and(B) the status of program performance plans and agency Performance
and Accountability Reports; and(C) consistent with the direction of the head of the agency concerned after consultation
with the Director, any publicly available reports by the agency's Inspector General concerning agency program
performance; (v) monitor implementation by agencies of the policy set forth in of this order and report thereon from
time to time as appropriate to the Director, or when appropriate to the President through the Director, at such times
and in such formats as the Chair may specify, together with any recommendations of the Council for more effective
implementation of such policy; (vi) at the request of the head of an agency, unless the Chair declines the request,
promptly review and provide advice on a proposed action by that agency to implement the policy set forth in of this
order; and (vii) obtain information and advice, as appropriate, in a manner that seeks individual advice and does not
involve collective judgment or consensus advice or deliberation, from:(A) State, local, territorial, and tribal
officials; and(B) representatives of entities or other individuals.  (e)(i) To the extent permitted by law, the Office
of Management and Budget shall provide the funding and administrative support the Council needs, as determined by the
Director, to implement this section; and (ii) the heads of agencies shall provide, as appropriate and to the extent
permitted by law, such information and assistance as the Chair may request to implement this section. .General
Provisions . (a) Nothing in this order shall be construed to impair or otherwise affect: (i) authority granted by law
to an agency or the head thereof; or (ii) functions of the Director relating to budget, administrative, or legislative
proposals.(b) This order shall be implemented consistent with applicable law (including laws and executive orders
relating to the protection of information from disclosure) and subject to the availability of appropriations.  (c) In
implementing this order, the Director of National Intelligence shall perform the functions assigned to the Director of
National Intelligence by the National Security Act of 1947, as amended (50 U.S.C. 401 et seq .), consistent with of the
Intelligence Reform and Terrorism Prevention Act (Public Law 108-458), and other applicable laws.  (d) This order is
not intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity,
by any party against the United States, its agencies, or entities, its officers, employees, or agents, or any other
person.
sampled_data$executive_order_number [8]
[1] "13200"
cat(strwrap(sampled_data$text[8], width = 120), sep = "\n")
, including the High-Performance Computing Act of 1991 (Public Law 102-194), as amended by the Next Generation Internet
Research Act of 1998 (Public Law 105-305), and in order to extend the life of the President's Information Technology
Advisory Committee so that it may continue to carry out its responsibilities, it is hereby ordered that Executive Order
13035 of February 11, 1997, as amended by Executive Orders 13092 and 13113 (“Executive Order 13035, as amended”), is
further amended as follows:(b) of Executive Order 13035, as amended, is further amended by deleting “February 11, 2001
and inserting “June 1, 2001,” in lieu thereof.
sampled_data$executive_order_number [9]
[1] "13266"
cat(strwrap(sampled_data$text[9], width = 120), sep = "\n")
, and in order to improve the efficiency and coordination of Federal policies related to personal fitness of the
general public, :. Policy.  This order is issued consistent with the following findings and principles: (a) Growing
scientific evidence indicates that an increasing number of Americans are suffering from negligible physical activity,
poor dietary habits, insufficient utilization of preventive health screenings, and engaging in risky behaviors such as
abuse of alcohol, tobacco, and drugs.(b) Existing information on the importance of appropriate physical activity, diet,
preventive health screenings, and avoiding harmful substances is often not received by the public, or, if received, is
not acted on sufficiently.(c) Individuals of all ages, locations, and levels of personal fitness can benefit from some
level of appropriate physical activity, dietary guidance, preventive health screening, and making healthy choices.(d)
While personal fitness is an individual responsibility, the Federal Government may, within the authority and funds
otherwise available, expand the opportunities for individuals to empower themselves to improve their general health.
Such opportunities may include improving the flow of information about personal fitness, assisting in the utilization
of that information, increasing the accessibility of resources for physical activity, and reducing barriers to
achieving good personal fitness.. Agency Responsibilities in Promoting Personal Fitness.(a) The Secretaries of
Agriculture, Education, Health and Human Services (HHS), Housing and Urban Development, Interior, Labor,
Transportation, and Veterans Affairs, and the Director of the Office of National Drug Policy shall review and evaluate
the policies, programs, and regulations of their respective departments and offices that in any way relate to the
personal fitness of the general public. Based on that review, the Secretaries and the Director shall determine whether
existing policies, programs, and regulations of their respective departments and offices should be modified or whether
new policies or programs could be implemented. These new policies and programs shall be consistent with otherwise
available authority and appropriated funds, and shall improve the Federal Government's assistance of individuals,
private organizations, and State and local governments to (i) increase physical activity; (ii) promote responsible
dietary habits; (iii) increase utilization of preventive health screenings; and (iv) encourage healthy choices
concerning alcohol, tobacco, drugs, and safety among the general public.(b) Each department and office included in (a)
shall report to the President, through the Secretary of Health and Human Services, its proposed actions within 90 days
of the date of this order.  (c) There shall be a Personal Fitness Interagency Working Group (Working Group), composed
of the Secretaries or Director of the departments and office included in (a) (or their designees) and chaired by the
Secretary of HHS or his designee. In order to improve efficiency through information sharing and to eliminate waste and
overlap, the Working Group shall work to ensure the cooperation of Federal agencies in coordinating Federal personal
fitness activities. The Working Group shall meet subject to the call of the Chair, but not less than twice a year. The
Department of Health and Human Services shall provide such administrative support to the Working Group as the Secretary
of HHS deems necessary. Each member of the Working Group shall be a full-time or permanent part-time officer or
employee of the Federal Government.  . General Provisions.  This order is intended only to improve the internal
management of the executive branch and it is not intended to, and does not, create any right, benefit, trust, or
responsibility, substantive or procedural, enforceable at law or equity by a party against the United States, its
departments, agencies or entities, its officers or employees, or any person.
sampled_data$executive_order_number [10]
[1] "13267"
cat(strwrap(sampled_data$text[10], width = 120), sep = "\n")
, :. Establishment.  I hereby establish within the Office of Management and Budget (OMB) a Transition Planning Office
for the Department of Homeland Security (the “Transition Planning Office”), to be headed by the Director of the
Transition Planning Office for the Department of Homeland Security (the “Director for Transition Planning”).  .
Missions.  The missions of the Transition Planning Office shall be to: (a) coordinate, guide, and conduct transition
and related planning throughout the executive branch of the United States Government in preparation for establishment
of the proposed Department of Homeland Security; and(b) consistent with Presidential guidance, work with the Congress
as it considers legislation to establish that Department.. Administration.  (a) The Director of OMB shall ensure that
the Transition Planning Office receives appropriate personnel (including detailees and assignees, as appropriate),
funding, and administrative support for the Office, subject to the availability of appropriations. The Director of OMB
is authorized to make expenditures under of title 31, United States Code, as may be appropriate to carry out this
order.  (b) If an individual who is an Assistant to the President is appointed to serve simultaneously as Director for
Transition Planning, the functioning, personnel, funds, records, and property of the office of the Assistant to the
President and the office of the Director for Transition Planning shall be kept separate in the same manner as if the
two offices were headed by two different individuals.. Other Departments and Agencies.  This order does not alter the
existing authorities of United States Government departments and agencies. In carrying out the missions set forth in of
this order, all executive departments and agencies are directed to assist the Director for Transition Planning and the
Transition Planning Office to the extent permitted by law.  . Termination.  The Transition Planning Office, and all the
authorities of this order, shall terminate within 90 days after the date on which legislation creating the Department
of Homeland Security is enacted, or within 1 year of the date of this order, whichever occurs first.
sampled_data$executive_order_number [11]
[1] "13602"
cat(strwrap(sampled_data$text[11], width = 120), sep = "\n")
, and in order to forge a partnership with local communities to provide them with comprehensive technical assistance to
use and compete for Federal resources more effectively and efficiently, which will enable them to develop and implement
economic strategies to become more competitive, sustainable, and inclusive, : .Policy.  Cities, towns, and regions
across our Nation continue to face difficult economic challenges. Enhancing current Federal assistance is helping to
lift communities out of distress. To allow the Federal Government to better partner with these local communities to
build local capacity to address economic issues, and to support comprehensive planning and regional collaboration, my
Administration established the Strong Cities, Strong Communities (SC2) pilot initiative. By partnering with cities and
regions to augment their vision for stability and economic growth, the SC2 was designed to help communities strengthen
their capacity to create jobs and more competitive business climates, and implement locally driven community and
regional planning approaches that lead to sustained economic growth, as well as ensure that Federal assistance is more
efficiently provided and used.  This order improves the way the Federal Government engages with and supports local
communities by better aligning resources and coordinating efforts across executive departments and agencies (agencies)
so that communities across the country have access to comprehensive, localized technical assistance and planning
resources to develop and implement their economic vision and strategies. .White House Council on Strong Cities, Strong
Communities.  There is established a White House Council on Strong Cities, Strong Communities (Council) within the
Department of Housing and Urban Development, to be chaired by the Secretary of Housing and Urban Development and the
Assistant to the President for Domestic Policy (Co-Chairs).  (a) Membership.  In addition to the Co-Chairs, the Council
shall consist of the following members: (i) the Secretary of the Treasury; (ii) the Secretary of Defense; (iii) the
Attorney General; (iv) the Secretary of the Interior; (v) the Secretary of Agriculture; (vi) the Secretary of Commerce;
(vii) the Secretary of Labor; (viii) the Secretary of Health and Human Services; (ix) the Secretary of Transportation;
(x) the Secretary of Energy; (xi) the Secretary of Education; (xii) the Secretary of Veterans Affairs; (xiii) the
Secretary of Homeland Security; (xiv) the Chair of the Council of Economic Advisers; (xv) the Administrator of the
Environmental Protection Agency; (xvi) the Director of the Office of Management and Budget; (xvii) the Administrator of
General Services; (xviii) the Administrator of the Small Business Administration; (xix) the Chief Executive Officer of
the Corporation for National and Community Service; (xx) the Chairperson of the National Endowment for the Arts; (xxi)
the Senior Advisor and Assistant to the President for Intergovernmental Affairs and Public Engagement; (xxii) the
Assistant to the President and Cabinet Secretary; (xxiii) the Assistant to the President for Economic Policy; (xxiv)
the Chair of the Council on Environmental Quality; (xxv) the Director of the Office of Science and Technology Policy;
and (xxvi) the heads of such other agencies and offices as the President may, from time to time, designate. A member of
the Council may designate, to perform the Council functions of the member, a senior-level official who is a part of the
member's agency or office, and who is a full-time officer or employee of the Federal Government.  (b) Administration.
The Co-Chairs shall convene regular meetings of the Council, determine its agenda, and direct its work. The Secretary
of Housing and Urban Development shall appoint an Executive Director of the Council to coordinate the Council's
activities. At the direction of the Co-Chairs, the Council may establish subgroups consisting exclusively of Council
members or their designees, as appropriate. Agencies may detail staff to the Council to support its coordination and
implementation efforts.  .Mission and Function of the Council.  The Council shall, to the extent permitted by law, work
across agencies and offices to: (a) coordinate the development and implementation of the various components of the SC2,
as determined by the Co-Chairs; (b) coordinate agency efforts to ensure communities have access to comprehensive,
localized technical assistance and planning resources to develop and execute their economic vision and strategies
(including, where appropriate, efforts of existing committees or taskforces related to providing technical assistance
to local governments and improving their capacity to address economic issues); (c) ensure that members of the Council
incorporate SC2 implementation efforts into their agency annual performance plans and those efforts' outcomes into
their annual performance results; (d) provide recommendations to the President, through the Co-Chairs on: (i) policies
for building local expertise in strengthening local economies; (ii) changes to Federal policies and programs to address
issues of special importance to cities and local governments that pertain to local capacity and economic growth; (iii)
implementing best practices from the SC2 initiative Government-wide to better support cities and local governments; and
(iv) opportunities to increase the flexible utilization of existing Federal program resources across agencies to enable
more performance and outcome-based funding; (e) encourage the development of technical assistance, planning, and
financing tools and implementation strategies that can be coordinated or aligned across agencies to assist communities
in building local capacity to address economic issues, engaging in comprehensive planning, and advancing regional
collaboration; and (f) facilitate the exchange of ideas and strategies to help communities address economic challenges
and create sustained economic opportunity. .Outreach.  Consistent with the objectives set forth in this order, the
Council, in accordance with applicable law, shall conduct outreach to representatives of nonprofit organizations,
businesses, labor organizations, State and local government agencies, school districts, elected officials, faith and
other community-based organizations, philanthropies, other institutions of local importance, and other interested
persons with relevant expertise in the expansion and improvement of efforts to build local capacity to address economic
issues in cities and communities. The Council will convene an annual meeting of interested parties—including mayors and
city employees—to share key findings and progress, offer best practices, and promote strategies that have worked in
communities participating in the initiative.  .Reports.  Within 1 year of the date of this order, and annually
thereafter, the Executive Director shall provide a report to the Co-Chairs on the work of the Council and its
achievements during the year, including demonstrable changes in the capacity of local communities to implement their
economic development goals and efforts to achieve more efficient and effective use of Federal resources.  .General
Provisions.  (a) The heads of agencies shall assist and provide information to the Council, consistent with applicable
law, as may be necessary to implement this order. Each agency shall bear its own expense for participating in the
Council.  (b) Nothing in this order shall be construed to impair or otherwise affect: (i) the authority granted by law
to an executive department, agency, or the head thereof; or (ii) the functions of the Director of the Office of
Management and Budget relating to budgetary, administrative, or legislative proposals. (c) This order shall be
implemented consistent with applicable law and subject to the availability of appropriations. (d) This order is not
intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity by
any party against the United States, its departments, agencies, or entities, its officers, employees, or agents, or any
other person.
sampled_data$executive_order_number [12]
[1] "13669"
cat(strwrap(sampled_data$text[12], width = 120), sep = "\n")
, including chapter 47 of title 10, United States Code (Uniform Code of Military Justice, 10 U.S.C. 801-946), and in
order to prescribe amendments to the Manual for Courts-Martial, United States, prescribed by Executive Order 12473 of
April 13, 1984, as amended, : . Part II, the Discussion for Part II, and the Analysis for Part II of the Manual for
Courts-Martial, United States, are amended as described in the Annex attached and made a part of this order.  . These
amendments shall take effect as of the date of this order, subject to the following: (a) Nothing in these amendments
shall be construed to make punishable any act done or omitted prior to the effective date of this order that was not
punishable when done or omitted.(b) Nothing in these amendments shall be construed to invalidate any nonjudicial
punishment proceedings, restraint, investigation, referral of charges, trial in which arraignment occurred, or other
action begun prior to the effective date of this order, and any such nonjudicial punishment, restraint, investigation,
referral of charges, trial, or other action may proceed in the same manner and with the same effect as if these
amendments had not been prescribed.
sampled_data$executive_order_number [13]
[1] "13762"
cat(strwrap(sampled_data$text[13], width = 120), sep = "\n")
, including the Federal Vacancies Reform Act of 1998, 5 U.S.C. 3345 et seq., it is hereby ordered that: .  Order of
Succession.  Subject to the provisions of of this order, the following officers, in the order listed, shall act as and
perform the functions and duties of the office of Attorney General, during any period in which the Attorney General,
the Deputy Attorney General, the Associate Attorney General, and any officers designated by the Attorney General
pursuant to 28 U.S.C. 508 to act as Attorney General have died, resigned, or otherwise become unable to perform the
functions and duties of the office of Attorney General, until such time as at least one of the officers mentioned above
is able to perform the functions and duties of that office: (a) United States Attorney for the District of Columbia;(b)
United States Attorney for the Northern District of Illinois; and(c) United States Attorney for the Central District of
California.  .  Exceptions.  (a) No individual who is serving in an office listed in of this order in an acting
capacity, by virtue of so serving, shall act as Attorney General pursuant to this order.  (b) No individual listed in
shall act as Attorney General unless that individual is otherwise eligible to so serve under the Federal Vacancies
Reform Act of 1998.(c) Notwithstanding the provisions of this order, the President retains discretion, to the extent
permitted by law, to depart from this order in designating an acting Attorney General.  . Executive Order 13557 of
November 4, 2010, is revoked.  . This order is not intended to, and does not, create any right or benefit, substantive
or procedural, enforceable at law or in equity, by any party against the United States, its departments, agencies, or
entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [14]
[1] "13620"
cat(strwrap(sampled_data$text[14], width = 120), sep = "\n")
, including the International Emergency Economic Powers Act (50 U.S.C. 1701 et seq.  ) (IEEPA), the National
Emergencies Act (50 U.S.C. 1601 et seq.  ) (NEA), of the United Nations Participation Act (22 U.S.C. 287c) (UNPA), and
of title 3, United States Code, I, , President of the United States of America, in order to take additional steps to
deal with the national emergency with respect to the situation in Somalia declared in Executive Order 13536 of April
12, 2010, in view of United Nations Security Council Resolution 2036 of February 22, 2012, and Resolution 2002 of July
29, 2011, and to address: exports of charcoal from Somalia, which generate significant revenue for al-Shabaab; the
misappropriation of Somali public assets; and certain acts of violence committed against civilians in Somalia, all of
which contribute to the deterioration of the security situation and the persistence of violence in Somalia, hereby
order:.  (a) of Executive Order 13536 is hereby amended to read as follows: “(a) All property and interests in property
that are in the United States, that hereafter come within the United States, or that are or hereafter come within the
possession or control of any United States person, including any foreign branch, of the following persons are blocked
and may not be transferred, paid, exported, withdrawn or otherwise dealt in:(i) the persons listed in the Annex to this
order; and(ii) any person determined by the Secretary of the Treasury, in consultation with the Secretary of State:(A)
to have engaged in acts that directly or indirectly threaten the peace, security, or stability of Somalia, including
but not limited to:(1) acts that threaten the Djibouti Agreement of August 18, 2008, or the political process;(2) acts
that threaten the Transitional Federal Institutions or future Somali governing institutions, the African Union Mission
in Somalia (AMISOM), or other future international peacekeeping operations related to Somalia; or(3) acts to
misappropriate Somali public assets;(B) to have obstructed the delivery of humanitarian assistance to Somalia, or
access to, or distribution of, humanitarian assistance in Somalia;(C) to have directly or indirectly supplied, sold, or
transferred to Somalia, or to have been the recipient in the territory of Somalia of, arms or any related materiel, or
any technical advice, training or assistance, including financing and financial assistance, related to military
activities; (D) to be responsible for or complicit in, or responsible for ordering, controlling, or otherwise
directing, or to have participated in, the commission of acts of violence targeting civilians in Somalia, including
killing and maiming, sexual and gender-based violence, attacks on schools and hospitals, taking hostages, and forced
displacement; (E) to be a political or military leader recruiting or using children in armed conflict in Somalia;(F) to
have engaged, directly or indirectly, in the import or export of charcoal from Somalia on or after February 22,
2012;(G) to have materially assisted, sponsored, or provided financial, material, logistical or technical support for,
or goods or services in support of, the activities described in subsections (a)(ii)(A) through (F) of this section or
any person whose property and interests in property are blocked pursuant to this order; or(H) to be owned or controlled
by, or to have acted or purported to act for or on behalf of, directly or indirectly, any person whose property and
interests in property are blocked pursuant to this order.” . (a) The importation into the United States, directly or
indirectly, of charcoal from Somalia is prohibited.  (b) The prohibition in subsection (a) of this section applies
except to the extent provided by statutes, or in regulations, orders, directives, or licenses that may be issued
pursuant to this order, and notwithstanding any contract entered into or any license or permit granted prior to the
effective date of this order.  . (a) Any transaction that evades or avoids, has the purpose of evading or avoiding,
causes a violation of, or attempts to violate any of the prohibitions set forth in this order is prohibited.  (b) Any
conspiracy formed to violate any of the prohibitions set forth in this order is prohibited.  . For the purposes of this
order: (a) the term “person” means an individual or entity; (b) the term “entity” means a partnership, association,
trust, joint venture, corporation, group, subgroup, or other organization;(c) the term “United States person” means any
United States citizen, permanent resident alien, entity organized under the laws of the United States or any
jurisdiction within the United States (including foreign branches), or any person in the United States; and(d) the term
“charcoal” means any product classifiable in heading 3802 or 4402 of the Harmonized Tariff Schedule of the United
States.  . The Secretary of the Treasury, in consultation with the Secretary of State, is hereby authorized to take
such actions, including the promulgation of rules and regulations, and to employ all powers granted to the President by
IEEPA and the UNPA, as may be necessary to carry out the purposes of this order. The Secretary of the Treasury may
redelegate any of these functions to other officers and agencies of the United States Government consistent with
applicable law. All agencies of the United States Government are hereby directed to take all appropriate measures
within their authority to carry out the provisions of this order.  . This order is not intended to, and does not,
create any right or benefit, substantive or procedural, enforceable at law or in equity by any party against the United
States, its departments, agencies, or entities, its officers, employees, or agents, or any other person.  . This order
is effective at 2:00 p.m. eastern daylight time on July 20, 2012.
sampled_data$executive_order_number [15]
[1] "13579"
cat(strwrap(sampled_data$text[15], width = 120), sep = "\n")
, and in order to improve regulation and regulatory review, :.Policy.  (a) Wise regulatory decisions depend on public
participation and on careful analysis of the likely consequences of regulation. Such decisions are informed and
improved by allowing interested members of the public to have a meaningful opportunity to participate in rulemaking. To
the extent permitted by law, such decisions should be made only after consideration of their costs and benefits (both
quantitative and qualitative).  (b) Executive Order 13563 of January 18, 2011, “Improving Regulation and Regulatory
Review,” directed to executive agencies, was meant to produce a regulatory system that protects “public health,
welfare, safety, and our environment while promoting economic growth, innovation, competitiveness, and job creation.”
Independent regulatory agencies, no less than executive agencies, should promote that goal.(c) Executive Order 13563
set out general requirements directed to executive agencies concerning public participation, integration and
innovation, flexible approaches, and science. To the extent permitted by law, independent regulatory agencies should
comply with these provisions as well..Retrospective Analyses of Existing Rules.  (a) To facilitate the periodic review
of existing significant regulations, independent regulatory agencies should consider how best to promote retrospective
analysis of rules that may be outmoded, ineffective, insufficient, or excessively burdensome, and to modify,
streamline, expand, or repeal them in accordance with what has been learned. Such retrospective analyses, including
supporting data and evaluations, should be released online whenever possible.  (b) Within 120 days of the date of this
order, each independent regulatory agency should develop and release to the public a plan, consistent with law and
reflecting its resources and regulatory priorities and processes, under which the agency will periodically review its
existing significant regulations to determine whether any such regulations should be modified, streamlined, expanded,
or repealed so as to make the agency's regulatory program more effective or less burdensome in achieving the regulatory
objectives..General Provisions.  (a) For purposes of this order, “executive agency” shall have the meaning set forth
for the term “agency” in (b) of Executive Order 12866 of September 30, 1993, and “independent regulatory agency” shall
have the meaning set forth in 44 U.S.C. 3502(5).  (b) Nothing in this order shall be construed to impair or otherwise
affect:(i) authority granted by law to a department or agency, or the head thereof; or(ii) functions of the Director of
the Office of Management and Budget relating to budgetary, administrative, or legislative proposals.(c) This order
shall be implemented consistent with applicable law and subject to the availability of appropriations.(d) This order is
not intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity
by any party against the United States, its departments, agencies, or entities, its officers, employees, or agents, or
any other person.
sampled_data$executive_order_number [16]
[1] "13537"
cat(strwrap(sampled_data$text[16], width = 120), sep = "\n")
, :.Interagency Group on Insular Areas.(a) There is established, within the Department of the Interior for
administrative purposes, the Interagency Group on Insular Areas (IGIA) to address policies concerning Guam, American
Samoa, the United States Virgin Islands, and the Commonwealth of the Northern Mariana Islands (Insular Areas).(b) The
IGIA shall consist of:(i) the heads of the executive departments, as defined in 5 U.S.C. 101;(ii) the heads of such
other executive agencies as the Co-Chairs of the IGIA may designate; and (iii) the Deputy Assistant to the President
and Director of Intergovernmental Affairs.(c) The Secretary of the Interior and the Deputy Assistant to the President
and Director of Intergovernmental Affairs shall serve as Co-Chairs of the IGIA, convene and preside at its meetings,
direct its work, and establish such subgroups of the IGIA as they deem appropriate, consisting exclusively of members
of the IGIA.(d) Members of the IGIA may designate a senior department or agency official who is a full-time officer or
employee of the Federal Government to perform their IGIA functions..Functions of the IGIA.  The IGIA shall: (a) advise
the President on establishment or implementation of policies concerning the Insular Areas;(b) solicit information and
advice concerning the Insular Areas from the Governors of, and other elected officials in, the Insular Areas (including
through at least one meeting each year with any Governors of the Insular Areas who may wish to attend) in a manner that
seeks their individual advice and does not involve collective judgment, or consensus advice or deliberation;(c) solicit
information and advice concerning the Insular Areas, as the IGIA determines appropriate, from representatives of
entities or other individuals in a manner that seeks their individual advice and does not involve collective judgment,
or consensus advice or deliberation;(d) solicit information from executive departments or agencies for purposes of
carrying out its mission; and(e) at the request of the head of any executive department or agency who is a member of
the IGIA, with the approval of the Co-Chairs, promptly review and provide advice on a policy or policy implementation
action affecting the Insular Areas proposed by that department or agency..Recommendations.  The IGIA shall: (a) submit
annually to the President a report containing recommendations regarding the establishment or implementation of policies
concerning the Insular Areas; and (b) provide to the President, from time to time, as appropriate, recommendations
concerning proposed or existing Federal programs and policies affecting the Insular Areas.  .General Provisions. (a)
The heads of executive departments and agencies shall assist and provide information to the IGIA, consistent with
applicable law, as may be necessary to carry out the functions of the IGIA. Each executive department and agency shall
bear its own expenses of participating in the IGIA.(b) Nothing in this order shall be construed to impair or otherwise
affect:(i) authority granted by law to an executive department, agency, or the head thereof, or the status of that
department or agency within the Federal Government; or (ii) functions of the Director of the Office of Management and
Budget relating to budgetary, administrative, or legislative proposals.(c) This order shall be implemented consistent
with applicable law and subject to the availability of appropriations.(d) This order shall supersede Executive Order
13299 of May 8, 2003.(e) This order is not intended to, and does not, create any right or benefit, substantive or
procedural, enforceable at law or in equity by any party against the United States, its departments, agencies, or
entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [17]
[1] "13582"
cat(strwrap(sampled_data$text[17], width = 120), sep = "\n")
, including the International Emergency Economic Powers Act (50 U.S.C. 1701 et seq .) (IEEPA), the National Emergencies
Act (50 U.S.C. 1601 et seq .), and of title 3, United States Code, I, , President of the United States of America, in
order to take additional steps with respect to the Government of Syria's continuing escalation of violence against the
people of Syria and with respect to the national emergency declared in Executive Order 13338 of May 11, 2004, as
modified in scope and relied upon for additional steps taken in Executive Order 13399 of April 25, 2006, Executive
Order 13460 of February 13, 2008, Executive Order 13572 of April 29, 2011, and Executive Order 13573 of May 18, 2011,
hereby order:.  (a) All property and interests in property that are in the United States, that hereafter come within
the United States, or that are or hereafter come within the possession or control of any United States person,
including any overseas branch, of the Government of Syria are blocked and may not be transferred, paid, exported,
withdrawn, or otherwise dealt in.  (b) All property and interests in property that are in the United States, that
hereafter come within the United States, or that are or hereafter come within the possession or control of any United
States person, including any overseas branch, of the following persons are blocked and may not be transferred, paid,
exported, withdrawn, or otherwise dealt in: any person determined by the Secretary of the Treasury, in consultation
with the Secretary of State:(i) to have materially assisted, sponsored, or provided financial, material, or
technological support for, or goods or services in support of, any person whose property and interests in property are
blocked pursuant to this order; or (ii) to be owned or controlled by, or to have acted or purported to act for or on
behalf of, directly or indirectly, any person whose property and interests in property are blocked pursuant to this
order..  The following are prohibited: (a) new investment in Syria by a United States person, wherever located;(b) the
exportation, reexportation, sale, or supply, directly or indirectly, from the United States, or by a United States
person, wherever located, of any services to Syria;(c) the importation into the United States of petroleum or petroleum
products of Syrian origin;(d) any transaction or dealing by a United States person, wherever located, including
purchasing, selling, transporting, swapping, brokering, approving, financing, facilitating, or guaranteeing, in or
related to petroleum or petroleum products of Syrian origin; and (e) any approval, financing, facilitation, or
guarantee by a United States person, wherever located, of a transaction by a foreign person where the transaction by
that foreign person would be prohibited by this section if performed by a United States person or within the United
States.  .  I hereby determine that the making of donations of the type of articles specified in (b)(2) of IEEPA (50
U.S.C. 1702(b)(2)) by, to, or for the benefit of any person whose property and interests in property are blocked
pursuant to of this order would seriously impair my ability to deal with the national emergency declared in Executive
Order 13338 and expanded in scope in Executive Order 13572, and I hereby prohibit such donations as provided by of this
order.  .  The prohibitions in of this order include but are not limited to: (a) the making of any contribution or
provision of funds, goods, or services by, to, or for the benefit of any person whose property and interests in
property are blocked pursuant to this order; and(b) the receipt of any contribution or provision of funds, goods, or
services from any such person..  The prohibitions in sections 1 and 2 of this order apply except to the extent provided
by statutes, or in regulations, orders, directives, or licenses that may be issued pursuant to this order, and
notwithstanding any contract entered into or any license or permit granted prior to the effective date of this order.
.  (a) Any transaction by a United States person or within the United States that evades or avoids, has the purpose of
evading or avoiding, causes a violation of, or attempts to violate any of the prohibitions set forth in this order is
prohibited.  (b) Any conspiracy formed to violate any of the prohibitions set forth in this order is prohibited..
Nothing in sections 1 or 2 of this order shall prohibit transactions for the conduct of the official business of the
Federal Government by employees, grantees, or contractors thereof.  .  For the purposes of this order: (a) the term
“person” means an individual or entity;(b) the term “entity” means a partnership, association, trust, joint venture,
corporation, group, subgroup, or other organization;(c) the term “United States person” means any United States
citizen, permanent resident alien, entity organized under the laws of the United States or any jurisdiction within the
United States (including foreign branches), or any person in the United States; and(d) the term “Government of Syria”
means the Government of the Syrian Arab Republic, its agencies, instrumentalities, and controlled entities..  For those
persons whose property and interests in property are blocked pursuant to this order who might have a constitutional
presence in the United States, I find that because of the ability to transfer funds or other assets instantaneously,
prior notice to such persons of measures to be taken pursuant to this order would render those measures ineffectual. I
therefore determine that for these measures to be effective in addressing the national emergency declared in Executive
Order 13338 and expanded in scope in Executive Order 13572, there need be no prior notice of a listing or determination
made pursuant to of this order.  .  The Secretary of the Treasury, in consultation with the Secretary of State, is
hereby authorized to take such actions, including the promulgation of rules and regulations, and to employ all powers
granted to the President by IEEPA as may be necessary to carry out the purposes of this order. The Secretary of the
Treasury may redelegate any of these functions to other officers and agencies of the United States Government
consistent with applicable law. All agencies of the United States Government are hereby directed to take all
appropriate measures within their authority to carry out the provisions of this order.  .  This order is not intended
to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity by any party
against the United States, its departments, agencies, or entities, its officers, employees, or agents, or any other
person.  .  This order is effective at 12:01 a.m. eastern daylight time on August 18, 2011.
sampled_data$executive_order_number [18]
[1] "13643"
cat(strwrap(sampled_data$text[18], width = 120), sep = "\n")
, including chapter 47 of title 10, United States Code (Uniform Code of Military Justice, 10 U.S.C. 801-946), and in
order to prescribe amendments to the Manual for Courts-Martial, United States, prescribed by Executive Order 12473, as
amended, :.  Parts III and IV of the Manual for Courts-Martial, United States, are amended as described in the Annex
attached and made a part of this order.  .  These amendments shall take effect as of the date of this order, subject to
the following: (a) Nothing in these amendments shall be construed to make punishable any act done or omitted prior to
the effective date of this order that was not punishable when done or omitted.(b) Nothing in these amendments shall be
construed to invalidate any nonjudicial punishment proceedings, restraint, investigation, referral of charges, trial in
which arraignment occurred, or other action begun prior to the effective date of this order, and any such nonjudicial
punishment, restraint, investigation, referral of charges, trial, or other action may proceed in the same manner and
with the same effect as if these amendments had not been prescribed.
sampled_data$executive_order_number [19]
[1] "13544"
cat(strwrap(sampled_data$text[19], width = 120), sep = "\n")
, including of the Patient Protection and Affordable Care Act (Public Law 111-148), :.Establishment.  There is
established within the Department of Health and Human Services, the National Prevention, Health Promotion, and Public
Health Council (Council).  .Membership.(a) The Surgeon General shall serve as the Chair of the Council, which shall be
composed of:(1) the Secretary of Agriculture;(2) the Secretary of Labor;(3) the Secretary of Health and Human
Services;(4) the Secretary of Transportation;(5) the Secretary of Education;(6) the Secretary of Homeland Security;(7)
the Administrator of the Environmental Protection Agency;(8) the Chair of the Federal Trade Commission;(9) the Director
of National Drug Control Policy;(10) the Assistant to the President and Director of the Domestic Policy Council;(11)
the Assistant Secretary of the Interior for Indian Affairs;(12) the Chairman of the Corporation for National and
Community Service; and(13) the head of any other executive department or agency that the Chair may, from time to time,
determine is appropriate.(b) The Council shall meet at the call of the Chair..Purposes and Duties.  The Council shall:
(a) provide coordination and leadership at the Federal level, and among all executive departments and agencies, with
respect to prevention, wellness, and health promotion practices, the public health system, and integrative health care
in the United States;(b) develop, after obtaining input from relevant stakeholders, a national prevention, health
promotion, public health, and integrative health-care strategy that incorporates the most effective and achievable
means of improving the health status of Americans and reducing the incidence of preventable illness and disability in
the United States, as further described in of this order; (c) provide recommendations to the President and the Congress
concerning the most pressing health issues confronting the United States and changes in Federal policy to achieve
national wellness, health promotion, and public health goals, including the reduction of tobacco use, sedentary
behavior, and poor nutrition; (d) consider and propose evidence-based models, policies, and innovative approaches for
the promotion of transformative models of prevention, integrative health, and public health on individual and community
levels across the United States;(e) establish processes for continual public input, including input from State,
regional, and local leadership communities and other relevant stakeholders, including Indian tribes and tribal
organizations;(f) submit the reports required by of this order; and(g) carry out such other activities as are
determined appropriate by the President..Advisory Group.(a) There is established within the Department of Health and
Human Services an Advisory Group on Prevention, Health Promotion, and Integrative and Public Health (Advisory Group),
which shall report to the Chair of the Council.(b) The Advisory Group shall be composed of not more than 25 members or
representatives from outside the Federal Government appointed by the President and shall include a diverse group of
licensed health professionals, including integrative health practitioners who are representative of or have expertise
in:(1) worksite health promotion;(2) community services, including community health centers;(3) preventive medicine;(4)
health coaching;(5) public health education;(6) geriatrics; and(7) rehabilitation medicine.(c) The Advisory Group shall
develop policy and program recommendations and advise the Council on lifestyle-based chronic disease prevention and
management, integrative health care practices, and health promotion..National Prevention and Health Promotion Strategy.
Not later than March 23, 2011, the Chair, in consultation with the Council, shall develop and make public a national
prevention, health promotion, and public health strategy (national strategy), and shall review and revise it
periodically. The national strategy shall: (a) set specific goals and objectives for improving the health of the United
States through federally supported prevention, health promotion, and public health programs, consistent with ongoing
goal setting efforts conducted by specific agencies;(b) establish specific and measurable actions and timelines to
carry out the strategy, and determine accountability for meeting those timelines, within and across Federal departments
and agencies; and(c) make recommendations to improve Federal efforts relating to prevention, health promotion, public
health, and integrative health-care practices to ensure that Federal efforts are consistent with available standards
and evidence..Reports.  Not later than July 1, 2010, and annually thereafter until January 1, 2015, the Council shall
submit to the President and the relevant committees of the Congress, a report that: (a) describes the activities and
efforts on prevention, health promotion, and public health and activities to develop the national strategy conducted by
the Council during the period for which the report is prepared; (b) describes the national progress in meeting specific
prevention, health promotion, and public health goals defined in the national strategy and further describes corrective
actions recommended by the Council and actions taken by relevant agencies and organizations to meet these goals; (c)
contains a list of national priorities on health promotion and disease prevention to address lifestyle behavior
modification (including smoking cessation, proper nutrition, appropriate exercise, mental health, behavioral health,
substance-use disorder, and domestic violence screenings) and the prevention measures for the five leading disease
killers in the United States;(d) contains specific science-based initiatives to achieve the measurable goals of the
Healthy People 2020 program of the Department of Health and Human Services regarding nutrition, exercise, and smoking
cessation, and targeting the five leading disease killers in the United States;(e) contains specific plans for
consolidating Federal health programs and centers that exist to promote healthy behavior and reduce disease risk
(including eliminating programs and offices determined to be ineffective in meeting the priority goals of the Healthy
People 2020 program of the Department of Health and Human Services);(f) contains specific plans to ensure that all
Federal health-care programs are fully coordinated with science-based prevention recommendations by the Director of the
Centers for Disease Control and Prevention; and(g) contains specific plans to ensure that all prevention programs
outside the Department of Health and Human Services are based on the science-based guidelines developed by the Centers
for Disease Control and Prevention under subsection (d) of this section..Administration.(a) The Department of Health
and Human Services shall provide funding and administrative support for the Council and the Advisory Group to the
extent permitted by law and within existing appropriations.(b) All executive departments and agencies shall provide
information and assistance to the Council as the Chair may request for purposes of carrying out the Council's
functions, to the extent permitted by law.(c) Members of the Advisory Group shall serve without compensation, but shall
be allowed travel expenses, including per diem in lieu of subsistence, as authorized by law for persons serving
intermittently in Government service (5 U.S.C. 5701-5707), consistent with the availability of funds..General
Provisions.(a) Insofar as the Federal Advisory Committee Act, as amended (5 U.S.C App.) may apply to the Advisory
Group, any functions of the President under that Act, except that of reporting to the Congress, shall be performed by
the Secretary of Health and Human Services in accordance with the guidelines that have been issued by the Administrator
of General Services.(b) Nothing in this order shall be construed to impair or otherwise affect:(1) authority granted by
law to an executive department, agency, or the head thereof; or (2) functions of the Director of the Office of
Management and Budget relating to budgetary, administrative, or legislative proposals.(c) This order is not intended
to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity by any party
against the United States, its departments, agencies, or entities, its officers, employees, or agents, or any other
person.
sampled_data$executive_order_number [20]
[1] "13682"
cat(strwrap(sampled_data$text[20], width = 120), sep = "\n")
, by the Constitution and the laws of the United States, : . All executive branch departments and agencies of the
Federal Government shall be closed and their employees excused from duty on Friday, December 26, 2014, the day after
Christmas Day, except as provided in of this order.  . The heads of executive branch departments and agencies may
determine that certain offices and installations of their organizations, or parts thereof, must remain open and that
certain employees must report for duty on December 26, 2014, for reasons of national security, defense, or other public
need.  . Friday, December 26, 2014, shall be considered as falling within the scope of Executive Order 11582 of
February 11, 1971, and of 5 U.S.C. 5546 and 6103(b) and other similar statutes insofar as they relate to the pay and
leave of employees of the United States.  . The Director of the Office of Personnel Management shall take such actions
as may be necessary to implement this order.  .  General Provisions.  (a) Nothing in this order shall be construed to
impair or otherwise affect: (i) the authority granted by law to an executive department or agency, or the head thereof;
or(ii) the functions of the Director of the Office of Management and Budget relating to budgetary, administrative, or
legislative proposals.(b) This order shall be implemented consistent with applicable law and subject to the
availability of appropriations.(c) This order is not intended to, and does not, create any right or benefit,
substantive or procedural, enforceable at law or in equity by any party against the United States, its departments,
agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [21]
[1] "13784"
cat(strwrap(sampled_data$text[21], width = 120), sep = "\n")
, : .  Policy.  It shall be the policy of the executive branch to combat the scourge of drug abuse, addiction, and
overdose (drug addiction), including opioid abuse, addiction, and overdose (opioid crisis). This public health crisis
was responsible for more than 50,000 deaths in 2015 alone, most of which involved an opioid, and has caused families
and communities across America to endure significant pain, suffering, and financial harm.  .  Establishment of
Commission.  There is established the President's Commission on Combating Drug Addiction and the Opioid Crisis
(Commission).  .  Membership of Commission.  (a) The Commission shall be composed of members designated or appointed by
the President.  (b) The members of the Commission shall be selected so that membership is fairly balanced in terms of
the points of view represented and the functions to be performed by the Commission.(c) The President shall designate
the Chair of the Commission (Chair) from among the Commission's members.  .  Mission of Commission.  The mission of the
Commission shall be to study the scope and effectiveness of the Federal response to drug addiction and the opioid
crisis described in of this order and to make recommendations to the President for improving that response. The
Commission shall: (a) identify and describe existing Federal funding used to combat drug addiction and the opioid
crisis;(b) assess the availability and accessibility of drug addiction treatment services and overdose reversal
throughout the country and identify areas that are underserved;(c) identify and report on best practices for addiction
prevention, including healthcare provider education and evaluation of prescription practices, and the use and
effectiveness of State prescription drug monitoring programs;(d) review the literature evaluating the effectiveness of
educational messages for youth and adults with respect to prescription and illicit opioids;(e) identify and evaluate
existing Federal programs to prevent and treat drug addiction for their scope and effectiveness, and make
recommendations for improving these programs; and(f) make recommendations to the President for improving the Federal
response to drug addiction and the opioid crisis.  .  Administration of Commission.  (a) The Office of National Drug
Control Policy (ONDCP) shall, to the extent permitted by law, provide administrative support for the Commission.  (b)
Members of the Commission shall serve without any additional compensation for their work on the Commission. Members of
the Commission appointed from among private citizens of the United States, while engaged in the work of the Commission,
may be allowed travel expenses, including per diem in lieu of subsistence, to the extent permitted by law for persons
serving intermittently in Government service (5 U.S.C. 5701-5707), consistent with the availability of funds.  (c)
Insofar as the Federal Advisory Committee Act, as amended (5 U.S.C. App.) (Act), may apply to the Commission, any
functions of the President under that Act, except for those in and of that Act, shall be performed by the Director of
the ONDCP, in accordance with the guidelines that have been issued by the Administrator of General Services.  .
Funding of Commission.  The ONDCP shall, to the extent permitted by law and consistent with the need for funding
determined by the President, make funds appropriated to the ONDCP available to pay the costs of the activities of the
Commission.  .  Reports of Commission.  Within 90 days of the date of this order, the Commission shall submit to the
President a report on its interim recommendations regarding how the Federal Government can address drug addiction and
the opioid crisis described in of this order, and shall submit a report containing its final findings and
recommendations by October 1, 2017, unless the Chair provides written notice to the President that an extension is
necessary.  .  Termination of Commission.  The Commission shall terminate 30 days after submitting its final report,
unless extended by the President prior to that date.  .  General Provisions.  (a) Nothing in this order shall be
construed to impair or otherwise affect: (i) the authority granted by law to an executive department or agency, or the
head thereof; or(ii) the functions of the Director of the Office of Management and Budget relating to budgetary,
administrative, or legislative proposals.(b) This order shall be implemented consistent with applicable law and subject
to the availability of appropriations.(c) This order is not intended to, and does not, create any right or benefit,
substantive or procedural, enforceable at law or in equity by any party against the United States, its departments,
agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [22]
[1] "13894"
cat(strwrap(sampled_data$text[22], width = 120), sep = "\n")
, including the International Emergency Economic Powers Act (50 U.S.C. 1701 et seq.  ) (IEEPA), the National
Emergencies Act (50 U.S.C. 1601 et seq.  ) (NEA), (f) of the Immigration and Nationality Act of 1952 (8 U.S.C.
1182(f)), and of title 3, United States Code, I, , President of the United States of America, find that the situation
in and in relation to Syria, and in particular the recent actions by the Government of Turkey to conduct a military
offensive into northeast Syria, undermines the campaign to defeat the Islamic State of Iraq and Syria, or ISIS,
endangers civilians, and further threatens to undermine the peace, security, and stability in the region, and thereby
constitutes an unusual and extraordinary threat to the national security and foreign policy of the United States. I
hereby declare a national emergency to deal with that threat. I hereby determine and order: . (a) All property and
interests in property that are in the United States, that hereafter come within the United States, or that are or
hereafter come within the possession or control of any United States person of the following persons are blocked and
may not be transferred, paid, exported, withdrawn, or otherwise dealt in: (i) any person determined by the Secretary of
the Treasury, in consultation with the Secretary of State:(A) to be responsible for or complicit in, or to have
directly or indirectly engaged in, or attempted to engage in, any of the following in or in relation to Syria:(1)
actions or policies that further threaten the peace, security, stability, or territorial integrity of Syria; or(2) the
commission of serious human rights abuse;(B) to be a current or former official of the Government of Turkey;(C) to be
any subdivision, agency, or instrumentality of the Government of Turkey;(D) to operate in such sectors of the Turkish
economy as may be determined by the Secretary of the Treasury, in consultation with the Secretary of State;(E) to have
materially assisted, sponsored, or provided financial, material, or technological support for, or goods or services to
or in support of, any person whose property and interests in property are blocked pursuant to this order; or(F) to be
owned or controlled by, or to have acted or purported to act for or on behalf of, directly or indirectly, any person
whose property and interests in property are blocked pursuant to this order.  (b) The prohibitions in subsection (a) of
this section apply except to the extent provided by statutes, or in regulations, orders, directives, or licenses that
may be issued pursuant to this order, and notwithstanding any contract entered into or any license or permit granted
before the date of this order.  . (a) The Secretary of State, in consultation with the Secretary of the Treasury and
other officials of the U.S. Government as appropriate, is hereby authorized to impose on a foreign person any of the
sanctions described in subsections (b) and (c) of this section, upon determining that the person, on or after the date
of this order: (i) is responsible for or complicit in, has directly or indirectly engaged in, or attempted to engage
in, or financed, any of the following:(A) the obstruction, disruption, or prevention of a ceasefire in northern
Syria;(B) the intimidation or prevention of displaced persons from voluntarily returning to their places of residence
in Syria;(C) the forcible repatriation of persons or refugees to Syria; or(D) the obstruction, disruption, or
prevention of efforts to promote a political solution to the conflict in Syria, including:(1) the convening and conduct
of a credible and inclusive Syrian-led constitutional process under the auspices of the United Nations (UN);(2) the
preparation for and conduct of UN-supervised elections, pursuant to the new constitution, that are free and fair and to
the highest international standards of transparency and accountability; or(3) the development of a new Syrian
government that is representative and reflects the will of the Syrian people;(ii) is an adult family member of a person
designated under subsection (a)(i) of this section; or(iii) is responsible for or complicit in, or has directly or
indirectly engaged in, or attempted to engage in, the expropriation of property, including real property, for personal
gain or political purposes in Syria.(b) When the Secretary of State, in accordance with the terms of subsection (a) of
this section, has determined that a person meets any of the criteria described in that subsection and has selected one
or more of the sanctions set forth below to impose on that person, the heads of relevant departments and agencies, in
consultation with the Secretary of State, as appropriate, shall ensure that the following actions are taken where
necessary to implement the sanctions selected by the Secretary of State:(i) agencies shall not procure, or enter into a
contract for the procurement of, any goods or services from the sanctioned person; or(ii) the Secretary of State shall
direct the denial of a visa to, and the Secretary of Homeland Security shall exclude from the United States, any alien
that the Secretary of State determines is a corporate officer or principal of, or a shareholder with a controlling
interest in, a sanctioned person.(c) When the Secretary of State, in accordance with the terms of subsection (a) of
this section, has determined that a person meets any of the criteria described in that subsection and has selected one
or more of the sanctions set forth below to impose on that person, the Secretary of the Treasury, in consultation with
the Secretary of State, shall take the following actions where necessary to implement the sanctions selected by the
Secretary of State:(i) prohibit any United States financial institution that is a U.S. person from making loans or
providing credits to the sanctioned person totaling more than $10,000,000 in any 12-month period, unless such person is
engaged in activities to relieve human suffering and the loans or credits are provided for such activities;(ii)
prohibit any transactions in foreign exchange that are subject to the jurisdiction of the United States and in which
the sanctioned person has any interest; (iii) prohibit any transfers of credit or payments between banking institutions
or by, through, or to any banking institution, to the extent that such transfers or payments are subject to the
jurisdiction of the United States and involve any interest of the sanctioned person; (iv) block all property and
interests in property that are in the United States, that hereafter come within the United States, or that are or
hereafter come within the possession or control of any United States person of the sanctioned person, and provide that
such property and interests in property may not be transferred, paid, exported, withdrawn, or otherwise dealt in;(v)
prohibit any United States person from investing in or purchasing significant amounts of equity or debt instruments of
the sanctioned person;(vi) restrict or prohibit imports of goods, technology, or services, directly or indirectly, into
the United States from the sanctioned person; or(vii) impose on the principal executive officer or officers, or persons
performing similar functions and with similar authorities, of the sanctioned person the sanctions described in
subsections (c)(i)-(c)(vi) of this section, as selected by the Secretary of State.(d) The prohibitions in subsections
(b) and (c) of this section apply except to the extent provided by statutes, or in regulations, orders, directives, or
licenses that may be issued pursuant to this order, and notwithstanding any contract entered into or any license or
permit granted before the date of this order.  . (a) The Secretary of the Treasury, in consultation with the Secretary
of State, is hereby authorized to impose on a foreign financial institution the sanctions described in subsection (b)
of this section upon determining that the foreign financial institution knowingly conducted or facilitated any
significant financial transaction for or on behalf of any person whose property and interests in property are blocked
pursuant to of this order.  (b) With respect to any foreign financial institution determined by the Secretary of the
Treasury, in accordance with this section, to meet the criteria set forth in subsection (a) of this section, the
Secretary of the Treasury may prohibit the opening, and prohibit or impose strict conditions on the maintaining, in the
United States of a correspondent account or a payable-through account by such foreign financial institution.(c) The
prohibitions in subsection (b) of this section apply except to the extent provided by statutes, or in regulations,
orders, directives, or licenses that may be issued pursuant to this order, and notwithstanding any contract entered
into or any license or permit granted before the date of this order.  . The unrestricted immigrant and nonimmigrant
entry into the United States of aliens determined to meet one or more of the criteria in sub(a) or 2(a) of this order,
or aliens for which the sanctions under sub(b)(ii) have been selected, would be detrimental to the interests of the
United States, and the entry of such persons into the United States, as immigrants or nonimmigrants, is hereby
suspended, except where the Secretary of State determines that the entry of the person into the United States would not
be contrary to the interests of the United States, including when the Secretary so determines, based on a
recommendation of the Attorney General, that the person's entry would further important United States law enforcement
objectives. In exercising this responsibility, the Secretary of State shall consult the Secretary of Homeland Security
on matters related to admissibility or inadmissibility within the authority of the Secretary of Homeland Security. Such
persons shall be treated in the same manner as persons covered by of Proclamation 8693 of July 24, 2011 (Suspension of
Entry of Aliens Subject to United Nations Security Council Travel Bans and International Emergency Economic Powers Act
Sanctions). The Secretary of State shall have the responsibility for implementing this section pursuant to such
conditions and procedures as the Secretary has established or may establish pursuant to Proclamation 8693.  . I hereby
determine that the making of donations of the types of articles specified in (b)(2) of IEEPA (50 U.S.C. 1702(b)(2)) by,
to, or for the benefit of any person whose property and interests in property are blocked pursuant to of this order
would seriously impair my ability to deal with the national emergency declared in this order, and I hereby prohibit
such donations as provided by of this order.  . The prohibitions in sections 1 and 2 of this order include: (a) the
making of any contribution or provision of funds, goods, or services by, to, or for the benefit of any person whose
property and interests in property are blocked pursuant to this order; and(b) the receipt of any contribution or
provision of funds, goods, or services from any such person.  . (a) Any transaction that evades or avoids, has the
purpose of evading or avoiding, causes a violation of, or attempts to violate any of the prohibitions set forth in this
order is prohibited.  (b) Any conspiracy formed to violate any of the prohibitions set forth in this order is
prohibited.  . For the purposes of this order: (a) The term “entity” means a partnership, association, trust, joint
venture, corporation, group, subgroup, or other organization;(b) the term “foreign financial institution” means any
foreign entity that is engaged in the business of accepting deposits, making, granting, transferring, holding, or
brokering loans or credits, or purchasing or selling foreign exchange, securities, commodity futures or options, or
procuring purchasers and sellers thereof, as principal or agent. The term includes depository institutions, banks,
savings banks, money service businesses, trust companies, securities brokers and dealers, commodity futures and options
brokers and dealers, forward contract and foreign exchange merchants, securities and commodities exchanges, clearing
corporations, investment companies, employee benefit plans, dealers in precious metals, stones, or jewels, and holding
companies, affiliates, or subsidiaries of any of the foregoing. The term does not include the international financial
institutions identified in 22 U.S.C. 262r(c)(2), the International Fund for Agricultural Development, the North
American Development Bank, or any other international financial institution so notified by the Secretary of the
Treasury;(c) the term “knowingly,” with respect to conduct, a circumstance, or a result, means that a person has actual
knowledge, or should have known, of the conduct, the circumstance, or the result;(d) the term “person” means an
individual or entity;(e) the term “United States person” or “U.S. person” means any United States citizen, permanent
resident alien, entity organized under the laws of the United States or any jurisdiction within the United States
(including foreign branches), or any person in the United States; and(f) the term “Government of Turkey” means the
Government of Turkey, any political subdivision, agency, or instrumentality thereof, or any person owned or controlled
by or acting for or on behalf of the Government of Turkey.  . For those persons whose property and interests in
property are blocked pursuant to this order who might have a constitutional presence in the United States, I find that
because of the ability to transfer funds or other assets instantaneously, prior notice to such persons of measures to
be taken pursuant to this order would render those measures ineffectual. I therefore determine that for these measures
to be effective in addressing the national emergency declared in this order, there need be no prior notice of a listing
or determination made pursuant to this order.  . The Secretary of the Treasury, in consultation with the Secretary of
State, is hereby authorized to take such actions, including the promulgation of rules and regulations, and to employ
all powers granted to the President by IEEPA as may be necessary to carry out the purposes of this order. The Secretary
of the Treasury may, consistent with applicable law, redelegate any of these functions within the Department of the
Treasury. All departments and agencies of the United States shall take all appropriate measures within their authority
to implement this order.  . The Secretary of the Treasury, in consultation with the Secretary of State, is hereby
authorized to submit the recurring and final reports to the Congress on the national emergency declared in this order,
consistent with (c) of the NEA (50 U.S.C. 1641(c)), and (c) of IEEPA (50 U.S.C. 1703(c)).  . (a) Nothing in this order
shall be construed to impair or otherwise affect: (i) the authority granted by law to an executive department or
agency, or the head thereof; or(ii) the functions of the Director of the Office of Management and Budget relating to
budgetary, administrative, or legislative proposals.(b) This order shall be implemented consistent with applicable law
and subject to the availability of appropriations.(c) This order is not intended to, and does not, create any right or
benefit, substantive or procedural, enforceable at law or in equity by any party against the United States, its
departments, agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [23]
[1] "13914"
cat(strwrap(sampled_data$text[23], width = 120), sep = "\n")
, including title IV of the U.S. Commercial Space Launch Competitiveness Act (Public Law 114-90), : .  Policy.  Space
Policy Directive-1 of December 11, 2017 (Reinvigorating America's Human Space Exploration Program), provides that
commercial partners will participate in an “innovative and sustainable program” headed by the United States to “lead
the return of humans to the Moon for long-term exploration and utilization, followed by human missions to Mars and
other destinations.” Successful long-term exploration and scientific discovery of the Moon, Mars, and other celestial
bodies will require partnership with commercial entities to recover and use resources, including water and certain
minerals, in outer space.  Uncertainty regarding the right to recover and use space resources, including the extension
of the right to commercial recovery and use of lunar resources, however, has discouraged some commercial entities from
participating in this enterprise. Questions as to whether the 1979 Agreement Governing the Activities of States on the
Moon and Other Celestial Bodies (the “Moon Agreement”) establishes the legal framework for nation states concerning the
recovery and use of space resources have deepened this uncertainty, particularly because the United States has neither
signed nor ratified the Moon Agreement. In fact, only 18 countries have ratified the Moon Agreement, including just 17
of the 95 Member States of the United Nations Committee on the Peaceful Uses of Outer Space. Moreover, differences
between the Moon Agreement and the 1967 Treaty on Principles Governing the Activities of States in the Exploration and
Use of Outer Space, Including the Moon and Other Celestial Bodies—which the United States and 108 other countries have
joined—also contribute to uncertainty regarding the right to recover and use space resources.Americans should have the
right to engage in commercial exploration, recovery, and use of resources in outer space, consistent with applicable
law. Outer space is a legally and physically unique domain of human activity, and the United States does not view it as
a global commons. Accordingly, it shall be the policy of the United States to encourage international support for the
public and private recovery and use of resources in outer space, consistent with applicable law.  .  The Moon
Agreement.  The United States is not a party to the Moon Agreement. Further, the United States does not consider the
Moon Agreement to be an effective or necessary instrument to guide nation states regarding the promotion of commercial
participation in the long-term exploration, scientific discovery, and use of the Moon, Mars, or other celestial bodies.
Accordingly, the Secretary of State shall object to any attempt by any other state or international organization to
treat the Moon Agreement as reflecting or otherwise expressing customary international law.  .  Encouraging
International Support for the Recovery and Use of Space Resources.  The Secretary of State, in consultation with the
Secretary of Commerce, the Secretary of Transportation, the Administrator of the National Aeronautics and Space
Administration, and the head of any other executive department or agency the Secretary of State determines to be
appropriate, shall take all appropriate actions to encourage international support for the public and private recovery
and use of resources in outer space, consistent with the policy set forth in of this order. In carrying out this
section, the Secretary of State shall seek to negotiate joint statements and bilateral and multilateral arrangements
with foreign states regarding safe and sustainable operations for the public and private recovery and use of space
resources.  .  Report on Efforts to Encourage International Support for the Recovery and Use of Space Resources.  No
later than 180 days after the date of this order, the Secretary of State shall report to the President, through the
Chair of the National Space Council and the Assistant to the President for National Security Affairs, regarding
activities carried out under of this order.  .  General Provisions.  (a) Nothing in this order shall be construed to
impair or otherwise affect: (i) the authority granted by law to an executive department or agency, or the head thereof;
or(ii) the functions of the Director of the Office of Management and Budget relating to budgetary, administrative, or
legislative proposals.(b) This order shall be implemented consistent with applicable law and subject to the
availability of appropriations.(c) This order is not intended to, and does not, create any right or benefit,
substantive or procedural, enforceable at law or in equity by any party against the United States, its departments,
agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [24]
[1] "13797"
cat(strwrap(sampled_data$text[24], width = 120), sep = "\n")
, :.Establishment.  The Office of Trade and Manufacturing Policy (OTMP) is hereby established within the White House
Office. The OTMP shall consist of a Director selected by the President and such staff as deemed necessary by the
Assistant to the President and Chief of Staff.  .Mission.  The mission of the OTMP is to defend and serve American
workers and domestic manufacturers while advising the President on policies to increase economic growth, decrease the
trade deficit, and strengthen the United States manufacturing and defense industrial bases.  .Responsibilities.  The
OTMP shall: (a) advise the President on innovative strategies and promote trade policies consistent with the
President's stated goals;(b) serve as a liaison between the White House and the Department of Commerce and undertake
trade-related special projects as requested by the President; and(c) help improve the performance of the executive
branch's domestic procurement and hiring policies, including through the implementation of the policies described in
Executive Order 13788 of April 18, 2017 (Buy American and Hire American)..General Provisions.  (a) Nothing in this
order shall be construed to impair or otherwise affect: (i) the authority granted by law to an executive department or
agency, or the head thereof; or(ii) the functions of the Director of the Office of Management and Budget relating to
budgetary, administrative, or legislative proposals.(b) This order shall be implemented consistent with applicable law
and subject to the availability of appropriations.(c) This order is not intended to, and does not, create any right or
benefit, substantive or procedural, enforceable at law or in equity by any party against the United States, its
departments, agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [25]
[1] "13775"
cat(strwrap(sampled_data$text[25], width = 120), sep = "\n")
, including the Federal Vacancies Reform Act of 1998, 5 U.S.C. 3345 et seq., it is hereby ordered that: .  Order of
Succession.  Subject to the provisions of of this order, the following officers, in the order listed, shall act as and
perform the functions and duties of the office of Attorney General during any period in which the Attorney General, the
Deputy Attorney General, the Associate Attorney General, and any officers designated by the Attorney General pursuant
to 28 U.S.C. 508 to act as Attorney General, have died, resigned, or otherwise become unable to perform the functions
and duties of the office of Attorney General, until such time as at least one of the officers mentioned above is able
to perform the functions and duties of that office: (a) United States Attorney for the Eastern District of Virginia;(b)
United States Attorney for the Northern District of Illinois; and(c) United States Attorney for the Western District of
Missouri.  .  Exceptions.  (a) No individual who is serving in an office listed in of this order in an acting capacity,
by virtue of so serving, shall act as Attorney General pursuant to this order.  (b) No individual listed in shall act
as Attorney General unless that individual is otherwise eligible to so serve under the Federal Vacancies Reform Act of
1998.(c) Notwithstanding the provisions of this order, the President retains discretion, to the extent permitted by
law, to depart from this order in designating an acting Attorney General.  .  Revocation of Executive Order.  Executive
Order 13762 of January 13, 2017, is revoked.  .  General Provision.  This order is not intended to, and does not,
create any right or benefit, substantive or procedural, enforceable at law or in equity by any party against the United
States, its departments, agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [26]
[1] "13873"
cat(strwrap(sampled_data$text[26], width = 120), sep = "\n")
, including the International Emergency Economic Powers Act (50 U.S.C. 1701 et seq.  ) (IEEPA), the National
Emergencies Act (50 U.S.C. 1601 et seq.  ), and of title 3, United States Code, I, , President of the United States of
America, find that foreign adversaries are increasingly creating and exploiting vulnerabilities in information and
communications technology and services, which store and communicate vast amounts of sensitive information, facilitate
the digital economy, and support critical infrastructure and vital emergency services, in order to commit malicious
cyber-enabled actions, including economic and industrial espionage against the United States and its people. I further
find that the unrestricted acquisition or use in the United States of information and communications technology or
services designed, developed, manufactured, or supplied by persons owned by, controlled by, or subject to the
jurisdiction or direction of foreign adversaries augments the ability of foreign adversaries to create and exploit
vulnerabilities in information and communications technology or services, with potentially catastrophic effects, and
thereby constitutes an unusual and extraordinary threat to the national security, foreign policy, and economy of the
United States. This threat exists both in the case of individual acquisitions or uses of such technology or services,
and when acquisitions or uses of such technologies are considered as a class. Although maintaining an open investment
climate in information and communications technology, and in the United States economy more generally, is important for
the overall growth and prosperity of the United States, such openness must be balanced by the need to protect our
country against critical national security threats. To deal with this threat, additional steps are required to protect
the security, integrity, and reliability of information and communications technology and services provided and used in
the United States. In light of these findings, I hereby declare a national emergency with respect to this
threat.Accordingly, : .  Implementation.  (a) The following actions are prohibited: any acquisition, importation,
transfer, installation, dealing in, or use of any information and communications technology or service (transaction) by
any person, or with respect to any property, subject to the jurisdiction of the United States, where the transaction
involves any property in which any foreign country or a national thereof has any interest (including through an
interest in a contract for the provision of the technology or service), where the transaction was initiated, is
pending, or will be completed after the date of this order, and where the Secretary of Commerce (Secretary), in
consultation with the Secretary of the Treasury, the Secretary of State, the Secretary of Defense, the Attorney
General, the Secretary of Homeland Security, the United States Trade Representative, the Director of National
Intelligence, the Administrator of General Services, the Chairman of the Federal Communications Commission, and, as
appropriate, the heads of other executive departments and agencies (agencies), has determined that: (i) the transaction
involves information and communications technology or services designed, developed, manufactured, or supplied, by
persons owned by, controlled by, or subject to the jurisdiction or direction of a foreign adversary; and(ii) the
transaction:(A) poses an undue risk of sabotage to or subversion of the design, integrity, manufacturing, production,
distribution, installation, operation, or maintenance of information and communications technology or services in the
United States;(B) poses an undue risk of catastrophic effects on the security or resiliency of United States critical
infrastructure or the digital economy of the United States; or(C) otherwise poses an unacceptable risk to the national
security of the United States or the security and safety of United States persons.(b) The Secretary, in consultation
with the heads of other agencies as appropriate, may at the Secretary's discretion design or negotiate measures to
mitigate concerns identified under (a) of this order. Such measures may serve as a precondition to the approval of a
transaction or of a class of transactions that would otherwise be prohibited pursuant to this order.(c) The
prohibitions in subsection (a) of this section apply except to the extent provided by statutes, or in regulations,
orders, directives, or licenses that may be issued pursuant to this order, and notwithstanding any contract entered
into or any license or permit granted prior to the effective date of this order.  .  Authorities.  (a) The Secretary,
in consultation with, or upon referral of a particular transaction from, the heads of other agencies as appropriate, is
hereby authorized to take such actions, including directing the timing and manner of the cessation of transactions
prohibited pursuant to of this order, adopting appropriate rules and regulations, and employing all other powers
granted to the President by IEEPA, as may be necessary to implement this order. All agencies of the United States
Government are directed to take all appropriate measures within their authority to carry out the provisions of this
order.  (b) Rules and regulations issued pursuant to this order may, among other things, determine that particular
countries or persons are foreign adversaries for the purposes of this order; identify persons owned by, controlled by,
or subject to the jurisdiction or direction of foreign adversaries for the purposes of this order; identify particular
technologies or countries with respect to which transactions involving information and communications technology or
services warrant particular scrutiny under the provisions of this order; establish procedures to license transactions
otherwise prohibited pursuant to this order; establish criteria, consistent with of this order, by which particular
technologies or particular participants in the market for information and communications technology or services may be
recognized as categorically included in or as categorically excluded from the prohibitions established by this order;
and identify a mechanism and relevant factors for the negotiation of agreements to mitigate concerns raised in
connection with sub(a) of this order. Within 150 days of the date of this order, the Secretary, in consultation with
the Secretary of the Treasury, Secretary of State, the Secretary of Defense, the Attorney General, the Secretary of
Homeland Security, the United States Trade Representative, the Director of National Intelligence, the Administrator of
General Services, the Chairman of the Federal Communications Commission and, as appropriate, the heads of other
agencies, shall publish rules or regulations implementing the authorities delegated to the Secretary by this order.(c)
The Secretary may, consistent with applicable law, redelegate any of the authorities conferred on the Secretary
pursuant to this section within the Department of Commerce.  .  Definitions.  For purposes of this order: (a) the term
“entity” means a partnership, association, trust, joint venture, corporation, group, subgroup, or other
organization;(b) the term “foreign adversary” means any foreign government or foreign non-government person engaged in
a long-term pattern or serious instances of conduct significantly adverse to the national security of the United States
or security and safety of United States persons;(c) the term “information and communications technology or services”
means any hardware, software, or other product or service primarily intended to fulfill or enable the function of
information or data processing, storage, retrieval, or communication by electronic means, including transmission,
storage, and display;(d) the term “person” means an individual or entity; and(e) the term “United States person” means
any United States citizen, permanent resident alien, entity organized under the laws of the United States or any
jurisdiction within the United States (including foreign branches), or any person in the United States.  . Recurring
and Final Reports to the Congress. The Secretary, in consultation with the Secretary of State, is hereby authorized to
submit recurring and final reports to the Congress on the national emergency declared in this order, consistent with
(c) of the NEA (50 U.S.C. 1641(c)) and (c) of IEEPA (50 U.S.C. 1703(c)).  .  Assessments and Reports.  (a) The Director
of National Intelligence shall continue to assess threats to the United States and its people from information and
communications technology or services designed, developed, manufactured, or supplied by persons owned by, controlled
by, or subject to the jurisdiction or direction of a foreign adversary. The Director of National Intelligence shall
produce periodic written assessments of these threats in consultation with the heads of relevant agencies, and shall
provide these assessments to the President, the Secretary for the Secretary's use in connection with his
responsibilities pursuant to this order, and the heads of other agencies as appropriate. An initial assessment shall be
completed within 40 days of the date of this order, and further assessments shall be completed at least annually, and
shall include analysis of: (i) threats enabled by information and communications technologies or services designed,
developed, manufactured, or supplied by persons owned by, controlled by, or subject to the jurisdiction or direction of
a foreign adversary; and(ii) threats to the United States Government, United States critical infrastructure, and United
States entities from information and communications technologies or services designed, developed, manufactured, or
supplied by persons owned by, controlled by, or subject to the influence of a foreign adversary.(b) The Secretary of
Homeland Security shall continue to assess and identify entities, hardware, software, and services that present
vulnerabilities in the United States and that pose the greatest potential consequences to the national security of the
United States. The Secretary of Homeland Security, in coordination with sector-specific agencies and coordinating
councils as appropriate, shall produce a written assessment within 80 days of the date of this order, and annually
thereafter. This assessment shall include an evaluation of hardware, software, or services that are relied upon by
multiple information and communications technology or service providers, including the communication services relied
upon by critical infrastructure entities identified pursuant to of Executive Order 13636 of February 12, 2013
(Improving Critical Infrastructure Cybersecurity).  (c) Within 1 year of the date of this order, and annually
thereafter, the Secretary, in consultation as appropriate with the Secretary of the Treasury, the Secretary of Homeland
Security, Secretary of State, the Secretary of Defense, the Attorney General, the United States Trade Representative,
the Director of National Intelligence, and the Chairman of the Federal Communications Commission, shall assess and
report to the President whether the actions taken by the Secretary pursuant to this order are sufficient and continue
to be necessary to mitigate the risks identified in, and pursuant to, this order.  .  General Provisions.  (a) Nothing
in this order shall be construed to impair or otherwise affect: (i) the authority granted by law to an executive
department or agency, or the head thereof; or(ii) the functions of the Director of the Office of Management and Budget
relating to budgetary, administrative, or legislative proposals.(b) This order shall be implemented consistent with
applicable law and subject to the availability of appropriations.(c) This order is not intended to, and does not,
create any right or benefit, substantive or procedural, enforceable at law or in equity by any party against the United
States, its departments, agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [27]
[1] "13973"
cat(strwrap(sampled_data$text[27], width = 120), sep = "\n")
, including the Federal Vacancies Reform Act of 1998, as amended, 5 U.S.C. 3345 et seq . (the “Act”), : .  Order of
Succession . Subject to the provisions of of this order, and to the limitations set forth in the Act, the following
officials of the Environmental Protection Agency, in the order listed, shall act as and perform the functions and
duties of the office of the Administrator of the Environmental Protection Agency (Administrator) during any period in
which the Administrator and the Deputy Administrator of the Environmental Protection Agency have died, resigned, or
otherwise become unable to perform the functions and duties of the office of Administrator: (a) General Counsel;(b)
Assistant Administrator, Office of Solid Waste (also known as the Assistant Administrator for the Office of Land and
Emergency Management);(c) Assistant Administrator for Toxic Substances (also known as the Assistant Administrator for
the Office of Chemical Safety and Pollution Prevention);(d) Assistant Administrator for the Office of Air and
Radiation;(e) Assistant Administrator for the Office of Water;(f) Assistant Administrator for the Office of Enforcement
and Compliance Assurance;(g) Chief Financial Officer;(h) Assistant Administrator for the Office of Research and
Development; (i) Assistant Administrator for the Office of International and Tribal Affairs;(j) Assistant Administrator
for the Office of Mission Support; (k) Associate Deputy Administrator for Programs;(l) Associate Deputy
Administrator;(m) Regional Administrator, Region VIII;(n) Principal Deputy Assistant Administrator for the Office of
Mission Support;(o) Deputy Regional Administrator, Region VIII;(p) Principal Deputy General Counsel; and(q) Principal
Deputy Assistant Administrator for the Office of Enforcement and Compliance Assurance.  .  Exceptions . (a) No
individual who is serving in an office listed in (a)-(q) of this order in an acting capacity shall, by virtue of so
serving, act as Administrator pursuant to this order.  (b) No individual listed in (a)-(q) of this order shall act as
Administrator unless that individual is otherwise eligible to so serve under the Act.  (c) Notwithstanding the
provisions of this order, the President retains discretion, to the extent permitted by law, to depart from this order
in designating an acting Administrator.  .  Revocation . Executive Order 13763 of January 13, 2017 (Providing an Order
of Succession Within the Environmental Protection Agency), is hereby revoked.  .  General Provision . This order is not
intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law or in equity by
any party against the United States, its departments, agencies, or entities, its officers, employees, or agents, or any
other person.
sampled_data$executive_order_number [28]
[1] "13929"
cat(strwrap(sampled_data$text[28], width = 120), sep = "\n")
, : .  Purpose.  As Americans, we believe that all persons are created equal and endowed with the inalienable rights to
life and liberty. A fundamental purpose of government is to secure these inalienable rights. Federal, State, local,
tribal, and territorial law enforcement officers place their lives at risk every day to ensure that these rights are
preserved.  Law enforcement officers provide the essential protection that all Americans require to raise their
families and lead productive lives. The relationship between our fellow citizens and law enforcement officers is an
important element in their ability to provide that protection. By working directly with their communities, law
enforcement officers can help foster a safe environment where we all can prosper.Unfortunately, there have been
instances in which some officers have misused their authority, challenging the trust of the American people, with
tragic consequences for individual victims, their communities, and our Nation. All Americans are entitled to live with
the confidence that the law enforcement officers and agencies in their communities will live up to our Nation's
founding ideals and will protect the rights of all persons. Particularly in African-American communities, we must
redouble our efforts as a Nation to swiftly address instances of misconduct.The Constitution declares in its preamble
that one of its primary purposes was to establish Justice. Generations of Americans have marched, fought, bled, and
died to safeguard the promise of our founding document and protect our shared inalienable rights. Federal, State,
local, tribal, and territorial leaders must act in furtherance of that legacy.  .  Certification and Credentialing.
(a) State and local law enforcement agencies must constantly assess and improve their practices and policies to ensure
transparent, safe, and accountable delivery of law enforcement services to their communities. Independent credentialing
bodies can accelerate these assessments, enhance citizen confidence in law enforcement practices, and allow for the
identification and correction of internal deficiencies before those deficiencies result in injury to the public or to
law enforcement officers.  (b) The Attorney General shall, as appropriate and consistent with applicable law, allocate
Department of Justice discretionary grant funding only to those State and local law enforcement agencies that have
sought or are in the process of seeking appropriate credentials from a reputable independent credentialing body
certified by the Attorney General.  (c) The Attorney General shall certify independent credentialing bodies that meet
standards to be set by the Attorney General. Reputable, independent credentialing bodies, eligible for certification by
the Attorney General, should address certain topics in their reviews, such as policies and training regarding
use-of-force and de-escalation techniques; performance management tools, such as early warning systems that help to
identify officers who may require intervention; and best practices regarding community engagement. The Attorney
General's standards for certification shall require independent credentialing bodies to, at a minimum, confirm that:
(i) the State or local law enforcement agency's use-of-force policies adhere to all applicable Federal, State, and
local laws; and(ii) the State or local law enforcement agency's use-of-force policies prohibit the use of chokeholds—a
physical maneuver that restricts an individual's ability to breathe for the purposes of incapacitation—except in those
situations where the use of deadly force is allowed by law.(d) The Attorney General shall engage with existing and
prospective independent credentialing bodies to encourage them to offer a cost-effective, targeted credentialing
process regarding appropriate use-of-force policies that law enforcement agencies of all sizes in urban and rural
jurisdictions may access.  .  Information Sharing.  (a) The Attorney General shall create a database to coordinate the
sharing of information between and among Federal, State, local, tribal, and territorial law enforcement agencies
concerning instances of excessive use of force related to law enforcement matters, accounting for applicable privacy
and due process rights.  (b) The database described in subsection (a) of this section shall include a mechanism to
track, as permissible, terminations or de-certifications of law enforcement officers, criminal convictions of law
enforcement officers for on-duty conduct, and civil judgments against law enforcement officers for improper use of
force. The database described in subsection (a) of this section shall account for instances where a law enforcement
officer resigns or retires while under active investigation related to the use of force. The Attorney General shall
take appropriate steps to ensure that the information in the database consists only of instances in which law
enforcement officers were afforded fair process.(c) The Attorney General shall regularly and periodically make
available to the public aggregated and anonymized data from the database described in subsection (a) of this section,
as consistent with applicable law.(d) The Attorney General shall, as appropriate and consistent with applicable law,
allocate Department of Justice discretionary grant funding only to those law enforcement agencies that submit the
information described in subsection (b) of this section.  .  Mental Health, Homelessness, and Addiction.  (a) Since the
mid-twentieth century, America has witnessed a reduction in targeted mental health treatment. Ineffective policies have
left more individuals with mental health needs on our Nation's streets, which has expanded the responsibilities of law
enforcement officers. As a society, we must take steps to safely and humanely care for those who suffer from mental
illness and substance abuse in a manner that addresses such individuals' needs and the needs of their communities. It
is the policy of the United States to promote the use of appropriate social services as the primary response to
individuals who suffer from impaired mental health, homelessness, and addiction, recognizing that, because law
enforcement officers often encounter such individuals suffering from these conditions in the course of their duties,
all officers should be properly trained for such encounters.  (b) The Attorney General shall, in consultation with the
Secretary of Health and Human Services as appropriate, identify and develop opportunities to train law enforcement
officers with respect to encounters with individuals suffering from impaired mental health, homelessness, and
addiction; to increase the capacity of social workers working directly with law enforcement agencies; and to provide
guidance regarding the development and implementation of co-responder programs, which involve social workers or other
mental health professionals working alongside law enforcement officers so that they arrive and address situations
together. The Attorney General and the Secretary of Health and Human Services shall prioritize resources, as
appropriate and consistent with applicable law, to support such opportunities.  (c) The Secretary of Health and Human
Services shall survey community-support models addressing mental health, homelessness, and addiction. Within 90 days of
the date of this order, the Secretary of Health and Human Services shall summarize the results of this survey in a
report to the President, through the Assistant to the President for Domestic Policy and the Director of the Office of
Management and Budget, which shall include specific recommendations regarding how appropriated funds can be reallocated
to support widespread adoption of successful models and recommendations for additional funding, if needed.(d) The
Secretary of Health and Human Services shall, in coordination with the Attorney General and the Director of the Office
of Management and Budget, prioritize resources, as appropriate and consistent with applicable law, to implement
community-support models as recommended in the report described in subsection (c) of this section.  .  Legislation and
Grant Programs.  (a) The Attorney General, in consultation with the Assistant to the President for Domestic Policy and
the Director of the Office of Management and Budget, shall develop and propose new legislation to the Congress that
could be enacted to enhance the tools and resources available to improve law enforcement practices and build community
engagement.  (b) The legislation described in subsection (a) of this section shall include recommendations to enhance
current grant programs to improve law enforcement practices and build community engagement, including through:(i)
assisting State and local law enforcement agencies with implementing the credentialing process described in of this
order, the reporting described in of this order, and the co-responder and community-support models described in of this
order;(ii) training and technical assistance required to adopt and implement improved use-of-force policies and
procedures, including scenario-driven de-escalation techniques;(iii) retention of high-performing law enforcement
officers and recruitment of law enforcement officers who are likely to be high-performing;(iv) confidential access to
mental health services for law enforcement officers; and(v) programs aimed at developing or improving relationships
between law enforcement and the communities they serve, including through community outreach and listening sessions,
and supporting non-profit organizations that focus on improving stressed relationships between law enforcement officers
and the communities they serve.  .  General Provisions.  (a) Nothing in this order shall be construed to impair or
otherwise affect: (i) the authority granted by law to an executive department or agency, or the head thereof; or(ii)
the functions of the Director of the Office of Management and Budget relating to budgetary, administrative, or
legislative proposals.(b) This order shall be implemented consistent with applicable law and subject to the
availability of appropriations.(c) This order is not intended to, and does not, create any right or benefit,
substantive or procedural, enforceable at law or in equity by any party against the United States, its departments,
agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [29]
[1] "13826"
cat(strwrap(sampled_data$text[29], width = 120), sep = "\n")
, and in order to maximize the impact of Federal Government resources to keep our communities safe, : .  Purpose.  The
Federal Government must reduce crime, enhance public safety, and increase opportunity, thereby improving the lives of
all Americans. In 2016, the violent crime rate in the United States increased by 3.4 percent, the largest single-year
increase since 1991. Additionally, in 2016, there were more than 17,000 murders and nonnegligent manslaughters in the
United States, a more than 20 percent increase in just 2 years. The Department of Justice, alongside State, local, and
tribal law enforcement, has focused its efforts on the most violent criminals. Preliminary statistics indicate that, in
the last year, the increase in the murder rate slowed and the violent crime rate decreased.  To further improve public
safety, we should aim not only to prevent crime in the first place, but also to provide those who have engaged in
criminal activity with greater opportunities to lead productive lives. The Federal Government can assist in breaking
this cycle of crime through a comprehensive strategy that addresses a range of issues, including mental health,
vocational training, job creation, after-school programming, substance abuse, and mentoring. Incarceration is necessary
to improve public safety, but its effectiveness can be enhanced through evidence-based rehabilitation programs. These
efforts will lower recidivism rates, ease incarcerated individuals' reentry into the community, reduce future
incarceration costs, and promote positive social and economic outcomes.  .  Policy.  It is the policy of the United
States to prioritize efforts to prevent youths and adults from entering or reentering the criminal justice system.
While investigating crimes and prosecuting perpetrators must remain the top priority of law enforcement, crime
reduction policy should also include efforts to prevent crime in the first place and to lower recidivism rates. These
efforts should address a range of social and economic factors, including poverty, lack of education and employment
opportunities, family dissolution, drug use and addiction, mental illness, and behavioral health conditions. The
Federal Government must harness and wisely direct its considerable resources and broad expertise to identify and help
implement improved crime prevention strategies, including evidence-based practices that reduce criminal activity among
youths and adults. Through effective coordination among executive departments and agencies (agencies), the Federal
Government can have a constructive role in preventing crime and in ensuring that the correctional facilities in the
United States prepare inmates to successfully reenter communities as productive, law-abiding members of society.  .
Establishment of the Federal Interagency Council on Crime Prevention and Improving Reentry.  (a) There is hereby
established the Federal Interagency Council on Crime Prevention and Improving Reentry (Council), co-chaired by the
Attorney General, the Assistant to the President for Domestic Policy, and the Senior Advisor to the President in charge
of the White House Office of American Innovation, or their respective designees. In addition to the Co-Chairs, the
Council shall include the heads of the following entities, or their designees: (i) The Department of the Treasury;(ii)
The Department of the Interior;(iii) The Department of Agriculture;(iv) The Department of Commerce;(v) The Department
of Labor;(vi) The Department of Health and Human Services;(vii) The Department of Housing and Urban Development;(viii)
The Department of Education;(ix) The Department of Veterans Affairs;(x) The Office of Management and Budget; and(xi)
The Office of National Drug Control Policy.(b) As appropriate, and consistent with applicable law, the Co-Chairs may
invite representatives of other agencies and Federal entities to participate in the activities of the Council.(c) As
appropriate, the Co-Chairs may invite representatives of the judicial branch to attend and participate in meetings of
the Council.(d) The Council shall engage with Federal, State, local, and tribal officials, including correctional
officials, to carry out its objectives. The Council shall also engage with key stakeholders, such as law enforcement,
faith-based and community groups, businesses, associations, volunteers, and other stakeholders that play a role in
preventing youths and adults from entering or reentering the criminal justice system.(e) The Attorney General, in
consultation with the Co-Chairs, shall designate an Executive Director, who shall be a full-time officer or employee of
the Department of Justice, to coordinate the day-to-day functions of the Council.(f) The Co-Chairs shall convene a
meeting of the Council once per quarter.(g) The Department of Justice shall provide such funding and administrative
support for the Council, to the extent permitted by law and within existing appropriations, as may be necessary for the
performance of its functions.(h) To the extent permitted by law, including the Economy Act (31 U.S.C. 1535), and within
existing appropriations, other agencies may detail staff to the Council, or otherwise provide administrative support,
in order to advance the Council's functions.(i) The heads of agencies shall provide, as appropriate and to the extent
permitted by law, such assistance and information as the Council may request to implement this order.  .
Recommendations and Report.  (a) The Council shall develop recommendations for evidence-based programmatic and other
reforms, with consideration and acknowledgment of potential resource limitations, to: (i) help prevent, through
programs that reduce unlawful behavior (such as mental and behavioral health services), youths and adults from engaging
in criminal activity;(ii) improve collaboration between Federal, State, local, and tribal governments through
dissemination of evidence-based best practices to reduce the rate of recidivism. In identifying these practices, the
Council shall consider factors such as: (A) inmates' access to education, educational testing, pre-apprenticeships,
apprenticeships, career and technical education training, and work programs; (B) inmates' access to mentors and
mentorship services during incarceration and as they transition back into the community;(C) inmates' access to mental
and behavioral health services;(D) treatment of substance abuse and addiction for inmates;(E) documented trauma history
assessments, victim services, violent crime prevention, community-based trauma-informed programs, and domestic violence
and sexual violence support services;(F) family support for inmates;(G) available partnerships with law enforcement,
faith-based and other community organizations, businesses, associations, and other stakeholders, especially through
indirect funding mechanisms; and(H) incentives for the private sector, small businesses, and other nongovernmental
entities to create job opportunities for individuals, before and after they enter the criminal justice system, using
existing tax credit programs;(iii) analyze effective ways to overcome barriers or disincentives to participation in
programs related to education, housing, job placement and licensing, and other efforts to re-integrate offenders into
society;(iv) enhance coordination and reduce duplication of crime-prevention efforts across the Federal Government in
order to maximize effectiveness and reduce costs to the taxpayer; and(v) facilitate research in the areas described in
this subsection, including improved access to data for research and evaluation purposes.(b) The Council shall develop
and present to the President, through the Assistant to the President for Domestic Policy:(i) an initial report,
submitted within 90 days of the date of this order, outlining a timeline and steps that will be taken to fulfill the
requirements of this order; and(ii) a full report detailing the Council's recommendations, submitted within 1 year of
the date of this order, and status updates on their implementation for each year this order is in effect. The Council
shall review and update its recommendations periodically, as appropriate, and shall, through the Assistant to the
President for Domestic Policy, present to the President any updated findings.  .  Revocation.  The Presidential
Memorandum of April 29, 2016 (Promoting Rehabilitation and Reintegration of Formerly Incarcerated Individuals), is
hereby revoked.  .  Termination.  This order (with the exceptions of sections 5 and 7) and the Council it establishes
shall terminate 3 years after the date of this order.  .  General Provisions.  (a) Nothing in this order shall be
construed to impair or otherwise affect: (i) the authority granted by law to an executive department or agency, or the
head thereof; or(ii) the functions of the Director of the Office of Management and Budget relating to budgetary,
administrative, or legislative proposals.(b) This order shall be implemented consistent with applicable law and subject
to the availability of appropriations.(c) This order is not intended to, and does not, create any right or benefit,
substantive or procedural, enforceable at law or in equity by any party against the United States, its departments,
agencies, or entities, its officers, employees, or agents, or any other person.
sampled_data$executive_order_number [30]
[1] "13838"
cat(strwrap(sampled_data$text[30], width = 120), sep = "\n")
, including the Federal Property and Administrative Services Act, 40 U.S.C. 101 et seq ., and in order to ensure that
the Federal Government can economically and efficiently provide the services that allow visitors of all means to enjoy
the natural beauty of Federal parks and other Federal lands, : .  Policy . Executive Order 13658 of February 12, 2014
(Establishing a Minimum Wage for Contractors), established a minimum wage to be paid by parties who contract with the
Federal Government and applies to outfitters and guides operating on Federal lands. These individuals often conduct
multiday recreational tours through Federal lands, and may be required to work substantial overtime hours. The
implementation of Executive Order 13658 threatens to raise significantly the cost of guided hikes and tours on Federal
lands, preventing many visitors from enjoying the great beauty of America's outdoors. Seasonal recreational workers
have irregular work schedules, a high incidence of overtime pay, and an unusually high turnover rate, among other
distinguishing characteristics. As a consequence, a minimum wage increase would generally entail large negative effects
on hours worked by recreational service workers. Thus, applying Executive Order 13658 to these service contracts does
not promote economy and efficiency in making these services available to those who seek to enjoy our Federal lands.
That rationale, however, does not apply with the same force to lodging and food services associated with seasonal
recreational services, which generally involve more regular work schedules and normal amounts of overtime work.
Executive Order 13658 therefore should continue to apply to lodging and food services associated with seasonal
recreational services.  .  Exemption from Executive Order 13658 . (f) of Executive Order 13658 is amended by inserting
at its end the following language: “This order shall not apply to contracts or contract-like instruments entered into
with the Federal Government in connection with seasonal recreational services or seasonal recreational equipment rental
for the general public on Federal lands, but this exemption shall not apply to lodging and food services associated
with seasonal recreational services. Seasonal recreational services include river running, hunting, fishing, horseback
riding, camping, mountaineering activities, recreational ski services, and youth camps.” .  Agency Implementation .
Executive departments and agencies (agencies) shall promptly take appropriate action to implement this exemption and to
ensure that all applicable regulations and agency guidance are consistent with this order. Agencies shall modify
existing authorizations and solicitations for contracts or contract-like instruments affected by of this order by
removing clauses requiring compliance with Executive Order 13658 (including the contract clause set forth at title 29,
part 10, appendix A, Code of Federal Regulations) as soon as practicable and consistent with applicable law. Agencies
shall remove such clauses without impairing the recreational activities or uses authorized by those permits and
contracts.  .  General Provisions . (a) Nothing in this order shall be construed to impair or otherwise affect: (i) the
authority granted by law to an executive department or agency, or the head thereof; or(ii) the functions of the
Director of the Office of Management and Budget relating to budgetary, administrative, or legislative proposals.(b)
This order shall be implemented consistent with applicable law and subject to the availability of appropriations.(c)
This order is not intended to, and does not, create any right or benefit, substantive or procedural, enforceable at law
or in equity by any party against the United States, its departments, agencies, or entities, its officers, employees,
or agents, or any other person.

Front-end Matters

eo_text_corpus <- corpus(merged_df_all$text, docnames = merged_df_all$document_number)
Warning: NA is replaced by empty string
eo_text_summary <- summary(eo_text_corpus) ## Have an overview of the data
eo_text_summary
Corpus consisting of 788 documents, showing 100 documents:

     Text Types Tokens Sentences
 02-14807   290    876        17
 02-11166   333    956        20
  01-2851   297    980        16
 04-11991   203   1112        10
 03-12661    38     55         1
 03-24217   239    801        16
 03-19573   415   1765        23
 03-20013   432   2327        56
 03-29644   276    868        12
  04-1322   197    428         6
 04-18575   177    446        18
 04-20050   474   2159        18
 04-20052   519   2161        14
 03-32332   111    305        10
 03-32328   187    562        17
  04-6622   270    825        13
 04-12745   271    888        14
 04-13123    92    165         4
 03-30913    86    152         4
 03-30513    83    152         5
  03-7736  1485  11810       151
  03-5343  1100   9792       134
  03-8108    85    163         2
  05-7830   109    198         2
  05-3385   226    718        10
 04-28079   326   1205        14
 04-10024   329   1032        11
 05-13214   363   1577        14
 03-22543   416   1628        27
 03-13750    73    144         3
 03-14116   111    234         5
 03-14117    56     93         1
   08-970   425   2394        23
   07-780   143    337         9
  07-2027   729   5113        83
  07-2570   327   1337        14
  08-1215   347   1288        14
  07-5919   167    365        18
 E8-28912   238    908        33
  04-4884   356   1145        12
  04-4436   210    680        11
  04-4451   382   1165        16
 04-10377   405   1381        26
  04-8616   151    345        15
 05-12284    65    103         2
 05-12354   169    522         5
 04-26684   122    312         3
 04-26686   276    827         9
 04-25866   193    481         6
  08-1480   351   1341        11
  07-4906   429   1562        28
  07-4907   115    253         4
  07-4023   173    516         8
   08-797   147    395         6
  08-1409   670   3205        23
  07-4600    58    110         1
  07-5299   248    674         7
 E8-23235   153    354         3
  05-5097   169    589         4
   E9-811   168    476         3
   E9-814   181    506         6
  07-6022    86    152         4
  07-1816   182    461        21
 01-31671   104    301         5
 01-31670   120    373         5
  07-5816    81    149         5
  01-4622   327   1011        10
  01-6558   157    341        14
  02-7087   166   1086         6
  07-3656   411   1488        14
  07-3593   284    866        17
 E8-27777   302   1184        12
 E8-30042   111    212         5
  E9-1574   332   1143        18
  E9-1538   162    389        11
   E9-818   318   1102        11
 01-16668   355   1207        12
  02-1594   163    388         1
   02-917   103    297         4
  02-4071   275    793         6
  02-5069   123    853         3
  01-8835   142    412         8
  01-8836    55    122         1
  02-2638   354   1333        27
   02-918   177    720         5
 01-29831   115    202         5
 E8-30700   197    596        17
 02-14497    69    122         4
 02-31624   296    819        13
 02-16040   276    705        13
 02-16041   153    392        12
 01-28762   163    404        11
 01-29219    79    165         3
 01-27917   455   2361        48
   06-554    60     99         5
  06-4652   174    556         4
   07-293   369   1309        12
  06-9993    94    167         5
  06-9896   188    609        19
 05-21571   364   1441        14
eo_stopwords <- c(
  # Generic EO scaffolding
  "section","sections","subsection","subsections","paragraph","paragraphs",
  "clause","clauses","order","orders","executive","presidential","proclamation","ii","iii",
  # Formal opening boilerplate
  "authority","vested","constitution","laws","united","states","america",
  "federal","government","department","agencies","agency","office","official",
  "secretary","director","administrator","council","board",
  # Common verbs in EO legal phrasing
  "shall","hereby","thereof","therein","herein","within","thereby","pursuant",
  # Frequent EO nouns that are usually boilerplate
  "policy","policies","program","programs","initiative","initiatives",
  "report","reports","guidance","requirements","implementation",
  "plan","plans","regulation","regulations","rule","rules",
  # Common structural/administrative filler
  "established","establish","establishment","create","created","creation",
  "amend","amended","amendment","termination","terminate","revoked","revoke",
  "effective","date","period","days","duration","applicable","application",
  # Geographic boilerplate
  "national","nation","state","states","district","territory","territories",
  "region","regions","regional",
  # Miscellaneous
  "executed","execution","signed","sign","issuance","issued",
  "implement","implementation")
eo_stopwords <- str_c(eo_stopwords, collapse = "|")
eo_text_corpus_clean <- str_remove_all(eo_text_corpus, regex(eo_stopwords, ignore_case = TRUE))
eo_text_tokens <- tokens(eo_text_corpus_clean,
    remove_punct = T,
    remove_numbers = T)
eo_text_tokens <- tokens_select(eo_text_tokens, pattern = stopwords("en"), selection = "remove",min_nchar = 3)
eo_text_tokens <- tokens_tolower (eo_text_tokens)
eo_text_tokens <- tokens_wordstem (eo_text_tokens)
eo_text_tokens
Tokens consisting of 788 documents.
text1 :
 [1] "expand" "branch" "physic" "fit"    "sport"  "presid" "physic" "fit"   
 [9] "sport"  "purpos" "health" "human" 
[ ... and 286 more ]

text2 :
 [1] "improv"   "mental"   "health"   "servic"   "deliveri" "system"  
 [7] "individu" "serious"  "mental"   "ill"      "children" "serious" 
[ ... and 380 more ]

text3 :
 [1] "help"       "coordin"    "effort"     "expand"     "opportun"  
 [6] "faith-bas"  "communiti"  "organ"      "strengthen" "capac"     
[11] "better"     "meet"      
[ ... and 328 more ]

text4 :
 [1] "includ"    "titl"      "code"      "result"    "enact"     "ocean"    
 [7] "atmospher" "administr" "commiss"   "corp"      "act"       "public"   
[ ... and 300 more ]

text5 :
 [1] "septemb" "decemb"  "delet"   "word"    "four"    "first"   "sentenc"
 [8] "insert"  "place"   "word"    "five"   

text6 :
 [1] "accord"   "provis"   "advisori" "committe" "act"      "u.s.c"   
 [7] "app"      "advisori" "committe" "list"     "continu"  "septemb" 
[ ... and 182 more ]

[ reached max_ndoc ... 782 more documents ]
print(eo_text_tokens)
Tokens consisting of 788 documents.
text1 :
 [1] "expand" "branch" "physic" "fit"    "sport"  "presid" "physic" "fit"   
 [9] "sport"  "purpos" "health" "human" 
[ ... and 286 more ]

text2 :
 [1] "improv"   "mental"   "health"   "servic"   "deliveri" "system"  
 [7] "individu" "serious"  "mental"   "ill"      "children" "serious" 
[ ... and 380 more ]

text3 :
 [1] "help"       "coordin"    "effort"     "expand"     "opportun"  
 [6] "faith-bas"  "communiti"  "organ"      "strengthen" "capac"     
[11] "better"     "meet"      
[ ... and 328 more ]

text4 :
 [1] "includ"    "titl"      "code"      "result"    "enact"     "ocean"    
 [7] "atmospher" "administr" "commiss"   "corp"      "act"       "public"   
[ ... and 300 more ]

text5 :
 [1] "septemb" "decemb"  "delet"   "word"    "four"    "first"   "sentenc"
 [8] "insert"  "place"   "word"    "five"   

text6 :
 [1] "accord"   "provis"   "advisori" "committe" "act"      "u.s.c"   
 [7] "app"      "advisori" "committe" "list"     "continu"  "septemb" 
[ ... and 182 more ]

[ reached max_ndoc ... 782 more documents ]
dfmat_eo_text <- dfm(eo_text_tokens)
docvars(dfmat_eo_text, "president") <- merged_df_all$president
docnames(dfmat_eo_text) <- merged_df_all$document_number
dfmat_eo_text
Document-feature matrix of: 788 documents, 8,486 features (97.83% sparse) and 1 docvar.
          features
docs       expand branch physic fit sport presid purpos health human servic
  02-14807      3      1     14   6    10     11      1      2     2      5
  02-11166      0      1      0   0     0     10      0     13     4     18
  01-2851       1      0      0   0     0      0      2      3     3      6
  04-11991      0      0      0   0     0      3      0      1     1      5
  03-12661      0      0      0   0     0      0      0      0     0      0
  03-24217      1      0      1   1     1     17      0      5     3      4
[ reached max_ndoc ... 782 more documents, reached max_nfeat ... 8,476 more features ]
term_df <- docfreq(dfmat_eo_text)
num_docs <- ndoc(eo_text_corpus)
# Find terms occurring in 90% of documents
terms_90_percent <- names(term_df[term_df >= 0.90 * num_docs])

# Find terms occurring in 80% of documents
terms_80_percent <- names(term_df[term_df >= 0.80 * num_docs])

# Find terms occurring in 70% of documents
terms_70_percent <- names(term_df[term_df >= 0.70 * num_docs])

# Print the results
cat("Terms in 90% or more of documents:", paste(terms_90_percent, collapse = ", "), "\n")
Terms in 90% or more of documents:  
cat("Terms in 80% or more of documents:", paste(terms_80_percent, collapse = ", "), "\n")
Terms in 80% or more of documents: benefit, law, includ, person, procedur, employe, intend 
cat("Terms in 70% or more of documents:", paste(terms_70_percent, collapse = ", "), "\n")
Terms in 70% or more of documents: presid, benefit, may, function, provis, entiti, administr, law, includ, person, appropri, general, act, procedur, provid, employe, otherwis, right, substant, enforc, equiti, intend, parti 
dfm_data_1 <- dfm(tokens(eo_text_corpus))
term_df_1 <- docfreq(dfm_data_1)
# Find terms occurring in 90% of documents
terms_90_percent_1 <- names(term_df_1[term_df_1 >= 0.90 * num_docs])

# Find terms occurring in 80% of documents
terms_80_percent_1 <- names(term_df_1[term_df_1 >= 0.80 * num_docs])

# Find terms occurring in 70% of documents
terms_70_percent_1 <- names(term_df[term_df_1 >= 0.70 * num_docs])

# Print the results
cat("Terms in 90% or more of documents:", paste(terms_90_percent_1, collapse = ", "), "\n")
Terms in 90% or more of documents: ,, and, to, the, executive, for, (, ), :, ., of, shall, in, a, this, b, as, or, is, by, order, other, any, united, states 
cat("Terms in 80% or more of documents:", paste(terms_80_percent_1, collapse = ", "), "\n")
Terms in 80% or more of documents: ,, and, to, the, executive, for, on, (, ), :, ., of, shall, in, a, this, ;, b, that, c, agencies, with, as, or, is, be, by, order, not, at, law, including, other, its, any, united, states, officers, employees, against 
cat("Terms in 70% or more of documents:", paste(terms_70_percent_1, collapse = ", "), "\n")
Terms in 70% or more of documents: expand, branch, physic, sport, presid, human, enhanc, activ, interest, awar, benefit, coordi, promot, safe, broader, emphasi, risk, dispar, one, year, opportun, partnership, extend, monitor, subject, assist, receiv, travel, expens, matter, meet, voluntari, general, insofar, accord, deliveri, provid, officio, enabl, can, differ, formul, maximum, unnecessari, ism, flexibl, better, facial, remov, reform, septemb, sentenc, occup, annex, attach, legal, equival, privileg, immun, promulg, des, certif, met, redeleg, 106-398;2, understand, cite 
quanteda::ntoken(dfmat_eo_text)
     02-14807      02-11166       01-2851      04-11991      03-12661 
          298           392           340           312            11 
     03-24217      03-19573      03-20013      03-29644       04-1322 
          194           510           705           298           152 
     04-18575      04-20050      04-20052      03-32332      03-32328 
          134           697           724            78           192 
      04-6622      04-12745      04-13123      03-30913      03-30513 
          237           315            44            47            49 
      03-7736       03-5343       03-8108       05-7830       05-3385 
         4227          2490            50            49           186 
     04-28079      04-10024      05-13214      03-22543      03-13750 
          403           419           460           497            40 
     03-14116      03-14117        08-970        07-780       07-2027 
           88            45           714           103          1740 
      07-2570       08-1215       07-5919      E8-28912       04-4884 
          420           381           111           265           408 
      04-4436       04-4451      04-10377       04-8616      05-12284 
          199           424           535            98            26 
     05-12354      04-26684      04-26686      04-25866       08-1480 
          121            81           247           121           384 
      07-4906       07-4907       07-4023        08-797       08-1409 
          479            82           126           106          1123 
      07-4600       07-5299      E8-23235       05-5097        E9-811 
           41           226           113           171           121 
       E9-814       07-6022       07-1816      01-31671      01-31670 
          137            47           142            68           106 
      07-5816       01-4622       01-6558       02-7087       07-3656 
           66           340            99           230           518 
      07-3593      E8-27777      E8-30042       E9-1574       E9-1538 
          328           357            61           395           121 
       E9-818      01-16668       02-1594        02-917       02-4071 
          349           362           123            77           279 
      02-5069       01-8835       01-8836       02-2638        02-918 
          223           110            22           449           151 
     01-29831      E8-30700      02-14497      02-31624      02-16040 
           71           210            29           295           271 
     02-16041      01-28762      01-29219      01-27917        06-554 
          119           141            48           942            46 
      06-4652        07-293       06-9993       06-9896      05-21571 
          120           344            44           209           428 
     05-20944      02-21056        03-464      03-11969      03-12071 
         1586           288           183           204            92 
      03-7313      03-10194      01-14319      01-15958      01-24917 
           53            77            76           443           178 
     01-24983      02-17274       06-4132       06-4121       06-9020 
          161           635           268           521           446 
      06-9619       06-7220       06-3865       06-2362      01-31959 
          432           408           367           272            99 
      01-9086      01-26509      01-26339      01-30624      01-13381 
          129          1724           545            47           300 
      03-2606       03-1798       03-8832      03-19675       07-3259 
          299           297           115           134            13 
      07-3258       07-2367       06-6101      05-20156      04-17636 
           22           124           106            33           311 
     04-15787       03-5848      E8-24465       05-9892       07-2518 
           21           225           368           148           169 
     E8-20436      01-15758      01-13869       06-5592      01-21338 
           47           333           279           383           211 
      04-2773      03-20764      03-31594      04-11592      04-11271 
          799            15            46           549           476 
      04-2408       04-1941       01-3883       01-2852      04-10378 
          259           155            33           336           418 
     04-20051      03-05344       03-6445       03-8109      03-12766 
          881           654           220            71           224 
      06-7492      05-19993      05-22132      05-22133       07-3112 
          359           447           249           263           385 
     01-25788       03-2069      03-19572      04-17150      04-17205 
           17           435            70           271           465 
     04-17204      04-20049      04-19909      04-24098      03-19676 
           45           413           196           398           343 
      06-5828       06-5829       06-8769        07-374       06-5984 
          200           435           402           963            13 
     05-23412      05-24596      05-24597      05-24255       06-5351 
          360           196           144           876           231 
      06-4085       06-4552       06-9770       06-9148       03-7160 
          405           433            33            46           164 
      07-3835       01-4624      01-17041      01-13117      01-13116 
          388            36            22           182           229 
     02-16951      02-17273      02-22526       01-4621       01-4623 
          153            72           103           749            46 
     01-29948      02-07086      02-07085      01-31119      03-11713 
          388           330            87            22           103 
     02-25900      02-32518      03-10606       06-1316      01-19562 
          119            54           255           513           112 
     01-24205      01-25677      01-25344      03-16102      04-23994 
          590          1132           453           129           101 
     01-11210      01-11505      02-29580      02-29832      02-31831 
           17           292           326           307           796 
     04-15933      04-15934      03-24919      05-13098       05-1886 
          347           236           335           504           169 
     04-28404      04-22212        05-306        05-771      04-26685 
           74           167           195           285           194 
     04-27076      04-21411      05-14452        08-658       05-7831 
         1402           118            55           445            53 
      05-1170       05-5434      E8-24342      03-13694      03-13412 
           82           104            98           467           279 
       08-761       06-9561        07-419       06-9895      05-15160 
          368            32            14           344            52 
      02-9536        02-919       02-3337       02-3826      01-14862 
         1739            50            13           473            41 
        08-62        08-325        08-360      E8-29564      01-31665 
          192           336           683           120            49 
     01-31667      01-31668      01-31669      01-31672       08-1182 
           81           116            73            91            35 
     02-17640      01-23359      02-24252       04-3170      02-31832 
          332           279           364           605           299 
     01-26990        02-448       06-9632       05-6907       07-5270 
           22           192           112            46           447 
     E8-17940       08-1472      E8-26531       07-4115      E8-27771 
         3673            71           221           232            79 
     E8-23125        08-568        08-483       04-5322      E8-21651 
          256           114           307           194           209 
      07-1704       07-2462       07-1137       07-1152       08-1348 
           52           396           479            48           478 
      07-4890      04-11058       07-3552       08-1399       07-5726 
          353           693           367           255           585 
     01-31666    2015-03714    2015-07788    2015-07016    2015-05677 
           83           951           498          3268           540 
   2015-18292    2015-19183     2010-9078    2010-10172     2010-7154 
          267           769           232           270           384 
   2010-11557     2010-9796    2015-16334    2011-19156    2015-20801 
          160           364           226           432           317 
   2015-22888     2010-4884     2010-1229       2010-38    2010-12805 
           98           182            74           262           321 
    2010-3725    2011-30990    2010-24839    2011-26574    2011-12645 
          217           107           571           120           353 
   2011-29683    2011-17953    2011-17447    2014-11442    2014-06768 
          356           191           271           583           150 
   2014-08426    2012-22030    2011-32486    2014-03805    2013-05967 
          276           483            69           627           571 
   2014-22805    2013-31445    2014-18561    2014-17522    2010-29579 
         1128           186          1416           121           820 
    2012-1568      E9-11547      E9-26834      E9-23886      E9-29781 
          538          1336           172           121           717 
    2012-7636    2013-08501    2011-21704    2011-26729    2013-15942 
          759            64           455           927           558 
   2013-16387    2012-31574    2012-30060    2012-30170    2013-00002 
          459            62           438            83           221 
   2013-28581    2014-07895    2011-15181    2010-18169     2010-8878 
          114           491           497           983           498 
   2010-21016    2010-21020    2013-17478    2014-03474    2014-16360 
         1125           154           607            52           435 
   2011-18065    2010-28854       E9-1893       E9-2893       E9-1712 
          395           316           674           505           449 
     E9-28493      E9-30020       E9-2484       E9-3106    2014-18998 
          852            68           659            31           372 
   2014-30195    2014-29625    2010-22002    2014-29121    2014-30323 
          228           210           504            89           422 
   2014-30363    2014-24851    2016-30272    2016-30101    2016-31792 
          186           150           133            92           129 
   2016-31922    2016-30277    2017-01623    2017-01169    2015-29403 
          283          1132          3237           816           139 
   2016-29519    2017-01487    2017-01197     2011-5903     2011-8642 
         1254           108           327            81            89 
   2011-28728    2011-33087    2010-27004    2010-28365    2010-28360 
          419           241           904           107           469 
   2011-13173    2010-25578       E9-5441      E9-31098      E9-28022 
          444           982           182           209           461 
     E9-25268    2016-06250    2016-07703    2016-08713    2016-03141 
          720           665           172            72           451 
   2015-02379    2015-01522    2015-01255    2016-26753    2015-30191 
          707           666           541            46           485 
   2016-03038    2016-24066    2016-24847    2016-22962    2016-28203 
          735           681           209            74           707 
   2016-29165    2016-11300    2016-12579    2016-15542     2012-9473 
          352           457            74           541           338 
   2012-10715    2012-10968     2012-5366    2012-27002    2013-08626 
          923           517           360           487           232 
   2012-10034    2012-18868     2012-3097    2012-11798    2012-12889 
          565          1203           566           384           116 
   2012-19055    2012-17022    2012-18237    2012-25236    2012-15954 
         1247           965           378          1332           354 
   2016-31875    2016-27156    2016-22454    2016-27171    2017-01489 
          194           818           124          1082           136 
   2015-32582    2017-01164    2017-01168    2016-29169    2015-13055 
          186           226           105           295           102 
   2015-19209    2016-17945    2016-18872    2015-17926    2015-15828 
          759           225           154           111            32 
   2015-16122    2016-25288    2016-25290    2016-20713    2015-29498 
          647           297          1009           110           148 
   2016-02475    2015-31749    2015-00058    2016-06355    2016-09483 
          741            97           386           620           548 
   2016-09346    2016-04770    2015-23630    2015-15495    2015-25744 
          404           158           395            74           199 
   2015-22998    2015-25489    2016-01325    2015-32060    2016-12307 
          796           331          1031           993           905 
   2016-12155    2016-16295    2016-19723    2016-19724    2016-19725 
          559           650           129           133           138 
   2010-22279    2011-10910    2011-10732    2010-33169    2011-30463 
           70           375           410           903           745 
   2011-33335     2010-2419     2010-5837      E9-31418 C1-2009-31418 
          118           440           463          5401            26 
    2010-4593    2013-26785    2010-18988    2011-33089    2010-15851 
          545          1269             0           338           354 
   2010-16864    2014-14432    2014-14429    2013-19220    2012-24374 
          694           110            76           944           869 
   2012-22062    2011-31624    2014-04254    2013-24388    2014-01523 
         1003          1050           751           546           152 
   2014-05323    2014-06141    2014-06612    2010-32960    2014-18682 
          403           407           386           208            84 
     2010-705    2010-14613    2011-14919    2011-15443     2011-5728 
          246           571           318           398           923 
    2011-4753     2011-3257     2011-2577     2011-9739     2011-1385 
          441           480           301           203           517 
   2014-23228    2014-24218    2014-25292    2014-25439    2012-12881 
         1119            97            80           380           171 
   2012-12882    2012-12883       E9-1719       E9-3113       E9-5802 
          121           135          1008           473           463 
     E9-16034      E9-15368       E9-1885       E9-1895       E9-3112 
           23           360           741           257           258 
      E9-3108       E9-8572       E9-2483       E9-2486       E9-2485 
           48           328           229            31           712 
     E9-26408      E9-30413      E9-27441      E9-24518       E9-4068 
          151            27           684          2439           244 
      E9-4103     2012-7019      E9-28805      E9-24203      E9-23915 
           24          2153           406           418            24 
   2012-22807    2013-06712    2013-03915     2012-2557    2013-12157 
          751           280          1310            93            71 
   2012-10884     2012-6797    2012-30310    2013-15782    2013-13523 
          524           521           771           545          1776 
   2011-26141    2013-07837    2012-31225    2010-31878    2013-19520 
          170           305            89           292           300 
   2014-09343    2014-12651    2010-12070     2010-9451    2012-20259 
           15           161           171           255           629 
   2012-17264     2012-3616    2013-12650    2013-11533    2011-21505 
          482           413            72           454           400 
   2011-23891    2012-12225    2012-15183    2018-27945    2017-23630 
          585           364           712            84           677 
   2017-27034    2018-04860    2018-08883    2018-05916    2018-05113 
          167           517           765           231           622 
   2018-11101    2018-00240    2017-23270    2017-27899    2018-07874 
          580            47           111           395           803 
   2018-15202    2018-13640    2018-15955    2018-15299    2019-24288 
          641           671           849           404            87 
   2019-26178    2019-05370    2019-16383    2018-02261    2018-00630 
          476           139           560           321           242 
   2018-08272    2018-11939    2018-13696    2019-10398    2020-17364 
          375           881           310           783           433 
   2020-17699    2020-17700    2020-07530    2020-27948    2021-01094 
          373           400          1449           757           146 
   2021-01228    2020-12030    2018-04414    2020-03556    2020-27740 
          225          1124           446            89           351 
   2019-07645    2019-21630    2019-09750    2019-12802    2019-13945 
          399           252          1076           641           767 
   2019-22849    2019-20804    2019-23525    2019-22623    2019-22624 
          932          1033           447           733          1002 
   2019-00615    2019-04595    2019-01426    2020-14337    2020-12584 
          148           143           387           528          1233 
   2020-22510    2020-29235    2020-22064    2020-24793    2020-28605 
          503           586          1164           758          1207 
   2020-28606    2020-16623    2020-16624    2021-01635    2021-01646 
          335           265           183           670           614 
   2021-01013    2019-16879    2019-15222    2019-09877    2017-15680 
          957           290          1260           734           289 
   2017-13458    2017-13012    2017-02762    2017-10004    2017-15860 
           69           748           150          1209           448 
   2017-08586    2017-03113    2017-03115    2017-03116    2017-03118 
          232           543           213           112           241 
   2017-02450    2017-02451    2017-09156    2017-06716    2017-20647 
         1009           335           304           329           890 
   2017-21555    2017-21559    2017-09083    2017-08905    2017-08311 
          267           105           325           208           445 
   2017-06967    2017-06971    2017-04357    2017-04107    2017-02095 
          279           113           558           392           953 
   2017-02029    2017-01799    2017-06576    2017-06382    2020-00534 
          255           185           952            54           747 
   2020-02439    2020-27065    2020-06969    2020-06985    2020-10953 
          918           980           529           148           288 
   2020-07800    2020-03337    2020-09537    2020-19032    2020-21129 
          322           556           157           231           376 
   2021-00040    2020-13449    2017-14992    2017-05399    2017-02281 
          186           728            88           188          1051 
   2017-06968    2017-14378    2017-10003    2017-08818    2017-09161 
          290           454           325           460           108 
   2017-09087    2017-09574    2017-18468    2017-18134    2017-04837 
          790           243           280          1565          2383 
   2017-04353    2017-02102    2017-08990    2017-08908    2017-18679 
          170           763           180           357            62 
   2018-27515    2018-26552    2017-22677    2017-27925    2018-10855 
          673            84           498           575           555 
   2018-10403    2018-11335    2018-11913    2018-11916    2018-11936 
          450           238          1246          1355           261 
   2018-20816    2019-07656    2019-05934    2019-15159    2019-15449 
         1004           961           644           482           363 
   2019-10538    2019-27678    2019-08797    2019-04437    2019-13793 
          716            84          1177           707           610 
   2020-27353    2020-27807    2020-27739    2020-27455    2021-01469 
          368            84           170           201           236 
   2021-01476    2021-00305    2020-17363    2020-04730    2020-11301 
          655           571           266           207           563 
   2020-08846    2020-09536    2020-21160    2020-23115    2020-23116 
          118           358           633           451           892 
   2020-23780    2019-24040    2019-19367    2019-22749    2019-22073 
          907           607           284           306           856 
   2019-19895    2019-06325    2019-06548    2019-14016    2019-28286 
          344          1291           197           702           189 
   2019-27217    2019-13175    2019-00048    2020-12953    2019-02544 
          260           314           186           653          1143 
   2019-00014    2018-24254    2018-26156    2020-14077    2020-14509 
          921           468           468          1007           796 
   2020-14328    2020-18015    2020-15338    2020-15646    2020-20887 
           57           465           608          1032           347 
   2020-09645    2020-04755    2021-01643    2021-01644    2021-01645 
           80           224          1028           294           608 
   2021-01713    2021-01714    2021-01712    2020-14872    2020-08392 
           58          1282           159           894            84 
   2020-06478    2020-16625    2020-21914    2020-21534    2020-12430 
          277           274          2139          1588           492 
   2020-02438    2020-25459    2020-21960    2018-20203    2018-19514 
          521           560           488          1011           475 
   2018-09895    2018-00553    2017-28160    2019-17052    2019-21505 
          435           355           195           489           268 
   2019-04298    2018-17068    2018-15195    2020-09695    2020-06161 
          344          2502           169           967           239 
   2020-10993    2020-10315    2020-18012 
          169          1374          1317 
dfmat_eo_text <- dfmat_eo_text[ntoken(dfmat_eo_text) > 0, ]
dfmat_eo_text <- dfm_trim(dfmat_eo_text, min_docfreq = 3, docfreq_type = "count")
dfmat_eo_text <- dfm_trim(dfmat_eo_text, max_docfreq = .8 * nrow(dfmat_eo_text), docfreq_type = "count")
wf_model_eo_text <- quanteda.textmodels::textmodel_wordfish(dfmat_eo_text, dir = c(338,680))
summary(wf_model_eo_text)

Call:
textmodel_wordfish.dfm(x = dfmat_eo_text, dir = c(338, 680))

Estimated Document Positions:
                   theta       se
02-14807      -0.5174166 0.010722
02-11166      -0.5183738 0.009326
01-2851       -0.6433286 0.006549
04-11991      -0.0011289 0.036645
03-12661       1.1137371 0.465074
03-24217      -0.6234672 0.009084
03-19573       0.8346119 0.070899
03-20013       0.0449425 0.026331
03-29644      -0.0837069 0.031526
04-1322        0.4838548 0.100362
04-18575       0.9017079 0.140416
04-20050      -0.4440111 0.008861
04-20052      -0.4240599 0.009194
03-32332       0.0340931 0.079387
03-32328       5.6081749 0.010992
04-6622       -0.2540724 0.025025
04-12745      -0.6473403 0.006723
04-13123       0.7636845 0.222341
03-30913       1.6042154 0.180006
03-30513      -0.3756931 0.039204
03-7736       -0.2126091 0.006310
03-5343       -0.3228528 0.006381
03-8108        0.0572568 0.094866
05-7830       -0.1597011 0.071785
05-3385        0.7556630 0.112328
04-28079      -0.5399034 0.008732
04-10024      -0.5532244 0.008082
05-13214       0.2583937 0.043944
03-22543       0.3824511 0.048420
03-13750      -0.4885112 0.032723
03-14116      -0.2193019 0.044066
03-14117       0.2941622 0.146748
08-970        -0.3303903 0.012132
07-780         0.0310589 0.068723
07-2027        0.4519696 0.029889
07-2570       -0.6311800 0.006180
08-1215        0.8641563 0.083880
07-5919        0.8713130 0.152029
E8-28912      -0.3183044 0.020294
04-4884       -0.5039246 0.009606
04-4436       -0.4841090 0.015173
04-4451       -0.4740448 0.010611
04-10377      -0.7049167 0.004225
04-8616        0.8113504 0.157156
05-12284      -0.1892670 0.096591
05-12354      -0.3832179 0.025551
04-26684       0.0047113 0.068141
04-26686       0.4703529 0.075116
04-25866      -0.3244475 0.030186
08-1480        0.7875081 0.080163
07-4906       -0.5523302 0.007565
07-4907        1.7750723 0.095591
07-4023       -0.2334377 0.034556
08-797        -0.2348225 0.037435
08-1409       -0.2319710 0.011891
07-4600       -0.2360696 0.064573
07-5299       -0.5297221 0.013187
E8-23235      -0.4877168 0.019862
05-5097       -0.1290522 0.037860
E9-811        -0.3060148 0.030976
E9-814        -0.2473155 0.033655
07-6022        1.6020343 0.180674
07-1816        0.6334096 0.114255
01-31671       0.0659362 0.083619
01-31670      -0.0256225 0.056723
07-5816       -0.2511359 0.048155
01-4622       -0.2953403 0.018802
01-6558        0.4991339 0.123564
02-7087       -0.3286946 0.020471
07-3656       -0.1249973 0.022471
07-3593       -0.5102241 0.010542
E8-27777      -0.3847882 0.014874
E8-30042       1.5490008 0.183130
E9-1574        0.0226774 0.032997
E9-1538       -0.2463132 0.037035
E9-818        -0.4652689 0.011805
01-16668       0.1875563 0.045358
02-1594        0.1307128 0.068173
02-917         0.0211718 0.071882
02-4071       -0.5329863 0.010893
02-5069       -0.3485440 0.019709
01-8835        0.8978783 0.154974
01-8836        0.9083339 0.325830
02-2638       -0.4754914 0.009950
02-918        -0.1953326 0.035154
01-29831       0.6352228 0.170254
E8-30700       4.0739986 0.029947
02-14497       0.2260902 0.179986
02-31624      -0.3995224 0.015406
02-16040      -0.5055094 0.012133
02-16041      -0.4519799 0.020558
01-28762      -0.5804715 0.012406
01-29219      -0.0234859 0.084530
01-27917       0.0227240 0.021052
06-554        -0.2620230 0.055680
06-4652       -0.2336178 0.036343
07-293        -0.2771851 0.019132
06-9993        0.7735074 0.229033
06-9896        5.3408081 0.016137
05-21571      -0.3453765 0.014797
05-20944       0.2345582 0.022871
02-21056      -0.2576020 0.022545
03-464         5.6569316 0.010214
03-11969      -0.3931974 0.019382
03-12071       0.0458062 0.072998
03-7313        3.3633424 0.031549
03-10194      -0.3908637 0.030456
01-14319      -0.4031391 0.029868
01-15958      -0.5650737 0.007546
01-24917      -0.6595543 0.008433
01-24983      -0.6407897 0.009568
02-17274      -0.6725617 0.004388
06-4132       -0.5129659 0.011702
06-4121        0.0529292 0.030539
06-9020        0.3423668 0.049587
06-9619       -0.4814390 0.010065
06-7220       -0.4097772 0.012844
06-3865       -0.5070457 0.010097
06-2362       -0.6307320 0.007764
01-31959       0.5796487 0.133200
01-9086       -0.3328612 0.027254
01-26509      -0.5670128 0.003799
01-26339      -0.6774149 0.004556
01-30624       1.6204044 0.175033
01-13381       0.2274850 0.051318
03-2606       -0.5473677 0.009641
03-1798       -0.5401005 0.010036
03-8832       -0.1440924 0.049945
03-19675      -0.1136945 0.044890
07-3259        1.1153126 0.465167
07-3258       -0.0913443 0.108873
07-2367       -0.0717151 0.052188
06-6101        0.7566556 0.146213
05-20156      -0.0779069 0.102775
04-17636       0.2780413 0.053808
04-15787      -0.0689390 0.118934
03-5848        0.9367569 0.115489
E8-24465      -0.3430451 0.016159
05-9892       -0.3402267 0.026051
07-2518       -0.0048432 0.048055
E8-20436      -0.1065187 0.079663
01-15758      -0.4580655 0.012447
01-13869      -0.5506884 0.009971
06-5592        0.5851875 0.068823
01-21338       0.0968102 0.050056
04-2773       -0.3821392 0.009712
03-20764       1.1356949 0.436157
03-31594       0.8610472 0.247423
04-11592      -0.7001732 0.004268
04-11271      -0.6625291 0.005168
04-2408       -0.5907860 0.009102
04-1941        2.0524579 0.038945
01-3883       -0.4547073 0.040250
01-2852       -0.6819814 0.005809
04-10378      -0.2833980 0.017231
04-20051      -0.3803993 0.009444
03-05344      -0.5799733 0.005959
03-6445       -0.2228957 0.026794
03-8109        0.2477562 0.114279
03-12766      -0.5483934 0.011364
06-7492       -0.4634713 0.011640
05-19993      -0.5971421 0.006639
05-22132      -0.5649718 0.010235
05-22133      -0.6007074 0.008701
07-3112       -0.4911516 0.010743
01-25788      -0.5104156 0.045020
03-2069       -0.3424153 0.014618
03-19572      -0.5062796 0.022500
04-17150      -0.4442155 0.014274
04-17205       0.3804433 0.049951
04-17204      -0.6259578 0.019776
04-20049      -0.3825304 0.013765
04-19909      -0.5751347 0.010965
04-24098      -0.3548870 0.015440
03-19676       0.1043485 0.040411
06-5828       -0.2759354 0.025878
06-5829       -0.4968091 0.009536
06-8769        0.3568866 0.053078
07-374        -0.5427427 0.005502
06-5984        0.5489869 0.325113
05-23412       1.0131395 0.094494
05-24596       5.2942656 0.017750
05-24597      -0.2715998 0.030538
05-24255      -0.3747259 0.010073
06-5351       -0.5365075 0.011606
06-4085        0.2651436 0.047925
06-4552       -0.4801908 0.010229
06-9770       -0.6430959 0.020500
06-9148       -0.5155386 0.027234
03-7160        0.7186030 0.114494
07-3835        0.8465990 0.083128
01-4624       -0.1560527 0.078575
01-17041       1.2494556 0.354212
01-13117      -0.5944503 0.010628
01-13116      -0.3968148 0.017627
02-16951       0.5861897 0.111358
02-17273      -0.1877635 0.053813
02-22526       0.1191793 0.075649
01-4621       -0.0242821 0.022056
01-4623       -0.2596493 0.055324
01-29948      -0.4756989 0.010858
02-07086      -0.5425448 0.009733
02-07085      -0.3059810 0.037678
01-31119      -0.2316088 0.088336
03-11713       0.8233808 0.159191
02-25900      -0.1770660 0.042100
02-32518       1.7983939 0.114318
03-10606       1.6977284 0.068977
06-1316        0.1306860 0.035581
01-19562      -0.3503424 0.029589
01-24205       0.0229205 0.027007
01-25677      -0.5273711 0.005275
01-25344      -0.5676107 0.007359
03-16102      -0.1981263 0.038038
04-23994      -0.5622570 0.016570
01-11210      -0.0933026 0.123188
01-11505      -0.5179275 0.010975
02-29580      -0.2523222 0.021462
02-29832      -0.1797122 0.025416
02-31831      -0.4401635 0.008317
04-15933      -0.3355623 0.017377
04-15934      -0.1147343 0.033961
03-24919      -0.6171808 0.007236
05-13098      -0.1802121 0.019878
05-1886       -0.5804924 0.011392
04-28404       0.0689799 0.087433
04-22212       0.3285783 0.077900
05-306         5.3006030 0.017453
05-771        -0.4963845 0.011935
04-26685       0.0034599 0.044181
04-27076       0.2547684 0.024813
04-21411       0.3746218 0.099444
05-14452      -0.0217407 0.083907
08-658        -0.5873623 0.006968
05-7831        0.0447378 0.093909
05-1170       -0.1081499 0.055196
05-5434        1.9991291 0.054569
E8-24342       0.2866982 0.098597
03-13694       0.2390343 0.042832
03-13412       0.2999689 0.058627
08-761         0.5313533 0.066455
06-9561        0.7856731 0.298610
07-419        -0.0776417 0.139497
06-9895       -0.5836741 0.008028
05-15160       0.3426834 0.148461
02-9536        1.3142258 0.042807
02-919        -0.0505017 0.079723
02-3337       -0.4453672 0.062766
02-3826       -0.6988009 0.004549
01-14862      -0.5903858 0.022140
08-62          5.1851008 0.019887
08-325        -0.4354087 0.013126
08-360        -0.4129298 0.009667
E8-29564       0.0504200 0.063348
01-31665       0.1151907 0.110801
01-31667      -0.2904255 0.037838
01-31668      -0.6312916 0.011448
01-31669      -0.5260725 0.020806
01-31672       0.0227753 0.066630
08-1182       -0.1226885 0.083908
02-17640      -0.3804857 0.015304
01-23359       0.0146192 0.038069
02-24252      -0.5923960 0.007580
04-3170       -0.4246772 0.009997
02-31832      -0.6550511 0.006728
01-26990       0.0793258 0.152746
02-448         5.0630982 0.022429
06-9632        1.1107236 0.166781
05-6907       -0.4125852 0.040867
07-5270        0.5841776 0.062795
E8-17940      -0.4018534 0.004343
08-1472        1.7899574 0.099539
E8-26531       0.3090409 0.068822
07-4115       -0.6626221 0.007560
E8-27771       0.0292263 0.079980
E8-23125       0.1012980 0.046139
08-568        -0.3024408 0.032747
08-483        -0.1934959 0.025095
04-5322        5.4413300 0.014566
E8-21651      -0.1530943 0.032435
07-1704       -0.4090201 0.039694
07-2462       -0.4675729 0.011160
07-1137       -0.5195823 0.008447
07-1152       -0.1738949 0.067226
08-1348       -0.2301678 0.018568
07-4890       -0.5501519 0.008862
04-11058       0.3393852 0.039613
07-3552        0.4774982 0.062744
08-1399        0.6065234 0.085053
07-5726       -0.4425169 0.009661
01-31666      -0.4348969 0.025799
2015-03714    -0.5162437 0.006092
2015-07788     0.0272681 0.029519
2015-07016    -0.6136670 0.002356
2015-05677     0.5096073 0.053516
2015-18292    -0.3412222 0.018844
2015-19183    -0.6766883 0.004024
2010-9078     -0.3777542 0.019122
2010-10172    -0.4416137 0.014525
2010-7154     -0.2934829 0.018536
2010-11557    -0.3147190 0.027413
2010-9796     -0.6427520 0.006349
2015-16334    -0.4289639 0.017195
2011-19156     0.4622702 0.057447
2015-20801    -0.4783496 0.012067
2015-22888    -0.1089895 0.055107
2010-4884     -0.2543682 0.027942
2010-1229     -0.1790648 0.054352
2010-38       -0.5492324 0.010594
2010-12805    -0.5327623 0.009922
2010-3725     -0.4471623 0.015909
2011-30990    -0.5949474 0.013553
2010-24839     0.6058055 0.057188
2011-26574     0.3910560 0.097335
2011-12645     0.9024001 0.089715
2011-29683    -0.4461570 0.012548
2011-17953    -0.4834733 0.015246
2011-17447    -0.5617426 0.010006
2014-11442     0.0652849 0.029097
2014-06768     0.9046148 0.132343
2014-08426    -0.2101847 0.025906
2012-22030    -0.6834298 0.004908
2011-32486     1.7935109 0.100210
2014-03805    -0.0407430 0.023351
2013-05967     0.2379544 0.037399
2014-22805    -0.6514019 0.003550
2013-31445     5.1481117 0.020881
2014-18561    -0.2230278 0.010730
2014-17522     0.0795953 0.065203
2010-29579    -0.4322992 0.008424
2012-1568     -0.6015907 0.005995
E9-11547      -0.7301084 0.002580
E9-26834      -0.3938252 0.021092
E9-23886      -0.6621427 0.010065
E9-29781      -0.4327421 0.009125
2012-7636     -0.6228824 0.004661
2013-08501    -0.3564086 0.038884
2011-21704    -0.5569772 0.007668
2011-26729    -0.5374468 0.005745
2013-15942    -0.6966984 0.004291
2013-16387    -0.6219911 0.006183
2012-31574    -0.5308770 0.023645
2012-30060    -0.5465891 0.008046
2012-30170    -0.4401841 0.027117
2013-00002     4.0336353 0.029032
2013-28581     0.8456522 0.147751
2014-07895     0.2517416 0.041606
2011-15181    -0.5527579 0.007497
2010-18169    -0.6400529 0.003895
2010-8878      0.4253462 0.051280
2010-21016    -0.4248933 0.007367
2010-21020    -0.2888597 0.030268
2013-17478    -0.7183273 0.003809
2014-03474    -0.2923198 0.050767
2014-16360    -0.0009463 0.030541
2011-18065    -0.6824364 0.005323
2010-28854    -0.4947276 0.011589
E9-1893       -0.2357626 0.015035
E9-2893       -0.4934535 0.008960
E9-1712        0.2916717 0.045538
E9-28493      -0.3939431 0.009253
E9-30020       1.7538880 0.117913
E9-2484        0.1235363 0.030342
E9-3106       -0.4991184 0.034577
2014-18998    -0.6834731 0.005444
2014-30195    -0.5423493 0.011570
2014-29625    -0.4689302 0.015181
2010-22002     0.4796214 0.053811
2014-29121     1.0195019 0.190115
2014-30323     0.4678812 0.058379
2014-30363     5.1654652 0.020528
2014-24851     0.6723546 0.115422
2016-30272    -0.3089119 0.028650
2016-30101    -0.0656406 0.060149
2016-31792    -0.0610871 0.050398
2016-31922    -0.0877607 0.031815
2016-30277    -0.6909110 0.003165
2017-01623    -0.2008732 0.007501
2017-01169    -0.4593275 0.008421
2015-29403     0.2953874 0.082776
2016-29519    -0.6965008 0.002841
2017-01487     0.0774196 0.069093
2017-01197    -0.2399458 0.021910
2011-5903      0.0757776 0.083674
2011-8642     -0.5810966 0.016174
2011-28728    -0.4933394 0.009984
2011-33087     2.8938983 0.011724
2010-27004    -0.7154401 0.003136
2010-28365     0.1245697 0.075475
2010-28360    -0.3347214 0.015025
2011-13173     1.0482699 0.086657
2010-25578    -0.7118898 0.003055
E9-5441       -0.5830020 0.011763
E9-31098       4.3357791 0.030113
E9-28022      -0.4905517 0.009656
E9-25268      -0.6441132 0.004607
2016-06250    -0.5590146 0.006344
2016-07703    -0.1772425 0.034158
2016-08713     0.3974014 0.136815
2016-03141    -0.6002462 0.006605
2015-02379    -0.5455981 0.006440
2015-01522    -0.7609264 0.003239
2015-01255    -0.4570785 0.009979
2016-26753     0.8116971 0.243437
2015-30191     0.3984786 0.050287
2016-03038    -0.6001463 0.005153
2016-24066    -0.3059225 0.012789
2016-24847     0.1575293 0.057966
2016-22962     1.7909361 0.097287
2016-28203    -0.6500547 0.004441
2016-29165    -0.2043933 0.022656
2016-11300    -0.4815820 0.009800
2016-12579     1.7909361 0.097287
2016-15542    -0.6502606 0.005092
2012-9473     -0.6256308 0.007057
2012-10715    -0.4244265 0.008291
2012-10968    -0.5303314 0.007858
2012-5366     -0.5208452 0.009918
2012-27002    -0.6457138 0.005413
2013-08626     3.0803595 0.011709
2012-10034     0.0010993 0.026538
2012-18868    -0.6788408 0.003079
2012-3097      0.7287394 0.063192
2012-11798    -0.4426231 0.011963
2012-12889    -0.1342646 0.045881
2012-19055     0.2492352 0.026132
2012-17022    -0.5652254 0.005124
2012-18237     0.1657518 0.042286
2012-25236     0.4051197 0.030571
2012-15954     0.1910098 0.045160
2016-31875     4.6860211 0.027969
2016-27156    -0.7312690 0.003176
2016-22454    -0.0958284 0.048955
2016-27171    -0.6298535 0.004023
2017-01489    -0.3936338 0.023422
2015-32582     5.1654652 0.020528
2017-01164     0.0254887 0.043425
2017-01168    -0.0794111 0.056561
2016-29169    -0.2069301 0.025270
2015-13055     0.4136542 0.110728
2015-19209    -0.7227306 0.003414
2016-17945    -0.2663308 0.024809
2016-18872    -0.6599902 0.009256
2015-17926     1.1721923 0.166928
2015-15828    -0.3616121 0.052812
2015-16122    -0.5589694 0.006520
2016-25288    -0.0938327 0.030488
2016-25290    -0.7221753 0.002969
2016-20713    -0.0241521 0.057993
2015-29498     1.0509785 0.141641
2016-02475    -0.4910638 0.007483
2015-31749     1.5095322 0.151160
2015-00058     0.7908934 0.079892
2016-06355     0.2934466 0.039234
2016-09483     0.1458390 0.034019
2016-09346    -0.4691902 0.011090
2016-04770    -0.2113963 0.033982
2015-23630    -0.5477588 0.008586
2015-15495     1.7909361 0.097287
2015-25744    -0.1407489 0.035369
2015-22998    -0.0468393 0.020669
2015-25489    -0.6583261 0.006150
2016-01325     0.5315105 0.039756
2015-32060    -0.4316539 0.007772
2016-12307    -0.6179818 0.004393
2016-12155    -0.5618273 0.006947
2016-16295    -0.4343833 0.009562
2016-19723    -0.0834125 0.047351
2016-19724    -0.1241262 0.043630
2016-19725    -0.3900207 0.023462
2010-22279     1.7914535 0.099929
2011-10910     0.6266369 0.071659
2011-10732    -0.4633142 0.010918
2010-33169    -0.2066810 0.013857
2011-30463     0.2556887 0.034272
2011-33335    -0.4906390 0.018526
2010-2419     -0.4705159 0.010306
2010-5837     -0.5527965 0.007879
E9-31418      -0.2401356 0.005255
C1-2009-31418  0.0888759 0.158947
2010-4593     -0.6773831 0.004604
2013-26785    -0.7177020 0.002638
2011-33089    -0.5262302 0.010023
2010-15851    -0.5061294 0.010338
2010-16864    -0.4270816 0.009519
2014-14432     1.1974051 0.167564
2014-14429     1.7564870 0.103289
2013-19220    -0.6037877 0.004607
2012-24374    -0.3384267 0.010942
2012-22062    -0.5067899 0.006096
2011-31624    -0.6770397 0.003348
2014-04254    -0.5289187 0.006664
2013-24388    -0.6122989 0.005670
2014-01523    -0.2596887 0.031848
2014-05323     0.6534251 0.070652
2014-06141     0.6939301 0.072771
2014-06612     0.5378355 0.065238
2010-32960     3.7261684 0.025232
2014-18682    -0.2203282 0.047980
2010-705      -0.3036777 0.021644
2010-14613    -0.5584300 0.006836
2011-14919    -0.6360564 0.006970
2011-15443    -0.6086257 0.006831
2011-5728     -0.2818255 0.011828
2011-4753      0.5740063 0.063616
2011-3257     -0.5631286 0.007689
2011-2577     -0.5170244 0.011068
2011-9739      0.6045079 0.094891
2011-1385     -0.5101614 0.008514
2014-23228    -0.7108242 0.002884
2014-24218     0.6005481 0.141154
2014-25292    -0.3358730 0.036547
2014-25439    -0.3736181 0.014800
2012-12881    -0.3316318 0.024337
2012-12882    -0.3083295 0.030806
2012-12883    -0.4204614 0.021767
E9-1719        0.1742579 0.026277
E9-3113       -0.4025320 0.012081
E9-5802       -0.5804469 0.007047
E9-16034       1.4102897 0.319630
E9-15368      -0.5699142 0.008246
E9-1885       -0.2891066 0.013123
E9-1895       -0.4711792 0.013614
E9-3112       -0.4713003 0.013843
E9-3108       -0.4980345 0.027889
E9-8572       -0.5441960 0.009366
E9-2483       -0.0723250 0.037710
E9-2486       -0.3204033 0.067105
E9-2485       -0.0470470 0.021552
E9-26408      -0.1800890 0.037786
E9-30413       0.6190123 0.255254
E9-27441      -0.4483897 0.008762
E9-24518      -0.6299558 0.002559
E9-4068       -0.6357307 0.008005
E9-4103       -0.5618698 0.032626
2012-7019     -0.4150864 0.005458
E9-28805      -0.5203400 0.009230
E9-24203      -0.3602927 0.014935
E9-23915      -0.5535503 0.033565
2012-22807    -0.7228555 0.003382
2013-06712    -0.1632385 0.028156
2013-03915    -0.6208920 0.003568
2012-2557      0.2741827 0.100498
2013-12157     1.7875975 0.100043
2012-10884     0.4795587 0.053124
2012-6797     -0.6709566 0.004799
2012-30310    -0.6582797 0.004144
2013-15782    -0.5286775 0.007685
2013-13523     0.3100228 0.023612
2011-26141    -0.6439861 0.009059
2013-07837    -0.4261192 0.014317
2012-31225     1.0154321 0.189845
2010-31878    -0.5575033 0.009635
2013-19520     0.5753290 0.080548
2014-09343    -0.0093720 0.152141
2014-12651     0.2763329 0.075181
2010-12070    -0.3320240 0.024313
2010-9451     -0.4188276 0.016336
2012-20259    -0.6404610 0.004817
2012-17264     0.2969261 0.044489
2012-3616     -0.5702450 0.007682
2013-12650    -0.2196851 0.049521
2013-11533    -0.5575973 0.007715
2011-21505     0.7514124 0.076989
2011-23891    -0.5827654 0.006176
2012-12225     0.8130689 0.083445
2012-15183    -0.6503658 0.004407
2018-27945     0.9922275 0.194396
2017-23630    -0.3318499 0.012108
2017-27034    -0.1322952 0.040822
2018-04860     1.5550969 0.059910
2018-08883    -0.0460771 0.021077
2018-05916     0.7540310 0.101014
2018-05113    -0.5745852 0.006265
2018-11101    -0.5752082 0.006312
2018-00240    -0.3135902 0.051949
2017-23270     0.0218778 0.062469
2017-27899    -0.6418341 0.006201
2018-07874    -0.5064606 0.006904
2018-15202     0.4274789 0.045723
2018-13640    -0.6227153 0.005082
2018-15955    -0.6061149 0.004758
2018-15299    -0.4079000 0.012910
2019-24288    -0.0130450 0.069642
2019-26178    -0.6403300 0.005729
2019-05370    -0.0460101 0.049903
2019-16383     0.1462721 0.034382
2018-02261    -0.3962209 0.015247
2018-00630    -0.2868962 0.022608
2018-08272    -0.4880936 0.010674
2018-11939    -0.1617378 0.015994
2018-13696    -0.1108283 0.029567
2019-10398    -0.6286197 0.004638
2020-17364    -0.4936787 0.009785
2020-17699    -0.1216323 0.027129
2020-17700    -0.0858154 0.027816
2020-07530    -0.4799200 0.005601
2020-27948    -0.4209056 0.009124
2021-01094    -0.3874884 0.022910
2021-01228     0.4116901 0.077155
2020-12030    -0.3791395 0.008585
2018-04414    -0.5596943 0.007742
2020-03556    -0.4551380 0.024629
2020-27740    -0.2804827 0.019616
2019-07645    -0.3055680 0.016831
2019-21630    -0.6835810 0.006512
2019-09750    -0.6176045 0.004080
2019-12802    -0.5766933 0.006192
2019-13945    -0.3664752 0.010555
2019-22849     0.2222867 0.029341
2019-20804    -0.7331866 0.002861
2019-23525    -0.6395885 0.005860
2019-22623    -0.1945180 0.016210
2019-22624    -0.0973855 0.016993
2019-00615     0.4488823 0.098306
2019-04595    -0.1069166 0.044209
2019-01426    -0.4585216 0.011796
2020-14337    -0.4425219 0.010276
2020-12584    -0.5028177 0.005524
2020-22510    -0.5197890 0.008506
2020-29235    -0.5161379 0.007886
2020-22064    -0.5763176 0.004517
2020-24793    -0.5308507 0.006627
2020-28605    -0.5011864 0.006098
2020-28606    -0.4711164 0.012148
2020-16623    -0.2166506 0.027093
2020-16624    -0.2449429 0.028953
2021-01635    -0.1404181 0.020025
2021-01646    -0.4112278 0.010857
2021-01013    -0.6346594 0.004144
2019-16879     0.2987670 0.057659
2019-15222    -0.3821819 0.008022
2019-09877     0.2730478 0.035133
2017-15680    -0.5546156 0.009766
2017-13458    -0.2674204 0.046044
2017-13012    -0.5997830 0.005193
2017-02762    -0.4037823 0.021769
2017-10004    -0.5534703 0.004732
2017-15860    -0.5876907 0.006960
2017-08586    -0.1948053 0.028440
2017-03113    -0.4539884 0.010092
2017-03115    -0.5649617 0.011708
2017-03116     0.0872253 0.068803
2017-03118    -0.5421819 0.011182
2017-02450     0.2687207 0.029737
2017-02451    -0.2630137 0.020444
2017-09156    -0.5076205 0.011086
2017-06716    -0.4743552 0.011930
2017-20647     0.3325197 0.034417
2017-21555    -0.6908991 0.006149
2017-21559    -0.3654506 0.029389
2017-09083    -0.4774001 0.012123
2017-08905    -0.4081952 0.019197
2017-08311    -0.3435803 0.014845
2017-06967    -0.2388709 0.024552
2017-06971     0.0669925 0.066306
2017-04357    -0.6914143 0.004357
2017-04107    -0.4453232 0.011821
2017-02095    -0.2892127 0.011534
2017-02029    -0.5454868 0.010797
2017-01799    -0.2408529 0.029215
2017-06576    -0.5065354 0.006237
2017-06382    -0.0346045 0.086628
2020-00534     0.1336955 0.028634
2020-02439    -0.2662362 0.012501
2020-27065    -0.5164031 0.006031
2020-06969    -0.3207121 0.013943
2020-06985    -0.0741498 0.045117
2020-10953    -0.4421783 0.013978
2020-07800    -0.6427727 0.006889
2020-03337    -0.5811350 0.006699
2020-09537    -0.4928177 0.016487
2020-19032    -0.4364078 0.015904
2020-21129    -0.0925048 0.027870
2021-00040     5.1654652 0.020528
2020-13449    -0.4820524 0.008260
2017-14992     0.3068297 0.110141
2017-05399    -0.4088119 0.019449
2017-02281    -0.2191900 0.012690
2017-06968    -0.5097836 0.011330
2017-14378    -0.5823010 0.007100
2017-10003    -0.3781434 0.015780
2017-08818    -0.6371257 0.005800
2017-09161    -0.5335153 0.017863
2017-09087    -0.5191527 0.006755
2017-09574    -0.2681191 0.024591
2017-18468     0.6363056 0.083429
2017-18134    -0.5961621 0.003627
2017-04837    -0.2327719 0.008150
2017-04353    -0.4086885 0.020066
2017-02102    -0.2537783 0.014014
2017-08990    -0.3262275 0.024816
2017-08908    -0.4924467 0.010715
2017-18679    -0.2109284 0.057063
2018-27515    -0.6390221 0.004745
2018-26552     0.6748797 0.163037
2017-22677    -0.3643152 0.013544
2017-27925     0.2636528 0.039310
2018-10855    -0.4306018 0.010295
2018-10403    -0.2294001 0.019063
2018-11335     0.4837853 0.079636
2018-11913    -0.2745661 0.010390
2018-11916    -0.0808220 0.014807
2018-11936    -0.2287688 0.025473
2018-20816     0.6689260 0.045971
2019-07656    -0.5600717 0.005262
2019-05934    -0.4790913 0.008370
2019-15159    -0.4967083 0.009609
2019-15449    -0.1152704 0.026802
2019-10538    -0.3860950 0.010270
2019-27678     0.9978480 0.194819
2019-08797    -0.1448099 0.013905
2019-04437    -0.6120415 0.005057
2019-13793     0.3732088 0.043534
2020-27353    -0.5923816 0.007705
2020-27807     0.9968716 0.194746
2020-27739    -0.2951657 0.026389
2020-27455    -0.6689382 0.007856
2021-01469    -0.3200292 0.021479
2021-01476    -0.6806216 0.004330
2021-00305    -0.2445656 0.016852
2020-17363    -0.3458481 0.019047
2020-04730    -0.5207187 0.012935
2020-11301    -0.2661089 0.015996
2020-08846     0.1669548 0.075779
2020-09536    -0.4207322 0.013813
2020-21160     0.2032525 0.034997
2020-23115    -0.6589160 0.005533
2020-23116    -0.7198688 0.003211
2020-23780     0.4432853 0.038183
2019-24040    -0.5055994 0.008212
2019-19367    -0.5905007 0.008859
2019-22749    -0.2390395 0.022805
2019-22073    -0.3871911 0.009444
2019-19895     0.2820295 0.051742
2019-06325    -0.6408092 0.003486
2019-06548     4.8399797 0.025843
2019-14016    -0.6183205 0.005025
2019-28286     5.0843536 0.021956
2019-27217    -0.2220512 0.026905
2019-13175    -0.4354340 0.013654
2019-00048     5.1654652 0.020528
2020-12953     0.3031074 0.038870
2019-02544    -0.6233601 0.003815
2019-00014    -0.6974030 0.003350
2018-24254     0.3077492 0.046407
2018-26156     0.4752216 0.056514
2020-14077    -0.5015634 0.006244
2020-14509    -0.3079440 0.012584
2020-14328    -0.2052173 0.058943
2020-18015    -0.4303604 0.011792
2020-15338    -0.6914740 0.004170
2020-15646     0.2150293 0.027576
2020-20887    -0.1933166 0.023589
2020-09645    -0.0760129 0.063984
2020-04755    -0.4772098 0.014263
2021-01643    -0.4924808 0.008634
2021-01644    -0.1283757 0.028783
2021-01645    -0.0475703 0.023746
2021-01713     0.4320130 0.163884
2021-01714    -0.2867009 0.010198
2021-01712    -0.2183282 0.033483
2020-14872    -0.5027428 0.007014
2020-08392    -0.5278292 0.019267
2020-06478    -0.2747445 0.021771
2020-16625    -0.0631584 0.035297
2020-21914    -0.4400597 0.005221
2020-21534    -0.2299144 0.010466
2020-12430    -0.4250457 0.011328
2020-02438    -0.5852373 0.006638
2020-25459    -0.0342512 0.025611
2020-21960    -0.2475458 0.019070
2018-20203    -0.1121750 0.016160
2018-19514    -0.3403446 0.014437
2018-09895    -0.6175270 0.006319
2018-00553    -0.5302399 0.009516
2017-28160     4.5985585 0.028863
2019-17052     0.5306615 0.058376
2019-21505    -0.4170420 0.015479
2019-04298    -0.3521250 0.016180
2018-17068     0.2184754 0.017684
2018-15195     0.4726439 0.094433
2020-09695    -0.4554363 0.007451
2020-06161    -0.3344997 0.020362
2020-10993    -0.5042190 0.015222
2020-10315    -0.5956642 0.003984
2020-18012    -0.5053401 0.005316

Estimated Feature Scores:
     expand   branch  physic     fit  sport  presid   purpos   health   human
beta -1.369 -0.03853 -0.1701 -0.2568 -5.549 -0.1817 -0.09081 -0.08596 -1.8131
psi  -1.357 -0.27936 -1.5130 -1.7636 -4.289  1.3201  0.08081  0.27038 -0.6891
     servic   carri respons public develop coordin enhanc    activ particip
beta  0.227 -0.1177 -2.2794 0.2305 -4.8254  -7.044 -4.140 -1.37679  -2.1692
psi   1.188 -0.5095 -0.3722 0.6443 -0.6885  -2.297 -1.946  0.02934  -0.8919
       seek interest   awar regular stimul coordi  among privat sector promot
beta -1.171  0.03851 -3.664  -2.062 -2.540 -7.635 -3.188 -5.323 -5.471 -4.027
psi  -1.740  0.20958 -3.647  -2.438 -5.273 -2.909 -1.688 -2.209 -2.356 -1.369
       safe   easi
beta -3.716 -2.383
psi  -3.061 -5.919
textplot_scale1d(wf_model_eo_text)

textplot_scale1d(wf_model_eo_text, margin = "features",highlighted = c("immigr", "shoot", "gun", "police","emerg"))

plot_data <- data.frame(
  score = wf_model_eo_text$theta,
  president = docvars(dfmat_eo_text, "president"))
plot_data
            score president
1   -0.5174165927      Bush
2   -0.5183738047      Bush
3   -0.6433286112      Bush
4   -0.0011289096      Bush
5    1.1137370921      Bush
6   -0.6234671995      Bush
7    0.8346119081      Bush
8    0.0449424508      Bush
9   -0.0837069219      Bush
10   0.4838548251      Bush
11   0.9017078993      Bush
12  -0.4440111123      Bush
13  -0.4240598657      Bush
14   0.0340930818      Bush
15   5.6081749018      Bush
16  -0.2540724122      Bush
17  -0.6473402595      Bush
18   0.7636844922      Bush
19   1.6042153575      Bush
20  -0.3756931099      Bush
21  -0.2126091187      Bush
22  -0.3228527989      Bush
23   0.0572568448      Bush
24  -0.1597011366      Bush
25   0.7556629916      Bush
26  -0.5399033734      Bush
27  -0.5532244399      Bush
28   0.2583937017      Bush
29   0.3824510752      Bush
30  -0.4885111842      Bush
31  -0.2193018671      Bush
32   0.2941622356      Bush
33  -0.3303903485      Bush
34   0.0310589095      Bush
35   0.4519695871      Bush
36  -0.6311800449      Bush
37   0.8641562556      Bush
38   0.8713129523      Bush
39  -0.3183044121      Bush
40  -0.5039246177      Bush
41  -0.4841089841      Bush
42  -0.4740448188      Bush
43  -0.7049167019      Bush
44   0.8113503631      Bush
45  -0.1892670221      Bush
46  -0.3832179155      Bush
47   0.0047113319      Bush
48   0.4703529297      Bush
49  -0.3244474869      Bush
50   0.7875081358      Bush
51  -0.5523301841      Bush
52   1.7750723073      Bush
53  -0.2334376803      Bush
54  -0.2348225417      Bush
55  -0.2319710124      Bush
56  -0.2360696362      Bush
57  -0.5297221458      Bush
58  -0.4877168258      Bush
59  -0.1290522429      Bush
60  -0.3060148086      Bush
61  -0.2473154636      Bush
62   1.6020343386      Bush
63   0.6334096449      Bush
64   0.0659361901      Bush
65  -0.0256224768      Bush
66  -0.2511358824      Bush
67  -0.2953402819      Bush
68   0.4991338823      Bush
69  -0.3286945756      Bush
70  -0.1249973002      Bush
71  -0.5102241459      Bush
72  -0.3847881805      Bush
73   1.5490007683      Bush
74   0.0226774273      Bush
75  -0.2463132206      Bush
76  -0.4652688879      Bush
77   0.1875563074      Bush
78   0.1307127989      Bush
79   0.0211717790      Bush
80  -0.5329862792      Bush
81  -0.3485440075      Bush
82   0.8978783430      Bush
83   0.9083338692      Bush
84  -0.4754913719      Bush
85  -0.1953325555      Bush
86   0.6352227962      Bush
87   4.0739986187      Bush
88   0.2260902136      Bush
89  -0.3995224117      Bush
90  -0.5055093648      Bush
91  -0.4519798847      Bush
92  -0.5804715127      Bush
93  -0.0234858750      Bush
94   0.0227239533      Bush
95  -0.2620230096      Bush
96  -0.2336177933      Bush
97  -0.2771850910      Bush
98   0.7735074414      Bush
99   5.3408080649      Bush
100 -0.3453764875      Bush
101  0.2345581915      Bush
102 -0.2576020497      Bush
103  5.6569315687      Bush
104 -0.3931973995      Bush
105  0.0458061547      Bush
106  3.3633423899      Bush
107 -0.3908637324      Bush
108 -0.4031390685      Bush
109 -0.5650736665      Bush
110 -0.6595542597      Bush
111 -0.6407897004      Bush
112 -0.6725617396      Bush
113 -0.5129659372      Bush
114  0.0529291792      Bush
115  0.3423667757      Bush
116 -0.4814389918      Bush
117 -0.4097772052      Bush
118 -0.5070456808      Bush
119 -0.6307319914      Bush
120  0.5796487446      Bush
121 -0.3328612235      Bush
122 -0.5670127767      Bush
123 -0.6774149144      Bush
124  1.6204043969      Bush
125  0.2274849893      Bush
126 -0.5473677169      Bush
127 -0.5401004890      Bush
128 -0.1440923865      Bush
129 -0.1136945096      Bush
130  1.1153126380      Bush
131 -0.0913442522      Bush
132 -0.0717151453      Bush
133  0.7566555591      Bush
134 -0.0779068759      Bush
135  0.2780412997      Bush
136 -0.0689390140      Bush
137  0.9367568943      Bush
138 -0.3430450581      Bush
139 -0.3402267378      Bush
140 -0.0048432351      Bush
141 -0.1065186962      Bush
142 -0.4580654518      Bush
143 -0.5506884337      Bush
144  0.5851874725      Bush
145  0.0968102059      Bush
146 -0.3821391673      Bush
147  1.1356948880      Bush
148  0.8610472397      Bush
149 -0.7001731923      Bush
150 -0.6625290834      Bush
151 -0.5907859863      Bush
152  2.0524578604      Bush
153 -0.4547073215      Bush
154 -0.6819813738      Bush
155 -0.2833980391      Bush
156 -0.3803993322      Bush
157 -0.5799733427      Bush
158 -0.2228957232      Bush
159  0.2477561711      Bush
160 -0.5483933708      Bush
161 -0.4634713232      Bush
162 -0.5971421286      Bush
163 -0.5649718307      Bush
164 -0.6007074336      Bush
165 -0.4911516007      Bush
166 -0.5104156043      Bush
167 -0.3424152716      Bush
168 -0.5062796493      Bush
169 -0.4442155203      Bush
170  0.3804433033      Bush
171 -0.6259578047      Bush
172 -0.3825303892      Bush
173 -0.5751347002      Bush
174 -0.3548869777      Bush
175  0.1043484589      Bush
176 -0.2759354150      Bush
177 -0.4968090856      Bush
178  0.3568865841      Bush
179 -0.5427427061      Bush
180  0.5489869234      Bush
181  1.0131395266      Bush
182  5.2942655975      Bush
183 -0.2715998301      Bush
184 -0.3747258658      Bush
185 -0.5365075207      Bush
186  0.2651436304      Bush
187 -0.4801907533      Bush
188 -0.6430958811      Bush
189 -0.5155386043      Bush
190  0.7186029589      Bush
191  0.8465989578      Bush
192 -0.1560526945      Bush
193  1.2494555568      Bush
194 -0.5944503373      Bush
195 -0.3968148002      Bush
196  0.5861897289      Bush
197 -0.1877634877      Bush
198  0.1191793250      Bush
199 -0.0242820815      Bush
200 -0.2596493354      Bush
201 -0.4756989319      Bush
202 -0.5425448432      Bush
203 -0.3059810125      Bush
204 -0.2316087537      Bush
205  0.8233808008      Bush
206 -0.1770659992      Bush
207  1.7983939309      Bush
208  1.6977283631      Bush
209  0.1306859763      Bush
210 -0.3503423984      Bush
211  0.0229205304      Bush
212 -0.5273711206      Bush
213 -0.5676106998      Bush
214 -0.1981263309      Bush
215 -0.5622569653      Bush
216 -0.0933026197      Bush
217 -0.5179274618      Bush
218 -0.2523221880      Bush
219 -0.1797121862      Bush
220 -0.4401635238      Bush
221 -0.3355622929      Bush
222 -0.1147342567      Bush
223 -0.6171808170      Bush
224 -0.1802121249      Bush
225 -0.5804923821      Bush
226  0.0689799243      Bush
227  0.3285782986      Bush
228  5.3006029956      Bush
229 -0.4963845095      Bush
230  0.0034598674      Bush
231  0.2547684411      Bush
232  0.3746217568      Bush
233 -0.0217406829      Bush
234 -0.5873623005      Bush
235  0.0447377953      Bush
236 -0.1081498944      Bush
237  1.9991290630      Bush
238  0.2866982302      Bush
239  0.2390343040      Bush
240  0.2999689012      Bush
241  0.5313532936      Bush
242  0.7856731247      Bush
243 -0.0776417242      Bush
244 -0.5836741257      Bush
245  0.3426834494      Bush
246  1.3142258307      Bush
247 -0.0505017393      Bush
248 -0.4453672168      Bush
249 -0.6988008853      Bush
250 -0.5903857696      Bush
251  5.1851008403      Bush
252 -0.4354087297      Bush
253 -0.4129297724      Bush
254  0.0504199670      Bush
255  0.1151906769      Bush
256 -0.2904255221      Bush
257 -0.6312916280      Bush
258 -0.5260725085      Bush
259  0.0227753076      Bush
260 -0.1226885299      Bush
261 -0.3804856582      Bush
262  0.0146191510      Bush
263 -0.5923959826      Bush
264 -0.4246772311      Bush
265 -0.6550511315      Bush
266  0.0793257698      Bush
267  5.0630981912      Bush
268  1.1107236428      Bush
269 -0.4125851603      Bush
270  0.5841776492      Bush
271 -0.4018533884      Bush
272  1.7899574172      Bush
273  0.3090408795      Bush
274 -0.6626221379      Bush
275  0.0292262974      Bush
276  0.1012979873      Bush
277 -0.3024408333      Bush
278 -0.1934958973      Bush
279  5.4413299864      Bush
280 -0.1530943040      Bush
281 -0.4090200935      Bush
282 -0.4675729357      Bush
283 -0.5195822581      Bush
284 -0.1738949484      Bush
285 -0.2301678397      Bush
286 -0.5501519028      Bush
287  0.3393851540      Bush
288  0.4774981526      Bush
289  0.6065234136      Bush
290 -0.4425168677      Bush
291 -0.4348968536      Bush
292 -0.5162437244     Obama
293  0.0272681052     Obama
294 -0.6136669775     Obama
295  0.5096072672     Obama
296 -0.3412221883     Obama
297 -0.6766883159     Obama
298 -0.3777542348     Obama
299 -0.4416137077     Obama
300 -0.2934829109     Obama
301 -0.3147190301     Obama
302 -0.6427520337     Obama
303 -0.4289638648     Obama
304  0.4622701696     Obama
305 -0.4783496291     Obama
306 -0.1089895138     Obama
307 -0.2543682278     Obama
308 -0.1790648004     Obama
309 -0.5492324093     Obama
310 -0.5327623135     Obama
311 -0.4471623124     Obama
312 -0.5949474170     Obama
313  0.6058055205     Obama
314  0.3910560108     Obama
315  0.9024001264     Obama
316 -0.4461570248     Obama
317 -0.4834733190     Obama
318 -0.5617426499     Obama
319  0.0652849461     Obama
320  0.9046147530     Obama
321 -0.2101847147     Obama
322 -0.6834297514     Obama
323  1.7935108886     Obama
324 -0.0407429803     Obama
325  0.2379543992     Obama
326 -0.6514019419     Obama
327  5.1481117008     Obama
328 -0.2230278411     Obama
329  0.0795952777     Obama
330 -0.4322992477     Obama
331 -0.6015907061     Obama
332 -0.7301083815     Obama
333 -0.3938252321     Obama
334 -0.6621426772     Obama
335 -0.4327421071     Obama
336 -0.6228823749     Obama
337 -0.3564085625     Obama
338 -0.5569771779     Obama
339 -0.5374468303     Obama
340 -0.6966983640     Obama
341 -0.6219911277     Obama
342 -0.5308769590     Obama
343 -0.5465891470     Obama
344 -0.4401840773     Obama
345  4.0336353462     Obama
346  0.8456522242     Obama
347  0.2517415968     Obama
348 -0.5527579451     Obama
349 -0.6400529193     Obama
350  0.4253461595     Obama
351 -0.4248932623     Obama
352 -0.2888596677     Obama
353 -0.7183273163     Obama
354 -0.2923198476     Obama
355 -0.0009463045     Obama
356 -0.6824364443     Obama
357 -0.4947276124     Obama
358 -0.2357626314     Obama
359 -0.4934535159     Obama
360  0.2916717174     Obama
361 -0.3939431323     Obama
362  1.7538879986     Obama
363  0.1235363196     Obama
364 -0.4991183881     Obama
365 -0.6834730824     Obama
366 -0.5423493454     Obama
367 -0.4689302326     Obama
368  0.4796214481     Obama
369  1.0195019198     Obama
370  0.4678811518     Obama
371  5.1654651859     Obama
372  0.6723546160     Obama
373 -0.3089119046     Obama
374 -0.0656406349     Obama
375 -0.0610871411     Obama
376 -0.0877607046     Obama
377 -0.6909110038     Obama
378 -0.2008731703     Obama
379 -0.4593275181     Obama
380  0.2953874221     Obama
381 -0.6965008343     Obama
382  0.0774196124     Obama
383 -0.2399458168     Obama
384  0.0757776025     Obama
385 -0.5810965920     Obama
386 -0.4933394293     Obama
387  2.8938983189     Obama
388 -0.7154401486     Obama
389  0.1245696585     Obama
390 -0.3347214022     Obama
391  1.0482698594     Obama
392 -0.7118897831     Obama
393 -0.5830019834     Obama
394  4.3357791327     Obama
395 -0.4905517126     Obama
396 -0.6441131622     Obama
397 -0.5590146364     Obama
398 -0.1772425325     Obama
399  0.3974013644     Obama
400 -0.6002461572     Obama
401 -0.5455981385     Obama
402 -0.7609263888     Obama
403 -0.4570785145     Obama
404  0.8116970757     Obama
405  0.3984785909     Obama
406 -0.6001462801     Obama
407 -0.3059225135     Obama
408  0.1575292678     Obama
409  1.7909361207     Obama
410 -0.6500546671     Obama
411 -0.2043932931     Obama
412 -0.4815820127     Obama
413  1.7909361207     Obama
414 -0.6502606417     Obama
415 -0.6256308293     Obama
416 -0.4244264906     Obama
417 -0.5303314019     Obama
418 -0.5208452199     Obama
419 -0.6457137920     Obama
420  3.0803594999     Obama
421  0.0010993392     Obama
422 -0.6788407908     Obama
423  0.7287393747     Obama
424 -0.4426230615     Obama
425 -0.1342646355     Obama
426  0.2492351808     Obama
427 -0.5652253547     Obama
428  0.1657517588     Obama
429  0.4051197362     Obama
430  0.1910097821     Obama
431  4.6860210955     Obama
432 -0.7312690315     Obama
433 -0.0958284450     Obama
434 -0.6298534862     Obama
435 -0.3936337627     Obama
436  5.1654651859     Obama
437  0.0254887190     Obama
438 -0.0794110624     Obama
439 -0.2069301103     Obama
440  0.4136541822     Obama
441 -0.7227306190     Obama
442 -0.2663307629     Obama
443 -0.6599902097     Obama
444  1.1721923239     Obama
445 -0.3616120875     Obama
446 -0.5589693966     Obama
447 -0.0938327340     Obama
448 -0.7221752674     Obama
449 -0.0241520660     Obama
450  1.0509784626     Obama
451 -0.4910638189     Obama
452  1.5095322345     Obama
453  0.7908933959     Obama
454  0.2934466416     Obama
455  0.1458390440     Obama
456 -0.4691902299     Obama
457 -0.2113963408     Obama
458 -0.5477587811     Obama
459  1.7909361207     Obama
460 -0.1407488970     Obama
461 -0.0468392793     Obama
462 -0.6583261493     Obama
463  0.5315104878     Obama
464 -0.4316538855     Obama
465 -0.6179817537     Obama
466 -0.5618272936     Obama
467 -0.4343832866     Obama
468 -0.0834125279     Obama
469 -0.1241262395     Obama
470 -0.3900206708     Obama
471  1.7914534857     Obama
472  0.6266368894     Obama
473 -0.4633142121     Obama
474 -0.2066810096     Obama
475  0.2556887056     Obama
476 -0.4906389648     Obama
477 -0.4705159182     Obama
478 -0.5527965428     Obama
479 -0.2401356356     Obama
480  0.0888758882     Obama
481 -0.6773831491     Obama
482 -0.7177020235     Obama
483 -0.5262302247     Obama
484 -0.5061293743     Obama
485 -0.4270815893     Obama
486  1.1974050547     Obama
487  1.7564869683     Obama
488 -0.6037876712     Obama
489 -0.3384266857     Obama
490 -0.5067899331     Obama
491 -0.6770396862     Obama
492 -0.5289187129     Obama
493 -0.6122988574     Obama
494 -0.2596886536     Obama
495  0.6534251297     Obama
496  0.6939300805     Obama
497  0.5378355435     Obama
498  3.7261683815     Obama
499 -0.2203282054     Obama
500 -0.3036776838     Obama
501 -0.5584299568     Obama
502 -0.6360563766     Obama
503 -0.6086257347     Obama
504 -0.2818255003     Obama
505  0.5740063448     Obama
506 -0.5631286424     Obama
507 -0.5170244237     Obama
508  0.6045078875     Obama
509 -0.5101613607     Obama
510 -0.7108241677     Obama
511  0.6005481099     Obama
512 -0.3358729736     Obama
513 -0.3736180905     Obama
514 -0.3316317609     Obama
515 -0.3083295478     Obama
516 -0.4204614154     Obama
517  0.1742578692     Obama
518 -0.4025319617     Obama
519 -0.5804469404     Obama
520  1.4102897131     Obama
521 -0.5699141913     Obama
522 -0.2891065677     Obama
523 -0.4711792311     Obama
524 -0.4713003221     Obama
525 -0.4980345330     Obama
526 -0.5441959575     Obama
527 -0.0723250195     Obama
528 -0.3204033259     Obama
529 -0.0470470164     Obama
530 -0.1800889858     Obama
531  0.6190122959     Obama
532 -0.4483897093     Obama
533 -0.6299558348     Obama
534 -0.6357307183     Obama
535 -0.5618697903     Obama
536 -0.4150863549     Obama
537 -0.5203399854     Obama
538 -0.3602927068     Obama
539 -0.5535503150     Obama
540 -0.7228554678     Obama
541 -0.1632385079     Obama
542 -0.6208919923     Obama
543  0.2741827273     Obama
544  1.7875975496     Obama
545  0.4795586652     Obama
546 -0.6709565554     Obama
547 -0.6582797455     Obama
548 -0.5286774839     Obama
549  0.3100228345     Obama
550 -0.6439861227     Obama
551 -0.4261191819     Obama
552  1.0154320605     Obama
553 -0.5575033234     Obama
554  0.5753290285     Obama
555 -0.0093719559     Obama
556  0.2763329171     Obama
557 -0.3320239628     Obama
558 -0.4188276168     Obama
559 -0.6404610372     Obama
560  0.2969261379     Obama
561 -0.5702449797     Obama
562 -0.2196850739     Obama
563 -0.5575973369     Obama
564  0.7514123768     Obama
565 -0.5827654306     Obama
566  0.8130688723     Obama
567 -0.6503657594     Obama
568  0.9922274643     Trump
569 -0.3318499057     Trump
570 -0.1322952301     Trump
571  1.5550969170     Trump
572 -0.0460770695     Trump
573  0.7540310459     Trump
574 -0.5745852216     Trump
575 -0.5752081924     Trump
576 -0.3135902071     Trump
577  0.0218777687     Trump
578 -0.6418340702     Trump
579 -0.5064606179     Trump
580  0.4274789053     Trump
581 -0.6227152912     Trump
582 -0.6061148721     Trump
583 -0.4079000313     Trump
584 -0.0130449800     Trump
585 -0.6403300235     Trump
586 -0.0460101177     Trump
587  0.1462721497     Trump
588 -0.3962208818     Trump
589 -0.2868961528     Trump
590 -0.4880936103     Trump
591 -0.1617378441     Trump
592 -0.1108283196     Trump
593 -0.6286196917     Trump
594 -0.4936787056     Trump
595 -0.1216322876     Trump
596 -0.0858153998     Trump
597 -0.4799200474     Trump
598 -0.4209056147     Trump
599 -0.3874884106     Trump
600  0.4116901347     Trump
601 -0.3791394927     Trump
602 -0.5596942559     Trump
603 -0.4551379680     Trump
604 -0.2804826617     Trump
605 -0.3055680221     Trump
606 -0.6835809914     Trump
607 -0.6176044510     Trump
608 -0.5766933318     Trump
609 -0.3664751525     Trump
610  0.2222866848     Trump
611 -0.7331865731     Trump
612 -0.6395884717     Trump
613 -0.1945179950     Trump
614 -0.0973854933     Trump
615  0.4488822812     Trump
616 -0.1069165832     Trump
617 -0.4585215582     Trump
618 -0.4425218690     Trump
619 -0.5028177169     Trump
620 -0.5197890253     Trump
621 -0.5161379047     Trump
622 -0.5763176412     Trump
623 -0.5308507392     Trump
624 -0.5011864076     Trump
625 -0.4711164500     Trump
626 -0.2166506038     Trump
627 -0.2449428961     Trump
628 -0.1404181308     Trump
629 -0.4112277604     Trump
630 -0.6346593549     Trump
631  0.2987669976     Trump
632 -0.3821818981     Trump
633  0.2730477583     Trump
634 -0.5546156165     Trump
635 -0.2674204077     Trump
636 -0.5997830008     Trump
637 -0.4037822601     Trump
638 -0.5534702850     Trump
639 -0.5876906991     Trump
640 -0.1948052735     Trump
641 -0.4539884384     Trump
642 -0.5649616574     Trump
643  0.0872253108     Trump
644 -0.5421819248     Trump
645  0.2687207457     Trump
646 -0.2630136629     Trump
647 -0.5076205084     Trump
648 -0.4743551973     Trump
649  0.3325197032     Trump
650 -0.6908991090     Trump
651 -0.3654505866     Trump
652 -0.4774000767     Trump
653 -0.4081952363     Trump
654 -0.3435802508     Trump
655 -0.2388709394     Trump
656  0.0669924856     Trump
657 -0.6914142891     Trump
658 -0.4453232343     Trump
659 -0.2892126759     Trump
660 -0.5454868137     Trump
661 -0.2408528656     Trump
662 -0.5065354270     Trump
663 -0.0346045282     Trump
664  0.1336954610     Trump
665 -0.2662362345     Trump
666 -0.5164030648     Trump
667 -0.3207120929     Trump
668 -0.0741498479     Trump
669 -0.4421782742     Trump
670 -0.6427726853     Trump
671 -0.5811350207     Trump
672 -0.4928177183     Trump
673 -0.4364078126     Trump
674 -0.0925048441     Trump
675  5.1654651859     Trump
676 -0.4820523910     Trump
677  0.3068297267     Trump
678 -0.4088118989     Trump
679 -0.2191899667     Trump
680 -0.5097836097     Trump
681 -0.5823010392     Trump
682 -0.3781434436     Trump
683 -0.6371257470     Trump
684 -0.5335153250     Trump
685 -0.5191526987     Trump
686 -0.2681191134     Trump
687  0.6363056448     Trump
688 -0.5961621202     Trump
689 -0.2327718557     Trump
690 -0.4086884773     Trump
691 -0.2537783414     Trump
692 -0.3262274907     Trump
693 -0.4924467027     Trump
694 -0.2109283808     Trump
695 -0.6390221117     Trump
696  0.6748796684     Trump
697 -0.3643151608     Trump
698  0.2636528210     Trump
699 -0.4306018098     Trump
700 -0.2294000642     Trump
701  0.4837852854     Trump
702 -0.2745661279     Trump
703 -0.0808220264     Trump
704 -0.2287687782     Trump
705  0.6689259651     Trump
706 -0.5600716607     Trump
707 -0.4790913359     Trump
708 -0.4967083172     Trump
709 -0.1152703874     Trump
710 -0.3860949848     Trump
711  0.9978479892     Trump
712 -0.1448099219     Trump
713 -0.6120414985     Trump
714  0.3732088349     Trump
715 -0.5923816167     Trump
716  0.9968715729     Trump
717 -0.2951657224     Trump
718 -0.6689382097     Trump
719 -0.3200291632     Trump
720 -0.6806216172     Trump
721 -0.2445655838     Trump
722 -0.3458480889     Trump
723 -0.5207187191     Trump
724 -0.2661088627     Trump
725  0.1669548145     Trump
726 -0.4207321667     Trump
727  0.2032525247     Trump
728 -0.6589160395     Trump
729 -0.7198687693     Trump
730  0.4432852638     Trump
731 -0.5055993684     Trump
732 -0.5905007231     Trump
733 -0.2390395373     Trump
734 -0.3871910930     Trump
735  0.2820295271     Trump
736 -0.6408091609     Trump
737  4.8399796733     Trump
738 -0.6183204833     Trump
739  5.0843535523     Trump
740 -0.2220512421     Trump
741 -0.4354339627     Trump
742  5.1654651859     Trump
743  0.3031074279     Trump
744 -0.6233601204     Trump
745 -0.6974029989     Trump
746  0.3077491788     Trump
747  0.4752215909     Trump
748 -0.5015634051     Trump
749 -0.3079440108     Trump
750 -0.2052172841     Trump
751 -0.4303603543     Trump
752 -0.6914739729     Trump
753  0.2150293119     Trump
754 -0.1933166310     Trump
755 -0.0760128696     Trump
756 -0.4772097828     Trump
757 -0.4924808371     Trump
758 -0.1283757153     Trump
759 -0.0475702535     Trump
760  0.4320129889     Trump
761 -0.2867009385     Trump
762 -0.2183281813     Trump
763 -0.5027427991     Trump
764 -0.5278291501     Trump
765 -0.2747444615     Trump
766 -0.0631584324     Trump
767 -0.4400597213     Trump
768 -0.2299143667     Trump
769 -0.4250457062     Trump
770 -0.5852373390     Trump
771 -0.0342512068     Trump
772 -0.2475457994     Trump
773 -0.1121750385     Trump
774 -0.3403446325     Trump
775 -0.6175270138     Trump
776 -0.5302398600     Trump
777  4.5985584764     Trump
778  0.5306614642     Trump
779 -0.4170419881     Trump
780 -0.3521250139     Trump
781  0.2184753916     Trump
782  0.4726439167     Trump
783 -0.4554362711     Trump
784 -0.3344996949     Trump
785 -0.5042190345     Trump
786 -0.5956641755     Trump
787 -0.5053401261     Trump
ggplot(plot_data, aes(x = score, fill = president)) +
  geom_density(alpha = 0.6) +
  labs(
    title = "Wordfish Score Distribution by President",
    x = "Wordfish Score",
    y = "Density",
    fill = "President"
  ) +
  theme_minimal()

ggplot(data = plot_data, aes(x = president, y = score, fill = president)) +
  geom_violin(trim = FALSE) +
  geom_boxplot(width = 0.1, fill = "white", color = "black") + # Add a boxplot inside for more detail
  labs(
    title = "Distribution of Wordfish Scores by President",
    x = "President",
    y = "Wordfish Score (Theta)",
    fill = "President"
  ) +
  theme_minimal() +
  scale_fill_brewer(palette = "Set3")

bigrams- Wordfish Analysis

# create a tokens object with bigrams
eo_text_tokens_bigrams <- tokens_ngrams(eo_text_tokens, n=2)
dfmat_eo_text_bigrams <- dfm(eo_text_tokens_bigrams)
docvars(dfmat_eo_text_bigrams, "president") <- merged_df_all$president
docnames(dfmat_eo_text_bigrams) <- merged_df_all$document_number
dfmat_eo_text_bigrams
Document-feature matrix of: 788 documents, 131,816 features (99.74% sparse) and 1 docvar.
          features
docs       expand_branch branch_physic physic_fit fit_sport sport_presid
  02-14807             1             1          6         6            2
  02-11166             0             0          0         0            0
  01-2851              0             0          0         0            0
  04-11991             0             0          0         0            0
  03-12661             0             0          0         0            0
  03-24217             0             0          1         1            0
          features
docs       presid_physic sport_purpos purpos_health health_human human_servic
  02-14807             4            1             1            2            2
  02-11166             0            0             0            4            4
  01-2851              0            0             0            3            3
  04-11991             0            0             0            1            1
  03-12661             0            0             0            0            0
  03-24217             1            0             0            2            2
[ reached max_ndoc ... 782 more documents, reached max_nfeat ... 131,806 more features ]
quanteda::ntoken(dfmat_eo_text_bigrams)
     02-14807      02-11166       01-2851      04-11991      03-12661 
          297           391           339           311            10 
     03-24217      03-19573      03-20013      03-29644       04-1322 
          193           509           704           297           151 
     04-18575      04-20050      04-20052      03-32332      03-32328 
          133           696           723            77           191 
      04-6622      04-12745      04-13123      03-30913      03-30513 
          236           314            43            46            48 
      03-7736       03-5343       03-8108       05-7830       05-3385 
         4226          2489            49            48           185 
     04-28079      04-10024      05-13214      03-22543      03-13750 
          402           418           459           496            39 
     03-14116      03-14117        08-970        07-780       07-2027 
           87            44           713           102          1739 
      07-2570       08-1215       07-5919      E8-28912       04-4884 
          419           380           110           264           407 
      04-4436       04-4451      04-10377       04-8616      05-12284 
          198           423           534            97            25 
     05-12354      04-26684      04-26686      04-25866       08-1480 
          120            80           246           120           383 
      07-4906       07-4907       07-4023        08-797       08-1409 
          478            81           125           105          1122 
      07-4600       07-5299      E8-23235       05-5097        E9-811 
           40           225           112           170           120 
       E9-814       07-6022       07-1816      01-31671      01-31670 
          136            46           141            67           105 
      07-5816       01-4622       01-6558       02-7087       07-3656 
           65           339            98           229           517 
      07-3593      E8-27777      E8-30042       E9-1574       E9-1538 
          327           356            60           394           120 
       E9-818      01-16668       02-1594        02-917       02-4071 
          348           361           122            76           278 
      02-5069       01-8835       01-8836       02-2638        02-918 
          222           109            21           448           150 
     01-29831      E8-30700      02-14497      02-31624      02-16040 
           70           209            28           294           270 
     02-16041      01-28762      01-29219      01-27917        06-554 
          118           140            47           941            45 
      06-4652        07-293       06-9993       06-9896      05-21571 
          119           343            43           208           427 
     05-20944      02-21056        03-464      03-11969      03-12071 
         1585           287           182           203            91 
      03-7313      03-10194      01-14319      01-15958      01-24917 
           52            76            75           442           177 
     01-24983      02-17274       06-4132       06-4121       06-9020 
          160           634           267           520           445 
      06-9619       06-7220       06-3865       06-2362      01-31959 
          431           407           366           271            98 
      01-9086      01-26509      01-26339      01-30624      01-13381 
          128          1723           544            46           299 
      03-2606       03-1798       03-8832      03-19675       07-3259 
          298           296           114           133            12 
      07-3258       07-2367       06-6101      05-20156      04-17636 
           21           123           105            32           310 
     04-15787       03-5848      E8-24465       05-9892       07-2518 
           20           224           367           147           168 
     E8-20436      01-15758      01-13869       06-5592      01-21338 
           46           332           278           382           210 
      04-2773      03-20764      03-31594      04-11592      04-11271 
          798            14            45           548           475 
      04-2408       04-1941       01-3883       01-2852      04-10378 
          258           154            32           335           417 
     04-20051      03-05344       03-6445       03-8109      03-12766 
          880           653           219            70           223 
      06-7492      05-19993      05-22132      05-22133       07-3112 
          358           446           248           262           384 
     01-25788       03-2069      03-19572      04-17150      04-17205 
           16           434            69           270           464 
     04-17204      04-20049      04-19909      04-24098      03-19676 
           44           412           195           397           342 
      06-5828       06-5829       06-8769        07-374       06-5984 
          199           434           401           962            12 
     05-23412      05-24596      05-24597      05-24255       06-5351 
          359           195           143           875           230 
      06-4085       06-4552       06-9770       06-9148       03-7160 
          404           432            32            45           163 
      07-3835       01-4624      01-17041      01-13117      01-13116 
          387            35            21           181           228 
     02-16951      02-17273      02-22526       01-4621       01-4623 
          152            71           102           748            45 
     01-29948      02-07086      02-07085      01-31119      03-11713 
          387           329            86            21           102 
     02-25900      02-32518      03-10606       06-1316      01-19562 
          118            53           254           512           111 
     01-24205      01-25677      01-25344      03-16102      04-23994 
          589          1131           452           128           100 
     01-11210      01-11505      02-29580      02-29832      02-31831 
           16           291           325           306           795 
     04-15933      04-15934      03-24919      05-13098       05-1886 
          346           235           334           503           168 
     04-28404      04-22212        05-306        05-771      04-26685 
           73           166           194           284           193 
     04-27076      04-21411      05-14452        08-658       05-7831 
         1401           117            54           444            52 
      05-1170       05-5434      E8-24342      03-13694      03-13412 
           81           103            97           466           278 
       08-761       06-9561        07-419       06-9895      05-15160 
          367            31            13           343            51 
      02-9536        02-919       02-3337       02-3826      01-14862 
         1738            49            12           472            40 
        08-62        08-325        08-360      E8-29564      01-31665 
          191           335           682           119            48 
     01-31667      01-31668      01-31669      01-31672       08-1182 
           80           115            72            90            34 
     02-17640      01-23359      02-24252       04-3170      02-31832 
          331           278           363           604           298 
     01-26990        02-448       06-9632       05-6907       07-5270 
           21           191           111            45           446 
     E8-17940       08-1472      E8-26531       07-4115      E8-27771 
         3672            70           220           231            78 
     E8-23125        08-568        08-483       04-5322      E8-21651 
          255           113           306           193           208 
      07-1704       07-2462       07-1137       07-1152       08-1348 
           51           395           478            47           477 
      07-4890      04-11058       07-3552       08-1399       07-5726 
          352           692           366           254           584 
     01-31666    2015-03714    2015-07788    2015-07016    2015-05677 
           82           950           497          3267           539 
   2015-18292    2015-19183     2010-9078    2010-10172     2010-7154 
          266           768           231           269           383 
   2010-11557     2010-9796    2015-16334    2011-19156    2015-20801 
          159           363           225           431           316 
   2015-22888     2010-4884     2010-1229       2010-38    2010-12805 
           97           181            73           261           320 
    2010-3725    2011-30990    2010-24839    2011-26574    2011-12645 
          216           106           570           119           352 
   2011-29683    2011-17953    2011-17447    2014-11442    2014-06768 
          355           190           270           582           149 
   2014-08426    2012-22030    2011-32486    2014-03805    2013-05967 
          275           482            68           626           570 
   2014-22805    2013-31445    2014-18561    2014-17522    2010-29579 
         1127           185          1415           120           819 
    2012-1568      E9-11547      E9-26834      E9-23886      E9-29781 
          537          1335           171           120           716 
    2012-7636    2013-08501    2011-21704    2011-26729    2013-15942 
          758            63           454           926           557 
   2013-16387    2012-31574    2012-30060    2012-30170    2013-00002 
          458            61           437            82           220 
   2013-28581    2014-07895    2011-15181    2010-18169     2010-8878 
          113           490           496           982           497 
   2010-21016    2010-21020    2013-17478    2014-03474    2014-16360 
         1124           153           606            51           434 
   2011-18065    2010-28854       E9-1893       E9-2893       E9-1712 
          394           315           673           504           448 
     E9-28493      E9-30020       E9-2484       E9-3106    2014-18998 
          851            67           658            30           371 
   2014-30195    2014-29625    2010-22002    2014-29121    2014-30323 
          227           209           503            88           421 
   2014-30363    2014-24851    2016-30272    2016-30101    2016-31792 
          185           149           132            91           128 
   2016-31922    2016-30277    2017-01623    2017-01169    2015-29403 
          282          1131          3236           815           138 
   2016-29519    2017-01487    2017-01197     2011-5903     2011-8642 
         1253           107           326            80            88 
   2011-28728    2011-33087    2010-27004    2010-28365    2010-28360 
          418           240           903           106           468 
   2011-13173    2010-25578       E9-5441      E9-31098      E9-28022 
          443           981           181           208           460 
     E9-25268    2016-06250    2016-07703    2016-08713    2016-03141 
          719           664           171            71           450 
   2015-02379    2015-01522    2015-01255    2016-26753    2015-30191 
          706           665           540            45           484 
   2016-03038    2016-24066    2016-24847    2016-22962    2016-28203 
          734           680           208            73           706 
   2016-29165    2016-11300    2016-12579    2016-15542     2012-9473 
          351           456            73           540           337 
   2012-10715    2012-10968     2012-5366    2012-27002    2013-08626 
          922           516           359           486           231 
   2012-10034    2012-18868     2012-3097    2012-11798    2012-12889 
          564          1202           565           383           115 
   2012-19055    2012-17022    2012-18237    2012-25236    2012-15954 
         1246           964           377          1331           353 
   2016-31875    2016-27156    2016-22454    2016-27171    2017-01489 
          193           817           123          1081           135 
   2015-32582    2017-01164    2017-01168    2016-29169    2015-13055 
          185           225           104           294           101 
   2015-19209    2016-17945    2016-18872    2015-17926    2015-15828 
          758           224           153           110            31 
   2015-16122    2016-25288    2016-25290    2016-20713    2015-29498 
          646           296          1008           109           147 
   2016-02475    2015-31749    2015-00058    2016-06355    2016-09483 
          740            96           385           619           547 
   2016-09346    2016-04770    2015-23630    2015-15495    2015-25744 
          403           157           394            73           198 
   2015-22998    2015-25489    2016-01325    2015-32060    2016-12307 
          795           330          1030           992           904 
   2016-12155    2016-16295    2016-19723    2016-19724    2016-19725 
          558           649           128           132           137 
   2010-22279    2011-10910    2011-10732    2010-33169    2011-30463 
           69           374           409           902           744 
   2011-33335     2010-2419     2010-5837      E9-31418 C1-2009-31418 
          117           439           462          5400            25 
    2010-4593    2013-26785    2010-18988    2011-33089    2010-15851 
          544          1268             0           337           353 
   2010-16864    2014-14432    2014-14429    2013-19220    2012-24374 
          693           109            75           943           868 
   2012-22062    2011-31624    2014-04254    2013-24388    2014-01523 
         1002          1049           750           545           151 
   2014-05323    2014-06141    2014-06612    2010-32960    2014-18682 
          402           406           385           207            83 
     2010-705    2010-14613    2011-14919    2011-15443     2011-5728 
          245           570           317           397           922 
    2011-4753     2011-3257     2011-2577     2011-9739     2011-1385 
          440           479           300           202           516 
   2014-23228    2014-24218    2014-25292    2014-25439    2012-12881 
         1118            96            79           379           170 
   2012-12882    2012-12883       E9-1719       E9-3113       E9-5802 
          120           134          1007           472           462 
     E9-16034      E9-15368       E9-1885       E9-1895       E9-3112 
           22           359           740           256           257 
      E9-3108       E9-8572       E9-2483       E9-2486       E9-2485 
           47           327           228            30           711 
     E9-26408      E9-30413      E9-27441      E9-24518       E9-4068 
          150            26           683          2438           243 
      E9-4103     2012-7019      E9-28805      E9-24203      E9-23915 
           23          2152           405           417            23 
   2012-22807    2013-06712    2013-03915     2012-2557    2013-12157 
          750           279          1309            92            70 
   2012-10884     2012-6797    2012-30310    2013-15782    2013-13523 
          523           520           770           544          1775 
   2011-26141    2013-07837    2012-31225    2010-31878    2013-19520 
          169           304            88           291           299 
   2014-09343    2014-12651    2010-12070     2010-9451    2012-20259 
           14           160           170           254           628 
   2012-17264     2012-3616    2013-12650    2013-11533    2011-21505 
          481           412            71           453           399 
   2011-23891    2012-12225    2012-15183    2018-27945    2017-23630 
          584           363           711            83           676 
   2017-27034    2018-04860    2018-08883    2018-05916    2018-05113 
          166           516           764           230           621 
   2018-11101    2018-00240    2017-23270    2017-27899    2018-07874 
          579            46           110           394           802 
   2018-15202    2018-13640    2018-15955    2018-15299    2019-24288 
          640           670           848           403            86 
   2019-26178    2019-05370    2019-16383    2018-02261    2018-00630 
          475           138           559           320           241 
   2018-08272    2018-11939    2018-13696    2019-10398    2020-17364 
          374           880           309           782           432 
   2020-17699    2020-17700    2020-07530    2020-27948    2021-01094 
          372           399          1448           756           145 
   2021-01228    2020-12030    2018-04414    2020-03556    2020-27740 
          224          1123           445            88           350 
   2019-07645    2019-21630    2019-09750    2019-12802    2019-13945 
          398           251          1075           640           766 
   2019-22849    2019-20804    2019-23525    2019-22623    2019-22624 
          931          1032           446           732          1001 
   2019-00615    2019-04595    2019-01426    2020-14337    2020-12584 
          147           142           386           527          1232 
   2020-22510    2020-29235    2020-22064    2020-24793    2020-28605 
          502           585          1163           757          1206 
   2020-28606    2020-16623    2020-16624    2021-01635    2021-01646 
          334           264           182           669           613 
   2021-01013    2019-16879    2019-15222    2019-09877    2017-15680 
          956           289          1259           733           288 
   2017-13458    2017-13012    2017-02762    2017-10004    2017-15860 
           68           747           149          1208           447 
   2017-08586    2017-03113    2017-03115    2017-03116    2017-03118 
          231           542           212           111           240 
   2017-02450    2017-02451    2017-09156    2017-06716    2017-20647 
         1008           334           303           328           889 
   2017-21555    2017-21559    2017-09083    2017-08905    2017-08311 
          266           104           324           207           444 
   2017-06967    2017-06971    2017-04357    2017-04107    2017-02095 
          278           112           557           391           952 
   2017-02029    2017-01799    2017-06576    2017-06382    2020-00534 
          254           184           951            53           746 
   2020-02439    2020-27065    2020-06969    2020-06985    2020-10953 
          917           979           528           147           287 
   2020-07800    2020-03337    2020-09537    2020-19032    2020-21129 
          321           555           156           230           375 
   2021-00040    2020-13449    2017-14992    2017-05399    2017-02281 
          185           727            87           187          1050 
   2017-06968    2017-14378    2017-10003    2017-08818    2017-09161 
          289           453           324           459           107 
   2017-09087    2017-09574    2017-18468    2017-18134    2017-04837 
          789           242           279          1564          2382 
   2017-04353    2017-02102    2017-08990    2017-08908    2017-18679 
          169           762           179           356            61 
   2018-27515    2018-26552    2017-22677    2017-27925    2018-10855 
          672            83           497           574           554 
   2018-10403    2018-11335    2018-11913    2018-11916    2018-11936 
          449           237          1245          1354           260 
   2018-20816    2019-07656    2019-05934    2019-15159    2019-15449 
         1003           960           643           481           362 
   2019-10538    2019-27678    2019-08797    2019-04437    2019-13793 
          715            83          1176           706           609 
   2020-27353    2020-27807    2020-27739    2020-27455    2021-01469 
          367            83           169           200           235 
   2021-01476    2021-00305    2020-17363    2020-04730    2020-11301 
          654           570           265           206           562 
   2020-08846    2020-09536    2020-21160    2020-23115    2020-23116 
          117           357           632           450           891 
   2020-23780    2019-24040    2019-19367    2019-22749    2019-22073 
          906           606           283           305           855 
   2019-19895    2019-06325    2019-06548    2019-14016    2019-28286 
          343          1290           196           701           188 
   2019-27217    2019-13175    2019-00048    2020-12953    2019-02544 
          259           313           185           652          1142 
   2019-00014    2018-24254    2018-26156    2020-14077    2020-14509 
          920           467           467          1006           795 
   2020-14328    2020-18015    2020-15338    2020-15646    2020-20887 
           56           464           607          1031           346 
   2020-09645    2020-04755    2021-01643    2021-01644    2021-01645 
           79           223          1027           293           607 
   2021-01713    2021-01714    2021-01712    2020-14872    2020-08392 
           57          1281           158           893            83 
   2020-06478    2020-16625    2020-21914    2020-21534    2020-12430 
          276           273          2138          1587           491 
   2020-02438    2020-25459    2020-21960    2018-20203    2018-19514 
          520           559           487          1010           474 
   2018-09895    2018-00553    2017-28160    2019-17052    2019-21505 
          434           354           194           488           267 
   2019-04298    2018-17068    2018-15195    2020-09695    2020-06161 
          343          2501           168           966           238 
   2020-10993    2020-10315    2020-18012 
          168          1373          1316 
dfmat_eo_text_bigrams[ntoken(dfmat_eo_text_bigrams) <= 0,]
Document-feature matrix of: 1 document, 131,816 features (100.00% sparse) and 1 docvar.
            features
docs         expand_branch branch_physic physic_fit fit_sport sport_presid
  2010-18988             0             0          0         0            0
            features
docs         presid_physic sport_purpos purpos_health health_human human_servic
  2010-18988             0            0             0            0            0
[ reached max_nfeat ... 131,806 more features ]
dfmat_eo_text_bigrams <- dfmat_eo_text_bigrams[ntoken(dfmat_eo_text_bigrams) > 0,]
dfmat_eo_text_bigrams <- dfm_trim(dfmat_eo_text_bigrams, min_docfreq = 3, docfreq_type = "count")
dfmat_eo_text_bigrams <- dfm_trim(dfmat_eo_text_bigrams, max_docfreq = .8 * nrow(dfmat_eo_text_bigrams), docfreq_type = "count")
dfmat_eo_text_bigrams[ntoken(dfmat_eo_text_bigrams) <= 0,]
Document-feature matrix of: 1 document, 16,226 features (100.00% sparse) and 1 docvar.
               features
docs            physic_fit fit_sport presid_physic purpos_health health_human
  C1-2009-31418          0         0             0             0            0
               features
docs            human_servic servic_carri carri_respons respons_public
  C1-2009-31418            0            0             0              0
               features
docs            public_health
  C1-2009-31418             0
[ reached max_nfeat ... 16,216 more features ]
dfmat_eo_text_bigrams <- dfmat_eo_text_bigrams[ntoken(dfmat_eo_text_bigrams) > 0,]
wf_model_eo_text_bigrams <- quanteda.textmodels::textmodel_wordfish(dfmat_eo_text_bigrams, dir =c(338,680))
summary(wf_model_eo_text_bigrams)

Call:
textmodel_wordfish.dfm(x = dfmat_eo_text_bigrams, dir = c(338, 
    680))

Estimated Document Positions:
               theta        se
02-14807    0.375707 0.0051375
02-11166    0.266160 0.0099810
01-2851     0.490440 0.0024624
04-11991   -3.172718 0.0385540
03-12661   -0.430057 0.6958304
03-24217    0.392668 0.0053020
03-19573    0.836832 0.0002914
03-20013    0.696742 0.0007264
03-29644    0.111531 0.0403299
04-1322     0.720523 0.0012773
04-18575   -1.926545 0.1942859
04-20050    0.187137 0.0120041
04-20052    0.240277 0.0080983
03-32332    0.552989 0.0046747
03-32328   -3.791918 0.0533286
04-6622     0.391054 0.0053977
04-12745    0.494108 0.0024326
04-13123   -1.781342 0.4357525
03-30913   -2.140918 0.2497887
03-30513   -0.582240 0.4430900
03-7736     0.327025 0.0022759
03-5343     0.286276 0.0035724
03-8108    -1.143333 0.5469056
05-7830    -0.848896 0.4710061
05-3385     0.823942 0.0005351
04-28079    0.049346 0.0330932
04-10024    0.317052 0.0074291
05-13214    0.869048 0.0002751
03-22543    0.838122 0.0003241
03-13750   -1.910327 0.3458407
03-14116    0.641540 0.0042068
03-14117    0.580925 0.0050119
08-970      0.403050 0.0033517
07-780      0.297362 0.0154528
07-2027     0.196995 0.0128248
07-2570     0.349035 0.0052446
08-1215     0.854672 0.0002967
07-5919    -0.281707 0.1788649
E8-28912   -1.187834 0.2804645
04-4884     0.452060 0.0036911
04-4436     0.225861 0.0181851
04-4451     0.413923 0.0042300
04-10377    0.160773 0.0179027
04-8616    -1.716100 0.2722769
05-12284    0.190662 0.0563735
05-12354    0.578328 0.0035939
04-26684    0.416909 0.0070024
04-26686    0.779863 0.0006227
04-25866   -1.256510 0.3166603
08-1480     0.887006 0.0002753
07-4906     0.339224 0.0049212
07-4907    -2.541661 0.1304500
07-4023     0.414194 0.0059741
08-797      0.363864 0.0083782
08-1409     0.051046 0.0198044
07-4600    -1.971532 0.3788576
07-5299     0.472709 0.0046330
E8-23235    0.565047 0.0037933
05-5097    -2.086657 0.2019686
E9-811     -1.136258 0.3135056
E9-814      0.378194 0.0080395
07-6022    -2.141041 0.2523419
07-1816    -1.909266 0.1972862
01-31671   -0.031157 0.1075993
01-31670    0.221250 0.0255373
07-5816     0.276495 0.0204510
01-4622     0.528343 0.0027829
01-6558    -2.075674 0.2054617
02-7087     0.393739 0.0049090
07-3656     0.128272 0.0271072
07-3593     0.393696 0.0043367
E8-27777    0.176128 0.0179401
E8-30042   -1.837012 0.2935690
E9-1574    -0.840269 0.2185404
E9-1538     0.333054 0.0114521
E9-818      0.206458 0.0146942
01-16668    0.834579 0.0003592
02-1594     0.445453 0.0057500
02-917      0.415563 0.0072500
02-4071     0.445654 0.0040869
02-5069    -2.048192 0.1716737
01-8835     0.683989 0.0017655
01-8836    -0.893969 0.7616490
02-2638     0.365759 0.0048568
02-918      0.407336 0.0071966
01-29831    0.510735 0.0070095
E8-30700   -3.734863 0.0497956
02-14497   -0.198985 0.2996158
02-31624    0.465809 0.0034334
02-16040    0.304394 0.0102250
02-16041   -0.411332 0.3318377
01-28762    0.151100 0.0328077
01-29219    0.636845 0.0034376
01-27917   -0.731171 0.1688118
06-554      0.365152 0.0139448
06-4652    -0.306553 0.2061939
07-293     -0.433677 0.2004313
06-9993    -1.786419 0.4412750
06-9896    -3.795584 0.0532188
05-21571   -0.410981 0.1238852
05-20944   -1.756993 0.1243453
02-21056    0.476597 0.0040804
03-464     -3.835404 0.0566245
03-11969   -0.032973 0.0697800
03-12071    0.495937 0.0066765
03-7313    -3.482557 0.0961104
03-10194   -0.603711 0.4203569
01-14319   -1.722190 0.3371007
01-15958    0.131347 0.0240184
01-24917    0.383979 0.0060608
01-24983    0.183035 0.0243192
02-17274    0.406663 0.0035303
06-4132     0.027080 0.0509954
06-4121     0.848270 0.0002906
06-9020     0.857936 0.0002862
06-9619     0.015984 0.0427091
06-7220     0.391463 0.0055078
06-3865     0.167232 0.0203799
06-2362     0.512169 0.0025075
01-31959   -2.063590 0.2079828
01-9086     0.569510 0.0038562
01-26509    0.369041 0.0023682
01-26339    0.244286 0.0100510
01-30624   -2.136850 0.2534384
01-13381    0.792105 0.0005606
03-2606     0.264205 0.0105500
03-1798     0.433825 0.0046339
03-8832     0.531434 0.0055206
03-19675    0.251816 0.0170769
07-3259    -0.523180 0.6458820
07-3258    -0.761748 0.6124109
07-2367     0.352349 0.0100984
06-6101    -0.046118 0.0901273
05-20156    0.152361 0.0718704
04-17636    0.810318 0.0004458
04-15787    0.508794 0.0099956
03-5848     0.865556 0.0003842
E8-24465    0.278060 0.0096114
05-9892    -1.568301 0.3228878
07-2518     0.381875 0.0070711
E8-20436    0.170146 0.0539731
01-15758    0.304351 0.0097069
01-13869   -0.584017 0.1952771
06-5592     0.867992 0.0002880
01-21338    0.663501 0.0015459
04-2773     0.226184 0.0101038
03-20764   -0.712901 0.6542096
03-31594    0.643143 0.0032546
04-11592    0.141822 0.0202813
04-11271    0.396160 0.0036694
04-2408     0.416143 0.0048081
04-1941    -3.020235 0.0744092
01-3883    -1.988569 0.3674400
01-2852     0.470952 0.0034771
04-10378    0.515030 0.0029594
04-20051    0.364174 0.0036252
03-05344    0.446014 0.0033049
03-6445    -1.843481 0.1875267
03-8109    -1.982565 0.2884170
03-12766    0.074445 0.0397044
06-7492     0.215879 0.0132636
05-19993    0.342775 0.0047805
05-22132    0.155462 0.0226450
05-22133    0.341824 0.0071063
07-3112     0.411398 0.0055657
01-25788   -0.009865 0.2428454
03-2069     0.456335 0.0031459
03-19572    0.377447 0.0117769
04-17150   -0.313585 0.1343211
04-17205    0.881017 0.0002686
04-17204   -1.517412 0.4785822
04-20049    0.159038 0.0173049
04-19909    0.452227 0.0046411
04-24098    0.209282 0.0167020
03-19676    0.743070 0.0007160
06-5828     0.362421 0.0080969
06-5829     0.322262 0.0067808
06-8769     0.839495 0.0003562
07-374      0.194002 0.0097181
06-5984    -0.475200 0.6241047
05-23412    0.878013 0.0002802
05-24596   -3.781354 0.0526788
05-24597    0.330999 0.0088980
05-24255    0.107184 0.0218844
06-5351     0.354715 0.0067169
06-4085     0.867929 0.0003168
06-4552     0.418798 0.0034399
06-9770     0.552555 0.0123935
06-9148     0.393978 0.0131826
03-7160     0.757653 0.0009837
07-3835     0.889420 0.0002763
01-4624    -0.090806 0.2387836
01-17041   -0.262590 0.4200144
01-13117    0.449503 0.0043960
01-13116    0.164957 0.0291592
02-16951    0.739043 0.0011251
02-17273    0.606221 0.0050149
02-22526    0.064841 0.0997435
01-4621     0.232421 0.0096002
01-4623    -0.642896 0.5549559
01-29948    0.207065 0.0151064
02-07086    0.258320 0.0107678
02-07085    0.576256 0.0053982
01-31119    0.232286 0.0704390
03-11713    0.743052 0.0011308
02-25900    0.145771 0.0523141
02-32518   -2.145303 0.2413781
03-10606   -2.385286 0.1386900
06-1316     0.856434 0.0002870
01-19562   -0.796980 0.4558253
01-24205    0.815009 0.0003173
01-25677    0.334462 0.0036476
01-25344    0.299597 0.0082266
03-16102    0.482960 0.0047809
04-23994    0.146898 0.0388021
01-11210    0.052532 0.2055247
01-11505    0.268283 0.0115537
02-29580    0.557741 0.0027018
02-29832    0.361106 0.0053614
02-31831    0.465718 0.0022944
04-15933    0.308034 0.0081843
04-15934   -0.780035 0.2669383
03-24919    0.430255 0.0045536
05-13098   -0.153743 0.0683119
05-1886     0.283188 0.0139809
04-28404    0.451041 0.0082903
04-22212   -0.945438 0.3067364
05-306     -3.755152 0.0509271
05-771      0.446584 0.0038014
04-26685   -2.069581 0.1641393
04-27076   -2.102114 0.1007413
04-21411    0.743466 0.0010686
05-14452   -0.983275 0.4517519
08-658      0.313864 0.0067050
05-7831    -0.070385 0.1457776
05-1170     0.403404 0.0077617
05-5434    -3.415214 0.0534192
E8-24342    0.404077 0.0084484
03-13694    0.819681 0.0003655
03-13412    0.797912 0.0005033
08-761      0.856652 0.0003166
06-9561     0.403500 0.0133385
07-419      0.076908 0.1456077
06-9895     0.397600 0.0046637
05-15160   -0.601649 0.3847703
02-9536    -2.244157 0.0764092
02-919     -1.674003 0.4216438
02-3337     0.226461 0.0646191
02-3826     0.375675 0.0044634
01-14862   -0.017141 0.1476481
08-62      -3.797570 0.0530270
08-325      0.248417 0.0102961
08-360      0.488546 0.0022926
E8-29564    0.438653 0.0052461
01-31665    0.385281 0.0120792
01-31667    0.113599 0.0484191
01-31668    0.093666 0.0506307
01-31669    0.051807 0.0743219
01-31672   -1.186957 0.3794329
08-1182    -0.138053 0.2710647
02-17640    0.509566 0.0026393
01-23359    0.521654 0.0029262
02-24252    0.259622 0.0100318
04-3170     0.312517 0.0060992
02-31832    0.495977 0.0025009
01-26990   -0.199476 0.4412191
02-448     -3.757392 0.0518467
06-9632    -0.411153 0.2226055
05-6907    -0.139322 0.2068097
07-5270     0.844293 0.0002884
E8-17940    0.368235 0.0017965
08-1472    -2.551614 0.1289064
E8-26531    0.754462 0.0010595
07-4115     0.362798 0.0083383
E8-27771    0.255632 0.0211425
E8-23125   -1.375751 0.2583434
08-568      0.372389 0.0096893
08-483      0.280424 0.0119896
04-5322    -3.762058 0.0520574
E8-21651    0.334232 0.0086825
07-1704     0.181186 0.0522673
07-2462     0.195912 0.0157833
07-1137    -0.077334 0.0534215
07-1152    -1.569121 0.5112659
08-1348     0.466488 0.0031387
07-4890     0.236143 0.0115133
04-11058    0.838238 0.0002814
07-3552     0.874601 0.0002890
08-1399     0.860251 0.0003963
07-5726    -0.716752 0.1618720
01-31666   -0.604655 0.3115305
2015-03714  0.337384 0.0040937
2015-07788  0.860825 0.0002676
2015-07016  0.036809 0.0169012
2015-05677  0.866731 0.0002535
2015-18292  0.313120 0.0071772
2015-19183  0.312664 0.0067318
2010-9078   0.252532 0.0133102
2010-10172  0.544312 0.0026801
2010-7154   0.448142 0.0044064
2010-11557  0.405059 0.0064441
2010-9796   0.214778 0.0128993
2015-16334 -0.266234 0.1593949
2011-19156  0.878422 0.0002700
2015-20801 -0.103617 0.0894393
2015-22888  0.257183 0.0171347
2010-4884   0.342312 0.0073128
2010-1229   0.362301 0.0111230
2010-38     0.110221 0.0353344
2010-12805  0.385079 0.0048430
2010-3725  -0.090028 0.0991502
2011-30990  0.293060 0.0125448
2010-24839  0.862425 0.0002500
2011-26574  0.157931 0.0309474
2011-12645  0.897763 0.0002749
2011-29683  0.137633 0.0291517
2011-17953  0.166514 0.0252969
2011-17447  0.327122 0.0087248
2014-11442  0.860580 0.0002454
2014-06768 -0.416357 0.1954962
2014-08426  0.412463 0.0054695
2012-22030  0.205193 0.0172609
2011-32486 -2.551172 0.1289745
2014-03805 -0.215990 0.0865680
2013-05967  0.595021 0.0015037
2014-22805  0.349663 0.0040150
2013-31445 -3.830479 0.0555950
2014-18561  0.334183 0.0041723
2014-17522  0.426604 0.0073727
2010-29579  0.487980 0.0020314
2012-1568   0.398497 0.0040713
E9-11547    0.273369 0.0070573
E9-26834   -0.350699 0.1946057
E9-23886    0.392123 0.0062233
E9-29781    0.209615 0.0115009
2012-7636   0.287176 0.0068072
2013-08501  0.199052 0.0305783
2011-21704 -1.009924 0.2291051
2011-26729  0.365663 0.0035498
2013-15942  0.326278 0.0057743
2013-16387  0.455041 0.0033480
2012-31574  0.232151 0.0264362
2012-30060  0.580751 0.0020067
2012-30170 -0.137415 0.1480053
2013-00002 -3.775975 0.0504466
2013-28581 -1.271926 0.3041400
2014-07895  0.872079 0.0002565
2011-15181  0.047404 0.0420204
2010-18169  0.273276 0.0063462
2010-8878   0.873679 0.0002630
2010-21016  0.347968 0.0034116
2010-21020  0.276825 0.0147547
2013-17478  0.127461 0.0238922
2014-03474  0.195196 0.0397924
2014-16360  0.830062 0.0003440
2011-18065  0.385510 0.0046488
2010-28854  0.462029 0.0035166
E9-1893     0.477148 0.0028395
E9-2893     0.292804 0.0070206
E9-1712     0.187025 0.0181836
E9-28493    0.403187 0.0036046
E9-30020   -1.948345 0.2596893
E9-2484     0.337871 0.0051417
E9-3106     0.097937 0.0865226
2014-18998  0.268880 0.0106775
2014-30195  0.297023 0.0088940
2014-29625 -0.006734 0.0701131
2010-22002  0.873022 0.0002638
2014-29121 -1.863663 0.2386743
2014-30323  0.891628 0.0002583
2014-30363 -3.843899 0.0561657
2014-24851 -1.239878 0.2784999
2016-30272  0.414512 0.0059647
2016-30101  0.409620 0.0080746
2016-31792  0.448784 0.0051877
2016-31922  0.817727 0.0004549
2016-30277  0.421489 0.0031459
2017-01623 -0.288985 0.0436231
2017-01169 -1.164178 0.2280089
2015-29403  0.743980 0.0010361
2016-29519  0.370375 0.0033347
2017-01487  0.445525 0.0052108
2017-01197  0.642979 0.0015265
2011-5903   0.341250 0.0166214
2011-8642  -0.008202 0.0957917
2011-28728  0.223906 0.0177432
2011-33087 -3.689437 0.0460401
2010-27004  0.380904 0.0030963
2010-28365  0.448190 0.0051496
2010-28360  0.113192 0.0281130
2011-13173  0.857780 0.0002809
2010-25578  0.358578 0.0036815
E9-5441     0.127170 0.0409104
E9-31098   -3.704973 0.0479851
E9-28022    0.518276 0.0021798
E9-25268    0.376142 0.0034888
2016-06250  0.398059 0.0036331
2016-07703 -1.286846 0.2762338
2016-08713 -0.108410 0.1508639
2016-03141  0.312632 0.0071999
2015-02379  0.342974 0.0057091
2015-01522  0.292206 0.0067245
2015-01255  0.241435 0.0106716
2016-26753  0.390136 0.0123225
2015-30191  0.873174 0.0002497
2016-03038  0.316052 0.0054572
2016-24066 -1.339107 0.1507130
2016-24847  0.732513 0.0009819
2016-22962 -2.550793 0.1246067
2016-28203  0.048848 0.0313482
2016-29165 -1.705450 0.2011280
2016-11300  0.353165 0.0054659
2016-12579 -2.550793 0.1246067
2016-15542  0.398604 0.0045276
2012-9473   0.502283 0.0029668
2012-10715  0.431276 0.0031284
2012-10968  0.327153 0.0059760
2012-5366   0.452481 0.0037338
2012-27002  0.249845 0.0102168
2013-08626 -3.698561 0.0463640
2012-10034  0.868012 0.0002511
2012-18868  0.388236 0.0026941
2012-3097   0.864176 0.0002428
2012-11798  0.360346 0.0058557
2012-12889  0.360455 0.0082330
2012-19055  0.829170 0.0001855
2012-17022  0.170124 0.0135450
2012-18237  0.848258 0.0003411
2012-25236  0.851928 0.0001668
2012-15954  0.821176 0.0004088
2016-31875 -3.793621 0.0529913
2016-27156  0.404874 0.0036739
2016-22454  0.752933 0.0010368
2016-27171  0.425023 0.0029793
2017-01489  0.383338 0.0061962
2015-32582 -3.843899 0.0561657
2017-01164  0.240588 0.0181252
2017-01168  0.274472 0.0150755
2016-29169  0.346551 0.0074487
2015-13055  0.728241 0.0012523
2015-19209  0.231800 0.0104775
2016-17945  0.494523 0.0033374
2016-18872  0.224546 0.0228678
2015-17926  0.232600 0.0182784
2015-15828 -0.233386 0.4373739
2015-16122  0.519910 0.0025518
2016-25288  0.476727 0.0044674
2016-25290  0.368568 0.0039268
2016-20713  0.393835 0.0080406
2015-29498 -1.562476 0.2368525
2016-02475  0.131592 0.0211950
2015-31749 -1.912341 0.2231292
2015-00058  0.889702 0.0002686
2016-06355  0.875069 0.0002325
2016-09483  0.871411 0.0002620
2016-09346  0.392596 0.0053204
2016-04770  0.320366 0.0090064
2015-23630  0.186751 0.0213310
2015-15495 -2.550793 0.1246067
2015-25744 -0.193422 0.1673599
2015-22998  0.078164 0.0256138
2015-25489  0.348183 0.0049723
2016-01325  0.847000 0.0002011
2015-32060 -1.256726 0.1834447
2016-12307  0.481157 0.0025856
2016-12155 -0.054388 0.0601120
2016-16295  0.324698 0.0064675
2016-19723  0.352057 0.0087920
2016-19724  0.260396 0.0161173
2016-19725  0.370731 0.0065996
2010-22279 -2.552003 0.1279248
2011-10910  0.890979 0.0002685
2011-10732  0.418085 0.0041752
2010-33169 -2.120923 0.0933345
2011-30463  0.839793 0.0002294
2011-33335  0.382311 0.0078112
2010-2419   0.330116 0.0055439
2010-5837   0.508791 0.0027592
E9-31418    0.342821 0.0018697
2010-4593   0.379410 0.0040417
2013-26785  0.352972 0.0033176
2011-33089  0.528244 0.0029886
2010-15851  0.346786 0.0056227
2010-16864  0.269108 0.0089729
2014-14432  0.097381 0.0428828
2014-14429 -2.552264 0.1260999
2013-19220  0.227525 0.0094114
2012-24374  0.486919 0.0025238
2012-22062 -0.357718 0.1010056
2011-31624  0.396489 0.0029262
2014-04254  0.459297 0.0028324
2013-24388  0.356136 0.0039885
2014-01523  0.397799 0.0068321
2014-05323  0.891800 0.0002578
2014-06141  0.889658 0.0002590
2014-06612  0.889741 0.0002660
2010-32960 -3.775024 0.0516942
2014-18682  0.422452 0.0082373
2010-705    0.231837 0.0146761
2010-14613  0.232140 0.0103254
2011-14919  0.326750 0.0068323
2011-15443  0.350010 0.0060572
2011-5728   0.419893 0.0034217
2011-4753   0.892162 0.0002579
2011-3257   0.412833 0.0037286
2011-2577   0.471290 0.0034072
2011-9739   0.836350 0.0004484
2011-1385   0.118774 0.0250489
2014-23228  0.362999 0.0037126
2014-24218 -1.553769 0.3361912
2014-25292  0.267274 0.0206650
2014-25439  0.453418 0.0040889
2012-12881  0.187599 0.0213672
2012-12882  0.354204 0.0086336
2012-12883  0.383425 0.0062649
E9-1719    -0.638910 0.1431457
E9-3113     0.254182 0.0110724
E9-5802     0.295915 0.0076016
E9-16034   -0.662266 0.5914353
E9-15368    0.314356 0.0068984
E9-1885     0.328699 0.0053651
E9-1895     0.339781 0.0068867
E9-3112     0.445592 0.0041650
E9-3108    -0.179437 0.2428156
E9-8572     0.325123 0.0071783
E9-2483     0.571022 0.0029302
E9-2486     0.258159 0.0320230
E9-2485     0.387302 0.0034282
E9-26408   -0.038682 0.0812227
E9-30413    0.562587 0.0083392
E9-27441   -0.026389 0.0427030
E9-24518    0.192268 0.0072905
E9-4068     0.420196 0.0050491
E9-4103     0.195535 0.0561065
2012-7019   0.468314 0.0015207
E9-28805    0.348604 0.0053774
E9-24203    0.499079 0.0034369
E9-23915    0.485983 0.0103777
2012-22807  0.348970 0.0051176
2013-06712  0.334583 0.0091320
2013-03915  0.352391 0.0032769
2012-2557  -0.826436 0.3835998
2013-12157 -2.551461 0.1271050
2012-10884  0.851024 0.0002776
2012-6797   0.236472 0.0103332
2012-30310  0.287620 0.0064468
2013-15782  0.247259 0.0094578
2013-13523  0.838178 0.0001504
2011-26141  0.382964 0.0060075
2013-07837  0.344986 0.0064217
2012-31225 -1.881120 0.2365160
2010-31878  0.289500 0.0090148
2013-19520  0.812185 0.0004962
2014-09343 -0.325031 0.5510584
2014-12651  0.768244 0.0008027
2010-12070  0.198250 0.0202289
2010-9451   0.125733 0.0273697
2012-20259  0.412112 0.0036350
2012-17264  0.877449 0.0002659
2012-3616   0.324261 0.0063318
2013-12650  0.162645 0.0396815
2013-11533 -0.045287 0.0665245
2011-21505  0.890659 0.0002635
2011-23891  0.370354 0.0048229
2012-12225  0.897753 0.0002770
2012-15183  0.331715 0.0058270
2018-27945 -1.861041 0.2458635
2017-23630  0.523106 0.0021480
2017-27034  0.404710 0.0076540
2018-04860 -2.439901 0.0841007
2018-08883 -0.449459 0.1397341
2018-05916  0.855280 0.0003983
2018-05113  0.322085 0.0058823
2018-11101 -0.598721 0.1450831
2018-00240  0.197327 0.0367751
2017-23270  0.494867 0.0044465
2017-27899  0.310188 0.0087709
2018-07874  0.437378 0.0032068
2018-15202 -2.479567 0.0667670
2018-13640 -0.089380 0.0547679
2018-15955  0.203881 0.0110257
2018-15299  0.469908 0.0028361
2019-24288  0.273381 0.0175688
2019-26178  0.235420 0.0113229
2019-05370  0.697983 0.0014265
2019-16383  0.853601 0.0002652
2018-02261  0.496138 0.0036046
2018-00630 -1.587319 0.2535313
2018-08272  0.016635 0.0541612
2018-11939 -1.526803 0.1611378
2018-13696  0.527429 0.0035144
2019-10398  0.427444 0.0027724
2020-17364  0.079822 0.0400027
2020-17699  0.778451 0.0005226
2020-17700  0.794913 0.0004526
2020-07530  0.438467 0.0021798
2020-27948  0.006543 0.0419008
2021-01094  0.406320 0.0054477
2021-01228  0.693752 0.0011812
2020-12030  0.540870 0.0022193
2018-04414  0.338293 0.0060752
2020-03556  0.244171 0.0200465
2020-27740  0.496422 0.0036678
2019-07645  0.419468 0.0043800
2019-21630  0.382190 0.0046833
2019-09750 -0.486414 0.1261380
2019-12802  0.365528 0.0050707
2019-13945  0.399049 0.0040833
2019-22849  0.848645 0.0002027
2019-20804  0.198475 0.0133248
2019-23525  0.038969 0.0360142
2019-22623  0.104986 0.0236071
2019-22624  0.418657 0.0030966
2019-00615  0.741844 0.0009702
2019-04595  0.457763 0.0055488
2019-01426  0.441204 0.0040246
2020-14337 -0.654836 0.2287226
2020-12584  0.471357 0.0020438
2020-22510  0.313183 0.0077128
2020-29235  0.438081 0.0047314
2020-22064  0.621766 0.0010735
2020-24793  0.077496 0.0302784
2020-28605  0.443889 0.0032906
2020-28606  0.280528 0.0152875
2020-16623 -0.036079 0.0936770
2020-16624  0.366970 0.0087277
2021-01635  0.469435 0.0031615
2021-01646  0.618826 0.0014608
2021-01013  0.390286 0.0044818
2019-16879  0.810881 0.0004625
2019-15222  0.358686 0.0045312
2019-09877  0.849166 0.0002252
2017-15680  0.383045 0.0050420
2017-13458  0.208950 0.0308542
2017-13012  0.277591 0.0074467
2017-02762  0.545091 0.0041835
2017-10004  0.372398 0.0031559
2017-15860  0.344752 0.0063813
2017-08586  0.474046 0.0044551
2017-03113  0.538094 0.0024233
2017-03115  0.320416 0.0094006
2017-03116  0.465672 0.0046377
2017-03118  0.277680 0.0111629
2017-02450  0.296993 0.0059253
2017-02451  0.430388 0.0047760
2017-09156  0.464797 0.0045298
2017-06716  0.168215 0.0202022
2017-20647  0.872029 0.0001956
2017-21555  0.378517 0.0046241
2017-21559 -0.205698 0.1729516
2017-09083 -0.109818 0.0794969
2017-08905  0.247782 0.0173598
2017-08311  0.467322 0.0033030
2017-06967  0.479832 0.0040576
2017-06971  0.466549 0.0046421
2017-04357  0.340990 0.0051796
2017-04107 -0.502334 0.1890952
2017-02095  0.534588 0.0018355
2017-02029  0.455074 0.0042590
2017-01799  0.148385 0.0326686
2017-06576  0.361909 0.0039466
2017-06382  0.163377 0.0431841
2020-00534  0.846492 0.0002244
2020-02439  0.549989 0.0020132
2020-27065 -0.026385 0.0393748
2020-06969  0.497962 0.0020960
2020-06985  0.494908 0.0038715
2020-10953  0.430687 0.0038848
2020-07800  0.270348 0.0137845
2020-03337  0.326452 0.0063059
2020-09537 -0.051352 0.0792820
2020-19032  0.033363 0.0596523
2020-21129  0.399130 0.0057168
2021-00040 -3.843899 0.0561657
2020-13449  0.271174 0.0084723
2017-14992  0.688170 0.0017668
2017-05399  0.149979 0.0321833
2017-02281  0.548332 0.0016448
2017-06968  0.498931 0.0036711
2017-14378  0.260556 0.0094338
2017-10003  0.445478 0.0038407
2017-08818  0.347667 0.0054394
2017-09161  0.289871 0.0151610
2017-09087  0.483350 0.0025619
2017-09574  0.471187 0.0046861
2017-18468  0.857666 0.0003873
2017-18134  0.385157 0.0028469
2017-04837  0.570395 0.0011089
2017-04353 -0.074666 0.0987356
2017-02102  0.496956 0.0023652
2017-08990  0.028640 0.0678281
2017-08908  0.070928 0.0378703
2017-18679  0.157223 0.0444033
2018-27515  0.340102 0.0046734
2018-26552 -1.773270 0.2740579
2017-22677 -0.058110 0.0698447
2017-27925  0.860976 0.0002523
2018-10855  0.441628 0.0033908
2018-10403 -1.172655 0.2411477
2018-11335  0.835624 0.0004522
2018-11913 -1.161105 0.1592594
2018-11916  0.190886 0.0109355
2018-11936  0.243731 0.0169609
2018-20816  0.848179 0.0001956
2019-07656  0.362772 0.0044304
2019-05934  0.406380 0.0042995
2019-15159  0.267574 0.0141736
2019-15449  0.255675 0.0129879
2019-10538  0.738385 0.0004722
2019-27678 -1.843150 0.2523032
2019-08797 -0.752383 0.1208192
2019-04437  0.243186 0.0095144
2019-13793  0.862539 0.0002357
2020-27353  0.404507 0.0046174
2020-27807 -1.851735 0.2491381
2020-27739  0.390723 0.0057398
2020-27455  0.416622 0.0061148
2021-01469  0.447152 0.0050981
2021-01476  0.333031 0.0062120
2021-00305  0.751915 0.0005273
2020-17363  0.406300 0.0056410
2020-04730  0.318655 0.0083812
2020-11301  0.229281 0.0121042
2020-08846  0.558730 0.0033721
2020-09536  0.452337 0.0038196
2020-21160  0.847468 0.0002570
2020-23115  0.312297 0.0074981
2020-23116  0.177842 0.0132363
2020-23780 -2.060771 0.0906638
2019-24040  0.360643 0.0045138
2019-19367  0.163090 0.0198875
2019-22749  0.438973 0.0049862
2019-22073  0.119070 0.0245420
2019-19895  0.835988 0.0003660
2019-06325  0.359975 0.0033563
2019-06548 -3.727253 0.0496101
2019-14016  0.290365 0.0080945
2019-28286 -3.779011 0.0526972
2019-27217  0.348417 0.0098663
2019-13175  0.213151 0.0190602
2019-00048 -3.843899 0.0561657
2020-12953  0.842531 0.0002780
2019-02544  0.319334 0.0047725
2019-00014  0.376758 0.0042072
2018-24254  0.863943 0.0002712
2018-26156  0.874150 0.0002616
2020-14077  0.289748 0.0073301
2020-14509  0.379195 0.0049907
2020-14328  0.126907 0.0545971
2020-18015  0.399769 0.0055921
2020-15338  0.268351 0.0076492
2020-15646  0.826617 0.0002592
2020-20887  0.368247 0.0071640
2020-09645 -0.139193 0.1624503
2020-04755  0.209187 0.0171731
2021-01643  0.287460 0.0118168
2021-01644  0.404660 0.0054137
2021-01645  0.445685 0.0039672
2021-01713 -0.235805 0.2327170
2021-01714  0.718490 0.0005095
2021-01712 -0.609574 0.3241330
2020-14872  0.408264 0.0042006
2020-08392  0.400400 0.0082551
2020-06478  0.400188 0.0047460
2020-16625  0.265470 0.0162041
2020-21914 -0.585088 0.1340264
2020-21534  0.311322 0.0057253
2020-12430  0.554269 0.0024443
2020-02438  0.386407 0.0052180
2020-25459  0.769566 0.0004745
2020-21960  0.211779 0.0175473
2018-20203  0.814577 0.0002670
2018-19514  0.451920 0.0041568
2018-09895  0.375762 0.0051858
2018-00553  0.015285 0.0580961
2017-28160 -3.776684 0.0519076
2019-17052  0.854722 0.0002716
2019-21505  0.455378 0.0044498
2019-04298  0.366169 0.0067004
2018-17068  0.830644 0.0001391
2018-15195 -1.526429 0.3036839
2020-09695  0.708941 0.0005497
2020-06161  0.402003 0.0044172
2020-10993  0.059596 0.0457050
2020-10315  0.458439 0.0021063
2020-18012  0.471537 0.0019497

Estimated Feature Scores:
     physic_fit fit_sport presid_physic purpos_health health_human human_servic
beta     0.4919    0.5101        0.4893        0.2778       0.3207       0.3214
psi     -4.1095   -3.4202       -4.4455       -5.6075      -0.8912      -0.8854
     servic_carri carri_respons respons_public public_health servic_develop
beta        0.330        0.2446         0.3118        0.2901         0.8254
psi        -5.107       -3.3328        -4.9208       -1.7317        -3.9296
     develop_coordin coordin_enhanc enhanc_physic physic_activ sport_particip
beta          0.5873          0.399        0.3315       0.4543         0.4213
psi          -3.9354         -5.631       -5.6177      -3.2145        -3.9009
     seek_expand awar_benefit regular_physic enhanc_coordi coordi_among
beta      0.3731       0.3435         0.3718        0.3431       0.3148
psi      -5.6258      -5.6200        -4.6447       -3.7741      -3.5776
     among_privat privat_public public_sector sector_promot expand_avail
beta       0.3232        0.3589        0.2381        0.4031       0.3251
psi       -4.0757       -4.5244       -4.3011       -5.3441      -4.9233
     qualiti_inform inform_regard privat_sector particular_emphasi
beta         0.2182        0.2843        0.3459              0.384
psi         -4.2106       -2.8787       -1.3164             -5.628
textplot_scale1d(wf_model_eo_text_bigrams)

textplot_scale1d(wf_model_eo_text_bigrams, margin = "features",highlighted = c("emergency_response", "mass_shoot", "immigr_polic"))

plot_data_2 <- data.frame(
  score = wf_model_eo_text_bigrams$theta,
  president = docvars(dfmat_eo_text_bigrams, "president"))
plot_data_2
           score president
1    0.375706994      Bush
2    0.266160123      Bush
3    0.490440017      Bush
4   -3.172717642      Bush
5   -0.430056949      Bush
6    0.392668451      Bush
7    0.836832324      Bush
8    0.696742208      Bush
9    0.111531357      Bush
10   0.720523373      Bush
11  -1.926544924      Bush
12   0.187136554      Bush
13   0.240277125      Bush
14   0.552988789      Bush
15  -3.791917983      Bush
16   0.391054080      Bush
17   0.494107779      Bush
18  -1.781342332      Bush
19  -2.140918070      Bush
20  -0.582239944      Bush
21   0.327025184      Bush
22   0.286275784      Bush
23  -1.143332822      Bush
24  -0.848895847      Bush
25   0.823942329      Bush
26   0.049346124      Bush
27   0.317051876      Bush
28   0.869048270      Bush
29   0.838121656      Bush
30  -1.910326673      Bush
31   0.641539593      Bush
32   0.580924762      Bush
33   0.403049748      Bush
34   0.297362096      Bush
35   0.196994826      Bush
36   0.349034829      Bush
37   0.854671801      Bush
38  -0.281707360      Bush
39  -1.187834328      Bush
40   0.452059986      Bush
41   0.225860639      Bush
42   0.413923164      Bush
43   0.160772701      Bush
44  -1.716100001      Bush
45   0.190661504      Bush
46   0.578328103      Bush
47   0.416909118      Bush
48   0.779862817      Bush
49  -1.256509752      Bush
50   0.887005574      Bush
51   0.339224420      Bush
52  -2.541661130      Bush
53   0.414194192      Bush
54   0.363864474      Bush
55   0.051046325      Bush
56  -1.971532466      Bush
57   0.472709057      Bush
58   0.565046763      Bush
59  -2.086657039      Bush
60  -1.136258076      Bush
61   0.378194000      Bush
62  -2.141040674      Bush
63  -1.909266261      Bush
64  -0.031157291      Bush
65   0.221249669      Bush
66   0.276494537      Bush
67   0.528342697      Bush
68  -2.075674132      Bush
69   0.393739248      Bush
70   0.128271509      Bush
71   0.393695528      Bush
72   0.176127888      Bush
73  -1.837011987      Bush
74  -0.840269307      Bush
75   0.333053730      Bush
76   0.206457719      Bush
77   0.834578584      Bush
78   0.445453292      Bush
79   0.415563063      Bush
80   0.445654261      Bush
81  -2.048192370      Bush
82   0.683988667      Bush
83  -0.893968800      Bush
84   0.365758859      Bush
85   0.407336296      Bush
86   0.510734805      Bush
87  -3.734862760      Bush
88  -0.198984646      Bush
89   0.465808540      Bush
90   0.304394357      Bush
91  -0.411332416      Bush
92   0.151099831      Bush
93   0.636845247      Bush
94  -0.731171260      Bush
95   0.365152293      Bush
96  -0.306552903      Bush
97  -0.433677202      Bush
98  -1.786419144      Bush
99  -3.795584202      Bush
100 -0.410980699      Bush
101 -1.756992946      Bush
102  0.476597267      Bush
103 -3.835403533      Bush
104 -0.032972981      Bush
105  0.495936635      Bush
106 -3.482557361      Bush
107 -0.603710620      Bush
108 -1.722190163      Bush
109  0.131346531      Bush
110  0.383978505      Bush
111  0.183034656      Bush
112  0.406662922      Bush
113  0.027079703      Bush
114  0.848269825      Bush
115  0.857935903      Bush
116  0.015984269      Bush
117  0.391463192      Bush
118  0.167232169      Bush
119  0.512168733      Bush
120 -2.063590228      Bush
121  0.569510441      Bush
122  0.369041024      Bush
123  0.244285742      Bush
124 -2.136850357      Bush
125  0.792105116      Bush
126  0.264205417      Bush
127  0.433824694      Bush
128  0.531433822      Bush
129  0.251816141      Bush
130 -0.523179540      Bush
131 -0.761748382      Bush
132  0.352348648      Bush
133 -0.046118489      Bush
134  0.152361323      Bush
135  0.810317740      Bush
136  0.508794299      Bush
137  0.865555540      Bush
138  0.278059513      Bush
139 -1.568300989      Bush
140  0.381874575      Bush
141  0.170145675      Bush
142  0.304351419      Bush
143 -0.584017032      Bush
144  0.867992467      Bush
145  0.663500889      Bush
146  0.226184342      Bush
147 -0.712901355      Bush
148  0.643142738      Bush
149  0.141821890      Bush
150  0.396160156      Bush
151  0.416142622      Bush
152 -3.020235355      Bush
153 -1.988568548      Bush
154  0.470952339      Bush
155  0.515029615      Bush
156  0.364173820      Bush
157  0.446013511      Bush
158 -1.843481361      Bush
159 -1.982565492      Bush
160  0.074444822      Bush
161  0.215878807      Bush
162  0.342775000      Bush
163  0.155461645      Bush
164  0.341824470      Bush
165  0.411398393      Bush
166 -0.009864781      Bush
167  0.456335328      Bush
168  0.377447138      Bush
169 -0.313585262      Bush
170  0.881016566      Bush
171 -1.517412119      Bush
172  0.159038393      Bush
173  0.452227301      Bush
174  0.209281737      Bush
175  0.743069629      Bush
176  0.362421432      Bush
177  0.322262374      Bush
178  0.839495478      Bush
179  0.194001510      Bush
180 -0.475200094      Bush
181  0.878012649      Bush
182 -3.781354184      Bush
183  0.330999031      Bush
184  0.107183776      Bush
185  0.354714598      Bush
186  0.867928848      Bush
187  0.418797781      Bush
188  0.552555038      Bush
189  0.393978256      Bush
190  0.757653460      Bush
191  0.889420477      Bush
192 -0.090806151      Bush
193 -0.262590145      Bush
194  0.449502616      Bush
195  0.164956809      Bush
196  0.739042627      Bush
197  0.606221299      Bush
198  0.064841171      Bush
199  0.232421397      Bush
200 -0.642895738      Bush
201  0.207064842      Bush
202  0.258319896      Bush
203  0.576256318      Bush
204  0.232285973      Bush
205  0.743051608      Bush
206  0.145770655      Bush
207 -2.145302525      Bush
208 -2.385285675      Bush
209  0.856433838      Bush
210 -0.796979726      Bush
211  0.815009221      Bush
212  0.334461714      Bush
213  0.299596884      Bush
214  0.482959518      Bush
215  0.146898126      Bush
216  0.052531687      Bush
217  0.268282927      Bush
218  0.557741464      Bush
219  0.361106236      Bush
220  0.465717548      Bush
221  0.308034382      Bush
222 -0.780034521      Bush
223  0.430255458      Bush
224 -0.153743223      Bush
225  0.283188288      Bush
226  0.451041483      Bush
227 -0.945437826      Bush
228 -3.755152085      Bush
229  0.446583803      Bush
230 -2.069580521      Bush
231 -2.102114045      Bush
232  0.743466217      Bush
233 -0.983275023      Bush
234  0.313863749      Bush
235 -0.070385486      Bush
236  0.403403840      Bush
237 -3.415214052      Bush
238  0.404077375      Bush
239  0.819681409      Bush
240  0.797912360      Bush
241  0.856652491      Bush
242  0.403499795      Bush
243  0.076907825      Bush
244  0.397600498      Bush
245 -0.601649026      Bush
246 -2.244157002      Bush
247 -1.674003073      Bush
248  0.226461449      Bush
249  0.375674633      Bush
250 -0.017141487      Bush
251 -3.797569961      Bush
252  0.248416566      Bush
253  0.488545734      Bush
254  0.438653368      Bush
255  0.385281077      Bush
256  0.113598885      Bush
257  0.093665815      Bush
258  0.051806697      Bush
259 -1.186956654      Bush
260 -0.138052505      Bush
261  0.509565708      Bush
262  0.521653990      Bush
263  0.259621763      Bush
264  0.312517129      Bush
265  0.495976572      Bush
266 -0.199476399      Bush
267 -3.757391751      Bush
268 -0.411153413      Bush
269 -0.139321971      Bush
270  0.844292510      Bush
271  0.368235406      Bush
272 -2.551614155      Bush
273  0.754462013      Bush
274  0.362798338      Bush
275  0.255632403      Bush
276 -1.375751275      Bush
277  0.372388594      Bush
278  0.280423882      Bush
279 -3.762057800      Bush
280  0.334231995      Bush
281  0.181186271      Bush
282  0.195911556      Bush
283 -0.077333694      Bush
284 -1.569121495      Bush
285  0.466487552      Bush
286  0.236142667      Bush
287  0.838237526      Bush
288  0.874600704      Bush
289  0.860251443      Bush
290 -0.716752307      Bush
291 -0.604655401      Bush
292  0.337384069     Obama
293  0.860824569     Obama
294  0.036808925     Obama
295  0.866730577     Obama
296  0.313120198     Obama
297  0.312663659     Obama
298  0.252532154     Obama
299  0.544312281     Obama
300  0.448142093     Obama
301  0.405058746     Obama
302  0.214777658     Obama
303 -0.266234407     Obama
304  0.878421608     Obama
305 -0.103617115     Obama
306  0.257183235     Obama
307  0.342311753     Obama
308  0.362300886     Obama
309  0.110221095     Obama
310  0.385078502     Obama
311 -0.090028115     Obama
312  0.293060216     Obama
313  0.862424895     Obama
314  0.157931307     Obama
315  0.897763293     Obama
316  0.137633427     Obama
317  0.166514178     Obama
318  0.327121836     Obama
319  0.860580330     Obama
320 -0.416356861     Obama
321  0.412463243     Obama
322  0.205193482     Obama
323 -2.551172074     Obama
324 -0.215989936     Obama
325  0.595021256     Obama
326  0.349662862     Obama
327 -3.830479346     Obama
328  0.334183231     Obama
329  0.426603789     Obama
330  0.487979791     Obama
331  0.398497211     Obama
332  0.273369153     Obama
333 -0.350699451     Obama
334  0.392122796     Obama
335  0.209614947     Obama
336  0.287175584     Obama
337  0.199051699     Obama
338 -1.009923742     Obama
339  0.365663006     Obama
340  0.326278462     Obama
341  0.455040992     Obama
342  0.232151088     Obama
343  0.580750988     Obama
344 -0.137414658     Obama
345 -3.775974946     Obama
346 -1.271925527     Obama
347  0.872079347     Obama
348  0.047403542     Obama
349  0.273275662     Obama
350  0.873678889     Obama
351  0.347968125     Obama
352  0.276825470     Obama
353  0.127460624     Obama
354  0.195196325     Obama
355  0.830061521     Obama
356  0.385510094     Obama
357  0.462028676     Obama
358  0.477148188     Obama
359  0.292804108     Obama
360  0.187025394     Obama
361  0.403187449     Obama
362 -1.948344626     Obama
363  0.337871405     Obama
364  0.097936636     Obama
365  0.268879964     Obama
366  0.297023240     Obama
367 -0.006734256     Obama
368  0.873022359     Obama
369 -1.863662887     Obama
370  0.891627539     Obama
371 -3.843899116     Obama
372 -1.239877925     Obama
373  0.414512066     Obama
374  0.409620142     Obama
375  0.448783522     Obama
376  0.817726773     Obama
377  0.421488545     Obama
378 -0.288984627     Obama
379 -1.164178127     Obama
380  0.743979725     Obama
381  0.370374883     Obama
382  0.445524590     Obama
383  0.642979252     Obama
384  0.341250088     Obama
385 -0.008201828     Obama
386  0.223905842     Obama
387 -3.689437028     Obama
388  0.380904056     Obama
389  0.448189968     Obama
390  0.113192460     Obama
391  0.857779691     Obama
392  0.358577615     Obama
393  0.127169913     Obama
394 -3.704973295     Obama
395  0.518275994     Obama
396  0.376141882     Obama
397  0.398059122     Obama
398 -1.286846425     Obama
399 -0.108410320     Obama
400  0.312632477     Obama
401  0.342974250     Obama
402  0.292205955     Obama
403  0.241435171     Obama
404  0.390135858     Obama
405  0.873174176     Obama
406  0.316052278     Obama
407 -1.339107061     Obama
408  0.732512687     Obama
409 -2.550793443     Obama
410  0.048848090     Obama
411 -1.705449892     Obama
412  0.353165483     Obama
413 -2.550793443     Obama
414  0.398604083     Obama
415  0.502282889     Obama
416  0.431275878     Obama
417  0.327152836     Obama
418  0.452480719     Obama
419  0.249844577     Obama
420 -3.698560970     Obama
421  0.868011556     Obama
422  0.388236491     Obama
423  0.864176429     Obama
424  0.360345562     Obama
425  0.360454627     Obama
426  0.829169680     Obama
427  0.170124114     Obama
428  0.848257539     Obama
429  0.851927764     Obama
430  0.821176494     Obama
431 -3.793621143     Obama
432  0.404874116     Obama
433  0.752933007     Obama
434  0.425023459     Obama
435  0.383338250     Obama
436 -3.843899116     Obama
437  0.240587612     Obama
438  0.274472470     Obama
439  0.346550853     Obama
440  0.728241241     Obama
441  0.231800271     Obama
442  0.494522648     Obama
443  0.224546137     Obama
444  0.232600059     Obama
445 -0.233385712     Obama
446  0.519909642     Obama
447  0.476727448     Obama
448  0.368568396     Obama
449  0.393835156     Obama
450 -1.562475626     Obama
451  0.131591629     Obama
452 -1.912341014     Obama
453  0.889701735     Obama
454  0.875068675     Obama
455  0.871410534     Obama
456  0.392595920     Obama
457  0.320365788     Obama
458  0.186751167     Obama
459 -2.550793443     Obama
460 -0.193421947     Obama
461  0.078163701     Obama
462  0.348183324     Obama
463  0.847000331     Obama
464 -1.256726019     Obama
465  0.481157020     Obama
466 -0.054388253     Obama
467  0.324698175     Obama
468  0.352056605     Obama
469  0.260395717     Obama
470  0.370731377     Obama
471 -2.552003082     Obama
472  0.890979073     Obama
473  0.418085067     Obama
474 -2.120923174     Obama
475  0.839793188     Obama
476  0.382311116     Obama
477  0.330115760     Obama
478  0.508790542     Obama
479  0.342821128     Obama
480  0.379410468     Obama
481  0.352972230     Obama
482  0.528243808     Obama
483  0.346785766     Obama
484  0.269107998     Obama
485  0.097380576     Obama
486 -2.552264157     Obama
487  0.227525382     Obama
488  0.486919005     Obama
489 -0.357718050     Obama
490  0.396488578     Obama
491  0.459296789     Obama
492  0.356136368     Obama
493  0.397798520     Obama
494  0.891800069     Obama
495  0.889658316     Obama
496  0.889741254     Obama
497 -3.775023525     Obama
498  0.422451918     Obama
499  0.231837137     Obama
500  0.232140220     Obama
501  0.326750276     Obama
502  0.350010252     Obama
503  0.419892891     Obama
504  0.892162432     Obama
505  0.412832872     Obama
506  0.471289950     Obama
507  0.836349937     Obama
508  0.118773998     Obama
509  0.362999492     Obama
510 -1.553769246     Obama
511  0.267273717     Obama
512  0.453417871     Obama
513  0.187598648     Obama
514  0.354204084     Obama
515  0.383424999     Obama
516 -0.638910146     Obama
517  0.254182232     Obama
518  0.295915039     Obama
519 -0.662265817     Obama
520  0.314355795     Obama
521  0.328699401     Obama
522  0.339781463     Obama
523  0.445591930     Obama
524 -0.179436595     Obama
525  0.325122730     Obama
526  0.571022395     Obama
527  0.258159240     Obama
528  0.387301847     Obama
529 -0.038681633     Obama
530  0.562587341     Obama
531 -0.026389292     Obama
532  0.192267974     Obama
533  0.420195712     Obama
534  0.195535142     Obama
535  0.468314046     Obama
536  0.348604431     Obama
537  0.499079308     Obama
538  0.485982841     Obama
539  0.348969741     Obama
540  0.334583192     Obama
541  0.352390793     Obama
542 -0.826435663     Obama
543 -2.551460771     Obama
544  0.851024203     Obama
545  0.236472006     Obama
546  0.287619881     Obama
547  0.247259335     Obama
548  0.838178103     Obama
549  0.382964202     Obama
550  0.344986245     Obama
551 -1.881120006     Obama
552  0.289500166     Obama
553  0.812185226     Obama
554 -0.325031068     Obama
555  0.768244185     Obama
556  0.198250334     Obama
557  0.125732588     Obama
558  0.412112145     Obama
559  0.877449221     Obama
560  0.324261170     Obama
561  0.162645429     Obama
562 -0.045286711     Obama
563  0.890659038     Obama
564  0.370353523     Obama
565  0.897753083     Obama
566  0.331714803     Obama
567 -1.861040770     Trump
568  0.523105519     Trump
569  0.404710313     Trump
570 -2.439901348     Trump
571 -0.449458548     Trump
572  0.855279535     Trump
573  0.322084905     Trump
574 -0.598720790     Trump
575  0.197327439     Trump
576  0.494867356     Trump
577  0.310187505     Trump
578  0.437377756     Trump
579 -2.479566568     Trump
580 -0.089380033     Trump
581  0.203880631     Trump
582  0.469908460     Trump
583  0.273381213     Trump
584  0.235420290     Trump
585  0.697982964     Trump
586  0.853600718     Trump
587  0.496138215     Trump
588 -1.587318736     Trump
589  0.016634914     Trump
590 -1.526803398     Trump
591  0.527429068     Trump
592  0.427443602     Trump
593  0.079822158     Trump
594  0.778450986     Trump
595  0.794912734     Trump
596  0.438467404     Trump
597  0.006542834     Trump
598  0.406320492     Trump
599  0.693751810     Trump
600  0.540869999     Trump
601  0.338293470     Trump
602  0.244170870     Trump
603  0.496422251     Trump
604  0.419468151     Trump
605  0.382189779     Trump
606 -0.486414176     Trump
607  0.365527808     Trump
608  0.399049377     Trump
609  0.848645412     Trump
610  0.198474544     Trump
611  0.038968562     Trump
612  0.104986072     Trump
613  0.418657220     Trump
614  0.741844244     Trump
615  0.457763137     Trump
616  0.441203617     Trump
617 -0.654835686     Trump
618  0.471356543     Trump
619  0.313183455     Trump
620  0.438081262     Trump
621  0.621765596     Trump
622  0.077495624     Trump
623  0.443889373     Trump
624  0.280528375     Trump
625 -0.036078624     Trump
626  0.366969932     Trump
627  0.469434553     Trump
628  0.618825866     Trump
629  0.390286173     Trump
630  0.810880909     Trump
631  0.358685809     Trump
632  0.849166494     Trump
633  0.383045181     Trump
634  0.208950197     Trump
635  0.277590574     Trump
636  0.545091489     Trump
637  0.372398403     Trump
638  0.344751719     Trump
639  0.474045795     Trump
640  0.538094050     Trump
641  0.320415515     Trump
642  0.465672031     Trump
643  0.277680267     Trump
644  0.296992652     Trump
645  0.430387929     Trump
646  0.464796803     Trump
647  0.168214754     Trump
648  0.872029343     Trump
649  0.378517392     Trump
650 -0.205698185     Trump
651 -0.109818062     Trump
652  0.247782383     Trump
653  0.467321867     Trump
654  0.479831859     Trump
655  0.466549126     Trump
656  0.340989810     Trump
657 -0.502334169     Trump
658  0.534588415     Trump
659  0.455074351     Trump
660  0.148384574     Trump
661  0.361908702     Trump
662  0.163377048     Trump
663  0.846491545     Trump
664  0.549989000     Trump
665 -0.026384696     Trump
666  0.497961671     Trump
667  0.494908375     Trump
668  0.430687477     Trump
669  0.270347589     Trump
670  0.326452153     Trump
671 -0.051351669     Trump
672  0.033362650     Trump
673  0.399129761     Trump
674 -3.843899116     Trump
675  0.271173886     Trump
676  0.688169880     Trump
677  0.149978606     Trump
678  0.548332499     Trump
679  0.498930549     Trump
680  0.260556145     Trump
681  0.445478210     Trump
682  0.347666776     Trump
683  0.289870580     Trump
684  0.483349627     Trump
685  0.471187376     Trump
686  0.857666406     Trump
687  0.385156571     Trump
688  0.570394654     Trump
689 -0.074665563     Trump
690  0.496956064     Trump
691  0.028640361     Trump
692  0.070928414     Trump
693  0.157222820     Trump
694  0.340101657     Trump
695 -1.773270327     Trump
696 -0.058110237     Trump
697  0.860976051     Trump
698  0.441628221     Trump
699 -1.172654610     Trump
700  0.835624412     Trump
701 -1.161105493     Trump
702  0.190885753     Trump
703  0.243731286     Trump
704  0.848178799     Trump
705  0.362771716     Trump
706  0.406379915     Trump
707  0.267573646     Trump
708  0.255675215     Trump
709  0.738384919     Trump
710 -1.843150117     Trump
711 -0.752382783     Trump
712  0.243185717     Trump
713  0.862539208     Trump
714  0.404506808     Trump
715 -1.851734921     Trump
716  0.390723277     Trump
717  0.416622426     Trump
718  0.447152295     Trump
719  0.333031303     Trump
720  0.751914725     Trump
721  0.406299562     Trump
722  0.318655270     Trump
723  0.229280610     Trump
724  0.558730246     Trump
725  0.452337143     Trump
726  0.847467584     Trump
727  0.312297162     Trump
728  0.177841690     Trump
729 -2.060771340     Trump
730  0.360643447     Trump
731  0.163089953     Trump
732  0.438972918     Trump
733  0.119069606     Trump
734  0.835988408     Trump
735  0.359975349     Trump
736 -3.727252953     Trump
737  0.290364516     Trump
738 -3.779011486     Trump
739  0.348417018     Trump
740  0.213151265     Trump
741 -3.843899116     Trump
742  0.842530534     Trump
743  0.319333555     Trump
744  0.376757565     Trump
745  0.863943135     Trump
746  0.874150350     Trump
747  0.289747681     Trump
748  0.379194888     Trump
749  0.126907227     Trump
750  0.399769035     Trump
751  0.268351457     Trump
752  0.826617192     Trump
753  0.368247204     Trump
754 -0.139193370     Trump
755  0.209187072     Trump
756  0.287460258     Trump
757  0.404660296     Trump
758  0.445684909     Trump
759 -0.235804596     Trump
760  0.718489829     Trump
761 -0.609573795     Trump
762  0.408263710     Trump
763  0.400400353     Trump
764  0.400187983     Trump
765  0.265469681     Trump
766 -0.585087765     Trump
767  0.311321791     Trump
768  0.554269099     Trump
769  0.386407003     Trump
770  0.769565526     Trump
771  0.211778651     Trump
772  0.814577258     Trump
773  0.451920381     Trump
774  0.375761588     Trump
775  0.015284682     Trump
776 -3.776683978     Trump
777  0.854722329     Trump
778  0.455378363     Trump
779  0.366168847     Trump
780  0.830643573     Trump
781 -1.526428602     Trump
782  0.708940980     Trump
783  0.402003102     Trump
784  0.059596238     Trump
785  0.458438780     Trump
786  0.471536637     Trump
ggplot(plot_data_2, aes(x = score, fill = president)) +
  geom_density(alpha = 0.6) +
  labs(
    title = "Wordfish Score (Bigrams) Distribution by President",
    x = "Wordfish Score (Bigrams)",
    y = "Density",
    fill = "President"
  ) +
  theme_minimal()

ggplot(data = plot_data_2, aes(x = president, y = score, fill = president)) +
  geom_violin(trim = FALSE) +
  geom_boxplot(width = 0.1, fill = "white", color = "black") + # Add a boxplot inside for more detail
  labs(
    title = "Distribution of Wordfish Scores (Bigrams) by President",
    x = "President",
    y = "Wordfish Score (Theta) (Bigrams)",
    fill = "President"
  ) +
  theme_minimal() +
  scale_fill_brewer(palette = "Set3")

Trigrams-Wordfish Analysis

# create a tokens object with bigrams
eo_text_tokens_trigrams <- tokens_ngrams(eo_text_tokens, n=3)
dfmat_eo_text_trigrams <- dfm(eo_text_tokens_trigrams)
docvars(dfmat_eo_text_trigrams, "president") <- merged_df_all$president
docnames(dfmat_eo_text_trigrams) <- merged_df_all$document_number
dfmat_eo_text_trigrams
Document-feature matrix of: 788 documents, 211,670 features (99.82% sparse) and 1 docvar.
          features
docs       expand_branch_physic branch_physic_fit physic_fit_sport
  02-14807                    1                 1                6
  02-11166                    0                 0                0
  01-2851                     0                 0                0
  04-11991                    0                 0                0
  03-12661                    0                 0                0
  03-24217                    0                 0                1
          features
docs       fit_sport_presid sport_presid_physic presid_physic_fit
  02-14807                2                   2                 4
  02-11166                0                   0                 0
  01-2851                 0                   0                 0
  04-11991                0                   0                 0
  03-12661                0                   0                 0
  03-24217                0                   0                 1
          features
docs       fit_sport_purpos sport_purpos_health purpos_health_human
  02-14807                1                   1                   1
  02-11166                0                   0                   0
  01-2851                 0                   0                   0
  04-11991                0                   0                   0
  03-12661                0                   0                   0
  03-24217                0                   0                   0
          features
docs       health_human_servic
  02-14807                   2
  02-11166                   4
  01-2851                    3
  04-11991                   1
  03-12661                   0
  03-24217                   2
[ reached max_ndoc ... 782 more documents, reached max_nfeat ... 211,660 more features ]
quanteda::ntoken(dfmat_eo_text_trigrams)
     02-14807      02-11166       01-2851      04-11991      03-12661 
          296           390           338           310             9 
     03-24217      03-19573      03-20013      03-29644       04-1322 
          192           508           703           296           150 
     04-18575      04-20050      04-20052      03-32332      03-32328 
          132           695           722            76           190 
      04-6622      04-12745      04-13123      03-30913      03-30513 
          235           313            42            45            47 
      03-7736       03-5343       03-8108       05-7830       05-3385 
         4225          2488            48            47           184 
     04-28079      04-10024      05-13214      03-22543      03-13750 
          401           417           458           495            38 
     03-14116      03-14117        08-970        07-780       07-2027 
           86            43           712           101          1738 
      07-2570       08-1215       07-5919      E8-28912       04-4884 
          418           379           109           263           406 
      04-4436       04-4451      04-10377       04-8616      05-12284 
          197           422           533            96            24 
     05-12354      04-26684      04-26686      04-25866       08-1480 
          119            79           245           119           382 
      07-4906       07-4907       07-4023        08-797       08-1409 
          477            80           124           104          1121 
      07-4600       07-5299      E8-23235       05-5097        E9-811 
           39           224           111           169           119 
       E9-814       07-6022       07-1816      01-31671      01-31670 
          135            45           140            66           104 
      07-5816       01-4622       01-6558       02-7087       07-3656 
           64           338            97           228           516 
      07-3593      E8-27777      E8-30042       E9-1574       E9-1538 
          326           355            59           393           119 
       E9-818      01-16668       02-1594        02-917       02-4071 
          347           360           121            75           277 
      02-5069       01-8835       01-8836       02-2638        02-918 
          221           108            20           447           149 
     01-29831      E8-30700      02-14497      02-31624      02-16040 
           69           208            27           293           269 
     02-16041      01-28762      01-29219      01-27917        06-554 
          117           139            46           940            44 
      06-4652        07-293       06-9993       06-9896      05-21571 
          118           342            42           207           426 
     05-20944      02-21056        03-464      03-11969      03-12071 
         1584           286           181           202            90 
      03-7313      03-10194      01-14319      01-15958      01-24917 
           51            75            74           441           176 
     01-24983      02-17274       06-4132       06-4121       06-9020 
          159           633           266           519           444 
      06-9619       06-7220       06-3865       06-2362      01-31959 
          430           406           365           270            97 
      01-9086      01-26509      01-26339      01-30624      01-13381 
          127          1722           543            45           298 
      03-2606       03-1798       03-8832      03-19675       07-3259 
          297           295           113           132            11 
      07-3258       07-2367       06-6101      05-20156      04-17636 
           20           122           104            31           309 
     04-15787       03-5848      E8-24465       05-9892       07-2518 
           19           223           366           146           167 
     E8-20436      01-15758      01-13869       06-5592      01-21338 
           45           331           277           381           209 
      04-2773      03-20764      03-31594      04-11592      04-11271 
          797            13            44           547           474 
      04-2408       04-1941       01-3883       01-2852      04-10378 
          257           153            31           334           416 
     04-20051      03-05344       03-6445       03-8109      03-12766 
          879           652           218            69           222 
      06-7492      05-19993      05-22132      05-22133       07-3112 
          357           445           247           261           383 
     01-25788       03-2069      03-19572      04-17150      04-17205 
           15           433            68           269           463 
     04-17204      04-20049      04-19909      04-24098      03-19676 
           43           411           194           396           341 
      06-5828       06-5829       06-8769        07-374       06-5984 
          198           433           400           961            11 
     05-23412      05-24596      05-24597      05-24255       06-5351 
          358           194           142           874           229 
      06-4085       06-4552       06-9770       06-9148       03-7160 
          403           431            31            44           162 
      07-3835       01-4624      01-17041      01-13117      01-13116 
          386            34            20           180           227 
     02-16951      02-17273      02-22526       01-4621       01-4623 
          151            70           101           747            44 
     01-29948      02-07086      02-07085      01-31119      03-11713 
          386           328            85            20           101 
     02-25900      02-32518      03-10606       06-1316      01-19562 
          117            52           253           511           110 
     01-24205      01-25677      01-25344      03-16102      04-23994 
          588          1130           451           127            99 
     01-11210      01-11505      02-29580      02-29832      02-31831 
           15           290           324           305           794 
     04-15933      04-15934      03-24919      05-13098       05-1886 
          345           234           333           502           167 
     04-28404      04-22212        05-306        05-771      04-26685 
           72           165           193           283           192 
     04-27076      04-21411      05-14452        08-658       05-7831 
         1400           116            53           443            51 
      05-1170       05-5434      E8-24342      03-13694      03-13412 
           80           102            96           465           277 
       08-761       06-9561        07-419       06-9895      05-15160 
          366            30            12           342            50 
      02-9536        02-919       02-3337       02-3826      01-14862 
         1737            48            11           471            39 
        08-62        08-325        08-360      E8-29564      01-31665 
          190           334           681           118            47 
     01-31667      01-31668      01-31669      01-31672       08-1182 
           79           114            71            89            33 
     02-17640      01-23359      02-24252       04-3170      02-31832 
          330           277           362           603           297 
     01-26990        02-448       06-9632       05-6907       07-5270 
           20           190           110            44           445 
     E8-17940       08-1472      E8-26531       07-4115      E8-27771 
         3671            69           219           230            77 
     E8-23125        08-568        08-483       04-5322      E8-21651 
          254           112           305           192           207 
      07-1704       07-2462       07-1137       07-1152       08-1348 
           50           394           477            46           476 
      07-4890      04-11058       07-3552       08-1399       07-5726 
          351           691           365           253           583 
     01-31666    2015-03714    2015-07788    2015-07016    2015-05677 
           81           949           496          3266           538 
   2015-18292    2015-19183     2010-9078    2010-10172     2010-7154 
          265           767           230           268           382 
   2010-11557     2010-9796    2015-16334    2011-19156    2015-20801 
          158           362           224           430           315 
   2015-22888     2010-4884     2010-1229       2010-38    2010-12805 
           96           180            72           260           319 
    2010-3725    2011-30990    2010-24839    2011-26574    2011-12645 
          215           105           569           118           351 
   2011-29683    2011-17953    2011-17447    2014-11442    2014-06768 
          354           189           269           581           148 
   2014-08426    2012-22030    2011-32486    2014-03805    2013-05967 
          274           481            67           625           569 
   2014-22805    2013-31445    2014-18561    2014-17522    2010-29579 
         1126           184          1414           119           818 
    2012-1568      E9-11547      E9-26834      E9-23886      E9-29781 
          536          1334           170           119           715 
    2012-7636    2013-08501    2011-21704    2011-26729    2013-15942 
          757            62           453           925           556 
   2013-16387    2012-31574    2012-30060    2012-30170    2013-00002 
          457            60           436            81           219 
   2013-28581    2014-07895    2011-15181    2010-18169     2010-8878 
          112           489           495           981           496 
   2010-21016    2010-21020    2013-17478    2014-03474    2014-16360 
         1123           152           605            50           433 
   2011-18065    2010-28854       E9-1893       E9-2893       E9-1712 
          393           314           672           503           447 
     E9-28493      E9-30020       E9-2484       E9-3106    2014-18998 
          850            66           657            29           370 
   2014-30195    2014-29625    2010-22002    2014-29121    2014-30323 
          226           208           502            87           420 
   2014-30363    2014-24851    2016-30272    2016-30101    2016-31792 
          184           148           131            90           127 
   2016-31922    2016-30277    2017-01623    2017-01169    2015-29403 
          281          1130          3235           814           137 
   2016-29519    2017-01487    2017-01197     2011-5903     2011-8642 
         1252           106           325            79            87 
   2011-28728    2011-33087    2010-27004    2010-28365    2010-28360 
          417           239           902           105           467 
   2011-13173    2010-25578       E9-5441      E9-31098      E9-28022 
          442           980           180           207           459 
     E9-25268    2016-06250    2016-07703    2016-08713    2016-03141 
          718           663           170            70           449 
   2015-02379    2015-01522    2015-01255    2016-26753    2015-30191 
          705           664           539            44           483 
   2016-03038    2016-24066    2016-24847    2016-22962    2016-28203 
          733           679           207            72           705 
   2016-29165    2016-11300    2016-12579    2016-15542     2012-9473 
          350           455            72           539           336 
   2012-10715    2012-10968     2012-5366    2012-27002    2013-08626 
          921           515           358           485           230 
   2012-10034    2012-18868     2012-3097    2012-11798    2012-12889 
          563          1201           564           382           114 
   2012-19055    2012-17022    2012-18237    2012-25236    2012-15954 
         1245           963           376          1330           352 
   2016-31875    2016-27156    2016-22454    2016-27171    2017-01489 
          192           816           122          1080           134 
   2015-32582    2017-01164    2017-01168    2016-29169    2015-13055 
          184           224           103           293           100 
   2015-19209    2016-17945    2016-18872    2015-17926    2015-15828 
          757           223           152           109            30 
   2015-16122    2016-25288    2016-25290    2016-20713    2015-29498 
          645           295          1007           108           146 
   2016-02475    2015-31749    2015-00058    2016-06355    2016-09483 
          739            95           384           618           546 
   2016-09346    2016-04770    2015-23630    2015-15495    2015-25744 
          402           156           393            72           197 
   2015-22998    2015-25489    2016-01325    2015-32060    2016-12307 
          794           329          1029           991           903 
   2016-12155    2016-16295    2016-19723    2016-19724    2016-19725 
          557           648           127           131           136 
   2010-22279    2011-10910    2011-10732    2010-33169    2011-30463 
           68           373           408           901           743 
   2011-33335     2010-2419     2010-5837      E9-31418 C1-2009-31418 
          116           438           461          5399            24 
    2010-4593    2013-26785    2010-18988    2011-33089    2010-15851 
          543          1267             0           336           352 
   2010-16864    2014-14432    2014-14429    2013-19220    2012-24374 
          692           108            74           942           867 
   2012-22062    2011-31624    2014-04254    2013-24388    2014-01523 
         1001          1048           749           544           150 
   2014-05323    2014-06141    2014-06612    2010-32960    2014-18682 
          401           405           384           206            82 
     2010-705    2010-14613    2011-14919    2011-15443     2011-5728 
          244           569           316           396           921 
    2011-4753     2011-3257     2011-2577     2011-9739     2011-1385 
          439           478           299           201           515 
   2014-23228    2014-24218    2014-25292    2014-25439    2012-12881 
         1117            95            78           378           169 
   2012-12882    2012-12883       E9-1719       E9-3113       E9-5802 
          119           133          1006           471           461 
     E9-16034      E9-15368       E9-1885       E9-1895       E9-3112 
           21           358           739           255           256 
      E9-3108       E9-8572       E9-2483       E9-2486       E9-2485 
           46           326           227            29           710 
     E9-26408      E9-30413      E9-27441      E9-24518       E9-4068 
          149            25           682          2437           242 
      E9-4103     2012-7019      E9-28805      E9-24203      E9-23915 
           22          2151           404           416            22 
   2012-22807    2013-06712    2013-03915     2012-2557    2013-12157 
          749           278          1308            91            69 
   2012-10884     2012-6797    2012-30310    2013-15782    2013-13523 
          522           519           769           543          1774 
   2011-26141    2013-07837    2012-31225    2010-31878    2013-19520 
          168           303            87           290           298 
   2014-09343    2014-12651    2010-12070     2010-9451    2012-20259 
           13           159           169           253           627 
   2012-17264     2012-3616    2013-12650    2013-11533    2011-21505 
          480           411            70           452           398 
   2011-23891    2012-12225    2012-15183    2018-27945    2017-23630 
          583           362           710            82           675 
   2017-27034    2018-04860    2018-08883    2018-05916    2018-05113 
          165           515           763           229           620 
   2018-11101    2018-00240    2017-23270    2017-27899    2018-07874 
          578            45           109           393           801 
   2018-15202    2018-13640    2018-15955    2018-15299    2019-24288 
          639           669           847           402            85 
   2019-26178    2019-05370    2019-16383    2018-02261    2018-00630 
          474           137           558           319           240 
   2018-08272    2018-11939    2018-13696    2019-10398    2020-17364 
          373           879           308           781           431 
   2020-17699    2020-17700    2020-07530    2020-27948    2021-01094 
          371           398          1447           755           144 
   2021-01228    2020-12030    2018-04414    2020-03556    2020-27740 
          223          1122           444            87           349 
   2019-07645    2019-21630    2019-09750    2019-12802    2019-13945 
          397           250          1074           639           765 
   2019-22849    2019-20804    2019-23525    2019-22623    2019-22624 
          930          1031           445           731          1000 
   2019-00615    2019-04595    2019-01426    2020-14337    2020-12584 
          146           141           385           526          1231 
   2020-22510    2020-29235    2020-22064    2020-24793    2020-28605 
          501           584          1162           756          1205 
   2020-28606    2020-16623    2020-16624    2021-01635    2021-01646 
          333           263           181           668           612 
   2021-01013    2019-16879    2019-15222    2019-09877    2017-15680 
          955           288          1258           732           287 
   2017-13458    2017-13012    2017-02762    2017-10004    2017-15860 
           67           746           148          1207           446 
   2017-08586    2017-03113    2017-03115    2017-03116    2017-03118 
          230           541           211           110           239 
   2017-02450    2017-02451    2017-09156    2017-06716    2017-20647 
         1007           333           302           327           888 
   2017-21555    2017-21559    2017-09083    2017-08905    2017-08311 
          265           103           323           206           443 
   2017-06967    2017-06971    2017-04357    2017-04107    2017-02095 
          277           111           556           390           951 
   2017-02029    2017-01799    2017-06576    2017-06382    2020-00534 
          253           183           950            52           745 
   2020-02439    2020-27065    2020-06969    2020-06985    2020-10953 
          916           978           527           146           286 
   2020-07800    2020-03337    2020-09537    2020-19032    2020-21129 
          320           554           155           229           374 
   2021-00040    2020-13449    2017-14992    2017-05399    2017-02281 
          184           726            86           186          1049 
   2017-06968    2017-14378    2017-10003    2017-08818    2017-09161 
          288           452           323           458           106 
   2017-09087    2017-09574    2017-18468    2017-18134    2017-04837 
          788           241           278          1563          2381 
   2017-04353    2017-02102    2017-08990    2017-08908    2017-18679 
          168           761           178           355            60 
   2018-27515    2018-26552    2017-22677    2017-27925    2018-10855 
          671            82           496           573           553 
   2018-10403    2018-11335    2018-11913    2018-11916    2018-11936 
          448           236          1244          1353           259 
   2018-20816    2019-07656    2019-05934    2019-15159    2019-15449 
         1002           959           642           480           361 
   2019-10538    2019-27678    2019-08797    2019-04437    2019-13793 
          714            82          1175           705           608 
   2020-27353    2020-27807    2020-27739    2020-27455    2021-01469 
          366            82           168           199           234 
   2021-01476    2021-00305    2020-17363    2020-04730    2020-11301 
          653           569           264           205           561 
   2020-08846    2020-09536    2020-21160    2020-23115    2020-23116 
          116           356           631           449           890 
   2020-23780    2019-24040    2019-19367    2019-22749    2019-22073 
          905           605           282           304           854 
   2019-19895    2019-06325    2019-06548    2019-14016    2019-28286 
          342          1289           195           700           187 
   2019-27217    2019-13175    2019-00048    2020-12953    2019-02544 
          258           312           184           651          1141 
   2019-00014    2018-24254    2018-26156    2020-14077    2020-14509 
          919           466           466          1005           794 
   2020-14328    2020-18015    2020-15338    2020-15646    2020-20887 
           55           463           606          1030           345 
   2020-09645    2020-04755    2021-01643    2021-01644    2021-01645 
           78           222          1026           292           606 
   2021-01713    2021-01714    2021-01712    2020-14872    2020-08392 
           56          1280           157           892            82 
   2020-06478    2020-16625    2020-21914    2020-21534    2020-12430 
          275           272          2137          1586           490 
   2020-02438    2020-25459    2020-21960    2018-20203    2018-19514 
          519           558           486          1009           473 
   2018-09895    2018-00553    2017-28160    2019-17052    2019-21505 
          433           353           193           487           266 
   2019-04298    2018-17068    2018-15195    2020-09695    2020-06161 
          342          2500           167           965           237 
   2020-10993    2020-10315    2020-18012 
          167          1372          1315 
dfmat_eo_text_trigrams[ntoken(dfmat_eo_text_trigrams) <= 0, ]
Document-feature matrix of: 1 document, 211,670 features (100.00% sparse) and 1 docvar.
            features
docs         expand_branch_physic branch_physic_fit physic_fit_sport
  2010-18988                    0                 0                0
            features
docs         fit_sport_presid sport_presid_physic presid_physic_fit
  2010-18988                0                   0                 0
            features
docs         fit_sport_purpos sport_purpos_health purpos_health_human
  2010-18988                0                   0                   0
            features
docs         health_human_servic
  2010-18988                   0
[ reached max_nfeat ... 211,660 more features ]
dfmat_eo_text_trigrams <- dfmat_eo_text_trigrams[ntoken(dfmat_eo_text_trigrams) > 0, ]
dfmat_eo_text_trigrams <- dfm_trim(dfmat_eo_text_trigrams, min_docfreq = 3, docfreq_type = "count")
dfmat_eo_text_trigrams <- dfm_trim(dfmat_eo_text_trigrams, max_docfreq = .8 * nrow(dfmat_eo_text_trigrams), docfreq_type = "count")
dfmat_eo_text_trigrams[ntoken(dfmat_eo_text_trigrams) <= 0, ]
Document-feature matrix of: 2 documents, 9,222 features (100.00% sparse) and 1 docvar.
               features
docs            physic_fit_sport presid_physic_fit health_human_servic
  06-9770                      0                 0                   0
  C1-2009-31418                0                 0                   0
               features
docs            human_servic_carri servic_carri_respons carri_respons_public
  06-9770                        0                    0                    0
  C1-2009-31418                  0                    0                    0
               features
docs            respons_public_health public_health_human human_servic_develop
  06-9770                           0                   0                    0
  C1-2009-31418                     0                   0                    0
               features
docs            regular_physic_activ
  06-9770                          0
  C1-2009-31418                    0
[ reached max_nfeat ... 9,212 more features ]
dfmat_eo_text_trigrams <- dfmat_eo_text_trigrams[ntoken(dfmat_eo_text_trigrams) > 0, ]
wf_model_eo_text_trigrams <- quanteda.textmodels::textmodel_wordfish(dfmat_eo_text_trigrams, dir = c(338,680))
summary(wf_model_eo_text_trigrams)

Call:
textmodel_wordfish.dfm(x = dfmat_eo_text_trigrams, dir = c(338, 
    680))

Estimated Document Positions:
                theta        se
02-14807    0.4203732 0.0198018
02-11166    0.2181695 0.0393182
01-2851     0.3764757 0.0156542
04-11991   -1.5859309 0.4233364
03-12661    0.3818536 0.1774112
03-24217    0.4763796 0.0164561
03-19573    1.1836441 0.0015768
03-20013    1.0532645 0.0027133
03-29644    0.5307145 0.0315869
04-1322     0.9693715 0.0055745
04-18575    1.5171911 0.0031275
04-20050    0.0096993 0.0368319
04-20052   -0.0525127 0.0391023
03-32332    0.4498633 0.0386987
03-32328   -4.2025922 0.2457135
04-6622    -0.0859435 0.0769371
04-12745    0.3753988 0.0154745
04-13123   -1.5838487 0.6718433
03-30913   -2.0187001 0.4199417
03-30513    0.1744122 0.1073209
03-7736     0.0510644 0.0263129
03-5343     0.1550060 0.0189939
03-8108     0.1117739 0.1493767
05-7830    -0.1720249 0.1416044
05-3385     1.1868016 0.0028002
04-28079   -0.0330511 0.0433142
04-10024    0.3215341 0.0428549
05-13214    1.2229886 0.0016438
03-22543    1.1988459 0.0017912
03-13750   -1.1788851 0.4714016
03-14116    0.5016061 0.1727320
03-14117   -1.1226503 0.5501355
08-970      0.3059701 0.0291067
07-780     -0.1543956 0.1400379
07-2027     0.2302574 0.0312891
07-2570     0.0370117 0.0488484
08-1215     1.1934878 0.0016429
07-5919     1.5685901 0.0038217
E8-28912   -0.6316644 0.1987748
04-4884     0.3823357 0.0323182
04-4436     0.0953747 0.0639832
04-4451     0.2504653 0.0362304
04-10377   -0.0863395 0.0589454
04-8616     1.5830452 0.0042972
05-12284    0.0659339 0.1259853
05-12354    0.3597268 0.0501426
04-26684    0.5528778 0.0192812
04-26686    1.1271789 0.0029636
04-25866   -0.8624491 0.2412601
08-1480     1.2315908 0.0016765
07-4906     0.3911864 0.0167115
07-4907     0.2540170 0.0456726
07-4023     0.5438289 0.0181244
08-797      0.5284556 0.0209151
08-1409    -1.2377622 0.1444621
07-4600    -0.6755490 0.4471974
07-5299     0.0004631 0.0770321
E8-23235    0.6012654 0.0191633
05-5097     0.0198936 0.1105288
E9-811      0.3703107 0.0318743
E9-814      0.5297331 0.0196656
07-6022    -2.0159300 0.4280930
07-1816     1.5177932 0.0032017
01-31671    0.5097188 0.0253967
01-31670    0.5224876 0.0260607
07-5816    -1.3958484 0.5050560
01-4622     0.3193251 0.0398887
01-6558     1.5892645 0.0045308
02-7087     0.6122694 0.0104375
07-3656    -0.5527306 0.1657376
07-3593    -0.0209890 0.0478417
E8-27777    0.2718269 0.0383562
E8-30042   -1.8400898 0.3928373
E9-1574    -0.8023716 0.2035988
E9-1538     0.1751193 0.0558477
E9-818      0.0749686 0.0411697
01-16668    1.2024481 0.0020894
02-1594     0.5270108 0.0263208
02-917      0.5544896 0.0191655
02-4071     0.2489259 0.0474187
02-5069     0.6809611 0.0135367
01-8835     0.9032757 0.0070819
01-8836     0.3983094 0.1697144
02-2638     0.0553035 0.0562981
02-918      0.5954809 0.0188954
01-29831    0.3469181 0.0803764
E8-30700   -3.9878447 0.2171378
02-14497    0.0923768 0.1130846
02-31624    0.2109384 0.0353993
02-16040    0.0607388 0.0729945
02-16041    0.2509617 0.1301802
01-28762    0.0183983 0.0842496
01-29219    0.8590076 0.0138806
01-27917    0.0297283 0.0739354
06-554     -1.4199029 0.5144970
06-4652     0.1925678 0.0640150
07-293     -0.8164010 0.3118154
06-9993    -1.5838487 0.6718433
06-9896    -4.1400932 0.2375726
05-21571   -0.1552776 0.0490840
05-20944    0.2404632 0.0327987
02-21056    0.2086804 0.0647254
03-464     -4.2049993 0.2480087
03-11969   -0.0350943 0.0604305
03-12071    0.2071243 0.0806154
03-7313    -3.4080785 0.4455233
03-10194    0.0208139 0.1362063
01-14319   -1.1611462 0.4428556
01-15958    0.3027676 0.0384758
01-24917    0.5064333 0.0162173
01-24983    0.2765435 0.0382237
02-17274    0.1897946 0.0353474
06-4132    -0.1586314 0.0957746
06-4121     1.2166285 0.0016550
06-9020     1.2125648 0.0016194
06-9619    -0.0543598 0.0694491
06-7220     0.2304474 0.0602630
06-3865    -0.1127034 0.0659982
06-2362     0.3767693 0.0176252
01-31959    1.5826443 0.0045359
01-9086     0.6555463 0.0254633
01-26509    0.1377128 0.0237938
01-26339    0.2238728 0.0359674
01-30624   -2.0124065 0.4325323
01-13381    1.1812717 0.0029530
03-2606     0.0948354 0.0453330
03-1798     0.3906462 0.0341613
03-8832     0.3186133 0.0622746
03-19675    0.2784678 0.0441416
07-3259     0.3729317 0.0982278
07-3258     0.0945770 0.1462248
07-2367     0.2636726 0.0459814
06-6101     1.6062232 0.0042117
05-20156    0.1050632 0.1262094
04-17636    1.1511795 0.0022440
04-15787    0.6780024 0.0302450
03-5848     1.2141022 0.0022025
E8-24465   -0.1578851 0.0798613
05-9892    -1.3919096 0.5404905
07-2518    -0.1861921 0.0962645
E8-20436    0.1378488 0.0986812
01-15758    0.0848253 0.0671133
01-13869    0.0345346 0.0497297
06-5592     1.2189150 0.0016321
01-21338    0.8622848 0.0074379
04-2773    -0.2016978 0.0937222
03-20764    0.3287115 0.0877395
03-31594    0.7381936 0.0147015
04-11592   -0.0836864 0.0610425
04-11271    0.2222671 0.0297548
04-2408     0.2520910 0.0344642
04-1941    -2.6658563 0.4071473
01-3883    -1.2429659 0.5230543
01-2852     0.3666256 0.0281368
04-10378    0.4194970 0.0349020
04-20051   -0.1179212 0.0531411
03-05344    0.4042004 0.0410369
03-6445    -1.6521036 0.3316189
03-8109    -0.8340966 0.3596713
03-12766   -0.0746329 0.0643573
06-7492     0.0001520 0.0444421
05-19993    0.3876731 0.0156795
05-22132   -0.0136137 0.0513374
05-22133   -0.0119796 0.0621466
07-3112     0.0923800 0.0749316
01-25788    0.5339588 0.1542808
03-2069     0.0794319 0.0470375
03-19572    0.4551337 0.0511993
04-17150   -0.0831166 0.0583733
04-17205    1.2332420 0.0016064
04-17204   -0.6664783 0.3516256
04-20049   -0.0448739 0.0477447
04-19909    0.2168522 0.0525617
04-24098    0.0138896 0.0731487
03-19676    1.0572410 0.0036178
06-5828    -0.3490628 0.1403055
06-5829     0.1978173 0.0451629
06-8769     1.2022095 0.0020148
07-374     -1.0482690 0.1388299
06-5984     0.2548438 0.1393052
05-23412    1.2255961 0.0016555
05-24596   -4.1494623 0.2367717
05-24597    0.4342236 0.0243285
05-24255    0.1319324 0.0521544
06-5351     0.1415692 0.0433265
06-4085     1.2308647 0.0018341
06-4552     0.0866319 0.0389417
06-9148     0.3166327 0.1332497
03-7160     1.1393600 0.0047264
07-3835     1.2346630 0.0016646
01-4624     0.1111343 0.1583954
01-17041    0.3627799 0.0944109
01-13117    0.2033825 0.0443776
01-13116    0.0620918 0.0771088
02-16951    1.0071241 0.0048136
02-17273    0.7560614 0.0245137
02-22526    0.2675537 0.1483674
01-4621     0.5073675 0.0152471
01-4623     0.1303913 0.1309777
01-29948    0.1690967 0.0363188
02-07086    0.2970992 0.0306723
02-07085    0.0605412 0.2755928
01-31119    0.5370479 0.1085259
03-11713    1.0251233 0.0046100
02-25900    0.7824497 0.0241484
02-32518   -2.0145478 0.4242068
03-10606    0.0073003 0.1063194
06-1316     1.2195614 0.0016312
01-19562   -0.0575572 0.2247621
01-24205    1.1759424 0.0017629
01-25677    0.0476620 0.0363531
01-25344    0.3075002 0.0377726
03-16102    0.2570870 0.0510609
04-23994   -0.0061189 0.0868353
01-11210    0.5467923 0.1473076
01-11505    0.2313446 0.0382996
02-29580    0.5550292 0.0237377
02-29832   -0.7149760 0.1506459
02-31831    0.1775286 0.0346654
04-15933   -0.5893719 0.1463231
04-15934   -1.5681106 0.3255184
03-24919    0.1272310 0.0648419
05-13098   -0.6532015 0.1143087
05-1886     0.0447236 0.1107394
04-28404   -1.2442754 0.5406846
04-22212   -0.3296619 0.1253260
05-306     -4.0848970 0.2278284
05-771      0.1892003 0.0409089
04-26685   -1.7222658 0.3574852
04-27076    0.2411617 0.0339313
04-21411    1.0607461 0.0043438
05-14452   -0.5216032 0.2604175
08-658     -0.0517570 0.0497700
05-7831    -1.6424972 0.4847168
05-1170     0.5846530 0.0196910
05-5434    -1.9808836 0.5310149
E8-24342    0.0969947 0.0752852
03-13694    1.1698888 0.0020019
03-13412    1.1476686 0.0024838
08-761      1.2136899 0.0018187
06-9561     0.3805543 0.0585939
07-419      0.1820646 0.1393716
06-9895    -0.2292808 0.1003702
05-15160   -0.1831964 0.1175029
02-9536     0.2455154 0.0319209
02-919     -0.6724499 0.3193703
02-3337     0.3536723 0.1114083
02-3826     0.2623764 0.0304451
01-14862    0.2567535 0.0947621
08-62      -4.1075331 0.2279022
08-325      0.0719102 0.0351013
08-360     -0.2315643 0.0800331
E8-29564    0.5048869 0.0174205
01-31665   -1.2287297 0.5199192
01-31667    0.4847738 0.0276981
01-31668    0.4799443 0.0269826
01-31669    0.5169296 0.0262526
01-31672    0.5191446 0.0257254
08-1182     0.1568162 0.1248662
02-17640    0.0242417 0.0490852
01-23359    0.4376793 0.0240703
02-24252   -0.0624510 0.0588494
04-3170     0.2352669 0.0324609
02-31832    0.3778012 0.0158022
01-26990    0.4745506 0.1348085
02-448     -3.9955658 0.2242927
06-9632     1.6027964 0.0039837
05-6907     0.0279947 0.1067222
07-5270     1.1840550 0.0015580
E8-17940   -0.1268289 0.0341992
08-1472     0.2455037 0.0435342
E8-26531    1.1249984 0.0058253
07-4115     0.2253647 0.0729936
E8-27771    0.1023269 0.0755684
E8-23125   -0.4304432 0.1449738
08-568      0.2777070 0.0619096
08-483     -0.2556927 0.1108927
04-5322    -4.1551128 0.2419074
E8-21651    0.2176372 0.0450180
07-1704     0.0530025 0.1177849
07-2462    -0.0911518 0.0749749
07-1137     0.0355839 0.0378161
07-1152    -0.5094286 0.4167423
08-1348     0.1615739 0.0426336
07-4890    -0.1063924 0.0530884
04-11058    1.2193309 0.0016797
07-3552     1.2215310 0.0017065
08-1399     1.2261198 0.0022946
07-5726    -0.2485672 0.0711327
01-31666    0.4657571 0.0247548
2015-03714 -0.0748435 0.0429449
2015-07788  1.2237129 0.0015619
2015-07016 -1.0843657 0.1231155
2015-05677  1.2229144 0.0014946
2015-18292 -0.7668296 0.1523430
2015-19183 -0.1212587 0.0811547
2010-9078   0.1037731 0.0486796
2010-10172 -0.0632358 0.0655574
2010-7154  -0.3661868 0.1376603
2010-11557  0.0392665 0.0615015
2010-9796  -0.1838189 0.0582426
2015-16334 -0.6806768 0.1918456
2011-19156  1.2333591 0.0016280
2015-20801 -0.2062738 0.1029307
2015-22888 -0.9888945 0.2721672
2010-4884   0.4634954 0.0197569
2010-1229  -0.3905021 0.1862972
2010-38    -0.1555738 0.0921287
2010-12805  0.2053747 0.0326231
2010-3725   0.2335732 0.0442648
2011-30990  0.3392654 0.0306862
2010-24839  1.2203747 0.0014757
2011-26574  1.5977132 0.0041632
2011-12645  1.2356572 0.0016634
2011-29683 -0.2518515 0.1273265
2011-17953 -0.0919660 0.0745803
2011-17447  0.1515931 0.0543298
2014-11442  1.2096909 0.0013894
2014-06768  1.5511734 0.0030870
2014-08426 -0.1977157 0.0951666
2012-22030 -0.1354526 0.1023849
2011-32486  0.2426347 0.0431334
2014-03805 -0.0270272 0.0468954
2013-05967  0.5634530 0.0150014
2014-22805 -0.1937868 0.0601327
2013-31445 -4.4231578 0.2738685
2014-18561 -0.4176736 0.1022276
2014-17522 -0.1992278 0.1253209
2010-29579 -0.0497271 0.0454641
2012-1568  -0.1827133 0.0770323
E9-11547    0.0154219 0.0670405
E9-26834    0.0881173 0.0796725
E9-23886    0.5101202 0.0159366
E9-29781   -0.0174845 0.0470616
2012-7636  -0.2592241 0.0797980
2013-08501  0.0050781 0.0771739
2011-21704 -0.2941569 0.1202407
2011-26729 -0.1401880 0.0569914
2013-15942  0.0785884 0.0389800
2013-16387  0.0728928 0.0462726
2012-31574 -0.0016564 0.0841543
2012-30060 -0.0053238 0.0650949
2012-30170 -0.1853131 0.1038813
2013-00002 -4.3595240 0.2574047
2013-28581  1.5997039 0.0038795
2014-07895  1.2165101 0.0014823
2011-15181 -0.0252328 0.0805337
2010-18169 -0.0792932 0.0436853
2010-8878   1.2313212 0.0015698
2010-21016  0.1736035 0.0228947
2010-21020  0.0643857 0.0592708
2013-17478 -0.1249108 0.0773884
2014-03474 -0.1168895 0.1225140
2014-16360  1.1769647 0.0018690
2011-18065 -0.2605884 0.0865286
2010-28854 -0.2424123 0.0905224
E9-1893    -0.3552042 0.0987730
E9-2893     0.1577101 0.0324237
E9-1712     0.1158235 0.0584736
E9-28493   -0.1658382 0.0881930
E9-30020   -1.8713084 0.3939787
E9-2484    -0.5014076 0.1087604
E9-3106     0.1664490 0.0989456
2014-18998 -0.0477303 0.0657136
2014-30195  0.0882349 0.0422466
2014-29625 -0.2123822 0.1058164
2010-22002  1.2263289 0.0016009
2014-29121 -1.8073559 0.3282384
2014-30323  1.2323568 0.0015534
2014-30363 -4.4255448 0.2721778
2014-24851  1.5484919 0.0032351
2016-30272  0.5335215 0.0189629
2016-30101  0.2338199 0.0554303
2016-31792  0.5278095 0.0195061
2016-31922  1.1803663 0.0025062
2016-30277 -0.1178135 0.0759715
2017-01623 -1.4460555 0.1213660
2017-01169 -0.6400878 0.1725848
2015-29403  1.0517425 0.0042174
2016-29519  0.1895503 0.0343998
2017-01487  0.5127073 0.0172071
2017-01197  0.8110001 0.0070840
2011-5903  -1.2992545 0.5516810
2011-8642   0.0939634 0.0799940
2011-28728 -0.0050388 0.0809909
2011-33087 -3.9921008 0.2105936
2010-27004  0.1266467 0.0271425
2010-28365  0.5130860 0.0170077
2010-28360 -0.1606638 0.0838762
2011-13173  1.2013496 0.0016102
2010-25578 -0.1400486 0.0512488
E9-5441    -0.3002451 0.1349623
E9-31098   -3.9199006 0.2080183
E9-28022    0.0886229 0.0356893
E9-25268    0.1904057 0.0248222
2016-06250 -0.2520282 0.0820663
2016-07703 -1.3110339 0.3122314
2016-08713  0.2770509 0.0506532
2016-03141  0.0960023 0.0505060
2015-02379 -0.1857858 0.0946970
2015-01522 -0.1835850 0.0696229
2015-01255 -0.1055048 0.0578292
2016-26753  0.3305380 0.0648968
2015-30191  1.2203752 0.0014359
2016-03038  0.1863922 0.0312962
2016-24066 -1.5283223 0.2074312
2016-24847  0.9616052 0.0046574
2016-22962  0.2258638 0.0430441
2016-28203 -0.0791967 0.0513207
2016-29165 -1.1730000 0.3211756
2016-11300 -0.1437297 0.0770280
2016-12579  0.2258638 0.0430441
2016-15542 -0.1499262 0.0846276
2012-9473  -0.2454492 0.0955542
2012-10715  0.0558921 0.0545455
2012-10968 -0.1568470 0.0715230
2012-5366  -0.3557075 0.1237434
2012-27002 -0.0839762 0.0599863
2013-08626 -3.9341587 0.2041479
2012-10034  1.2266106 0.0014865
2012-18868  0.2371994 0.0199713
2012-3097   1.2060762 0.0014260
2012-11798 -0.1380916 0.0758422
2012-12889  0.5132598 0.0199681
2012-19055  1.1468366 0.0009854
2012-17022 -0.1015917 0.0576613
2012-18237  1.2125701 0.0019335
2012-25236  1.1852498 0.0009603
2012-15954  1.1870768 0.0022109
2016-31875 -4.3061158 0.2535638
2016-27156 -0.1584422 0.0794572
2016-22454  1.0358351 0.0045027
2016-27171  0.0949494 0.0521541
2017-01489  0.5093329 0.0152014
2015-32582 -4.4255448 0.2721778
2017-01164 -0.2527750 0.1514105
2017-01168 -0.9888945 0.2721672
2016-29169 -0.9718817 0.2768833
2015-13055  0.9310414 0.0056376
2015-19209 -0.0823611 0.0623447
2016-17945 -0.6487621 0.1576663
2016-18872 -0.0897854 0.0957470
2015-17926  1.5999610 0.0039405
2015-15828  0.3576432 0.1550398
2015-16122  0.0793890 0.0553704
2016-25288 -0.3651591 0.1550222
2016-25290 -0.1020179 0.0566284
2016-20713 -0.1674594 0.1069580
2015-29498  1.5307632 0.0029864
2016-02475 -0.1018848 0.0768865
2015-31749 -1.8362999 0.3269660
2015-00058  1.2317348 0.0016226
2016-06355  1.2186727 0.0014012
2016-09483  1.2237129 0.0015619
2016-09346 -0.2806588 0.1165784
2016-04770 -0.8554814 0.1991534
2015-23630 -0.1471328 0.0947473
2015-15495  0.2258638 0.0430441
2015-25744 -0.2972997 0.1438368
2015-22998 -0.1704310 0.0620853
2015-25489  0.4187073 0.0138914
2016-01325  1.1866105 0.0011387
2015-32060 -0.3357949 0.1163645
2016-12307  0.1001341 0.0568745
2016-12155 -0.2670598 0.1130151
2016-16295 -0.0765663 0.1045383
2016-19723  0.5160566 0.0208222
2016-19724  0.5314353 0.0193953
2016-19725  0.5106458 0.0150120
2010-22279  0.2418376 0.0428854
2011-10910  1.2324465 0.0016097
2011-10732 -0.0473861 0.0805895
2010-33169 -1.8312727 0.2316210
2011-30463  1.1682781 0.0012535
2011-33335  0.1646610 0.0598935
2010-2419   0.1557778 0.0297075
2010-5837   0.1650159 0.0483889
E9-31418    0.1125927 0.0210270
2010-4593   0.2302441 0.0283727
2013-26785 -0.1075716 0.0413082
2011-33089 -0.0212733 0.0792169
2010-15851  0.3749412 0.0209266
2010-16864 -0.0990339 0.0650999
2014-14432  1.5944807 0.0038971
2014-14429  0.2358298 0.0430969
2013-19220 -0.2820120 0.0866964
2012-24374 -0.0370972 0.0707311
2012-22062 -0.2769092 0.0829111
2011-31624  0.1449976 0.0290154
2014-04254 -0.2138247 0.0816292
2013-24388  0.3954205 0.0137679
2014-01523  0.0230771 0.0646609
2014-05323  1.2325889 0.0015363
2014-06141  1.2322866 0.0015535
2014-06612  1.2301944 0.0015915
2010-32960 -4.1339699 0.2319748
2014-18682 -0.1553213 0.1148960
2010-705   -0.2028919 0.0781157
2010-14613 -0.0611002 0.0499072
2011-14919  0.1010275 0.0421425
2011-15443 -0.0498029 0.0616602
2011-5728   0.0727395 0.0606336
2011-4753   1.2321112 0.0015537
2011-3257  -0.1032542 0.0679603
2011-2577   0.2777504 0.0314197
2011-9739   1.1918032 0.0023864
2011-1385  -0.2056879 0.0850846
2014-23228 -0.3303774 0.0948295
2014-24218 -0.7416362 0.2610954
2014-25292 -0.3905021 0.1862972
2014-25439 -0.3858418 0.1361466
2012-12881  0.4784038 0.0182731
2012-12882  0.4997134 0.0203801
2012-12883  0.5135356 0.0152820
E9-1719    -0.8821611 0.1997970
E9-3113    -0.1660057 0.0790802
E9-5802     0.0877606 0.0389953
E9-16034    0.3287115 0.0877395
E9-15368    0.0448192 0.0399556
E9-1885    -0.1869324 0.0625534
E9-1895    -0.0892172 0.0616262
E9-3112     0.2886794 0.0315561
E9-3108     0.1944050 0.0967474
E9-8572     0.0982956 0.0515233
E9-2483     0.3902413 0.0375303
E9-2486     0.1617133 0.0970304
E9-2485    -0.3610369 0.0779187
E9-26408    0.2156670 0.0469484
E9-30413   -0.1369518 0.2987053
E9-27441   -0.0462395 0.0475545
E9-24518   -0.9312874 0.1112712
E9-4068     0.1306044 0.0486101
E9-4103     0.1507084 0.1162887
2012-7019   0.0322323 0.0316897
E9-28805    0.1723714 0.0329767
E9-24203    0.5438989 0.0192709
E9-23915    0.4313238 0.0611737
2012-22807  0.1052157 0.0502739
2013-06712 -0.2725455 0.1303300
2013-03915 -0.1369478 0.0421664
2012-2557  -0.1996390 0.1141382
2013-12157  0.2349471 0.0431738
2012-10884  1.2162974 0.0016787
2012-6797  -0.0356814 0.0474484
2012-30310 -0.0864716 0.0492918
2013-15782  0.0764210 0.0348218
2013-13523  1.1536697 0.0008316
2011-26141  0.5189209 0.0153097
2013-07837  0.2050958 0.0326408
2012-31225 -1.8305267 0.3306445
2010-31878  0.2083630 0.0318541
2013-19520  1.1857752 0.0025784
2014-09343  0.3764603 0.1799371
2014-12651  1.1297720 0.0035541
2010-12070  0.4806355 0.0183932
2010-9451   0.2493295 0.0307937
2012-20259 -0.1664730 0.0778060
2012-17264  1.2317782 0.0016082
2012-3616   0.2018514 0.0309702
2013-12650  0.2936430 0.0494303
2013-11533 -0.2267188 0.1093681
2011-21505  1.2298422 0.0015988
2011-23891 -0.2595792 0.0966093
2012-12225  1.2423296 0.0016962
2012-15183 -0.0970877 0.0711155
2018-27945 -1.8206592 0.3364178
2017-23630  0.2447923 0.0321011
2017-27034 -0.1204046 0.1031812
2018-04860  0.0240733 0.0471154
2018-08883 -0.9877463 0.2019831
2018-05916  1.2069273 0.0022224
2018-05113 -0.0940531 0.0615806
2018-11101 -0.9358863 0.1515363
2018-00240 -0.0853719 0.1091637
2017-23270  0.3154779 0.0373643
2017-27899 -0.1453478 0.0864216
2018-07874  0.1471891 0.0480548
2018-15202 -1.9343061 0.2279580
2018-13640 -0.4754339 0.0958551
2018-15955  0.0594787 0.0383550
2018-15299  0.1255891 0.0343912
2019-24288 -0.0208029 0.0799199
2019-26178 -0.0776573 0.0553343
2019-05370  0.8359465 0.0069889
2019-16383  1.2054958 0.0015021
2018-02261  0.0676587 0.0642542
2018-00630 -0.0831947 0.0814102
2018-08272 -0.1197360 0.0782161
2018-11939 -0.4865078 0.1293390
2018-13696  0.0471962 0.0677809
2019-10398  0.2029111 0.0250491
2020-17364 -0.1812588 0.1003983
2020-17699  1.0895858 0.0025057
2020-17700  1.1150964 0.0022693
2020-07530  0.0714109 0.0437019
2020-27948 -0.6630716 0.1616087
2021-01094  0.5314943 0.0145034
2021-01228  0.9043798 0.0051443
2020-12030  0.0622777 0.0643165
2018-04414  0.2962603 0.0268084
2020-03556 -0.0763104 0.0832098
2020-27740  0.1651804 0.0580190
2019-07645 -0.1660632 0.1024812
2019-21630  0.4491830 0.0141869
2019-09750 -0.1587622 0.0739537
2019-12802 -0.1729926 0.0880154
2019-13945 -0.1218980 0.0774859
2019-22849  1.1800760 0.0011330
2019-20804 -0.1567261 0.0691854
2019-23525 -0.0362332 0.0449300
2019-22623 -0.5405140 0.1217438
2019-22624 -0.6500571 0.1368825
2019-00615  0.9707475 0.0044999
2019-04595 -1.1835847 0.3723964
2019-01426 -0.1275898 0.0820379
2020-14337 -0.3374003 0.1363413
2020-12584  0.1561666 0.0318488
2020-22510 -0.0951356 0.0749872
2020-29235 -0.1061115 0.1018765
2020-22064  0.8100915 0.0045788
2020-24793  0.0412420 0.0426257
2020-28605  0.3376223 0.0266471
2020-28606 -0.1549700 0.1134019
2020-16623 -0.1473704 0.1068018
2020-16624 -0.1217271 0.1058786
2021-01635 -0.0947740 0.0786807
2021-01646  0.7259699 0.0082121
2021-01013 -0.0542497 0.0822940
2019-16879  1.1536420 0.0023832
2019-15222  0.0155576 0.0692124
2019-09877  1.1827057 0.0012461
2017-15680  0.2850212 0.0295981
2017-13458 -0.0458296 0.0941326
2017-13012 -0.0547051 0.0503672
2017-02762 -0.0853719 0.1091637
2017-10004  0.0596960 0.0333589
2017-15860 -0.0851028 0.0742001
2017-08586 -0.1544356 0.0985835
2017-03113  0.2507000 0.0398372
2017-03115 -0.1948909 0.1055762
2017-03116  0.5275625 0.0158243
2017-03118 -0.0984302 0.0803586
2017-02450 -0.7068809 0.1607766
2017-02451  0.2538366 0.0497795
2017-09156  0.1285482 0.0646874
2017-06716 -0.0106468 0.0528458
2017-20647  1.2122077 0.0011940
2017-21555  0.4422672 0.0141458
2017-21559 -0.1711758 0.1065190
2017-09083 -0.0909496 0.0739616
2017-08905 -0.1773934 0.1099332
2017-08311  0.3147809 0.0327328
2017-06967  0.0288696 0.0660030
2017-06971  0.5336140 0.0157116
2017-04357  0.2414649 0.0288155
2017-04107 -0.5687456 0.1734385
2017-02095 -0.0681720 0.0559596
2017-02029 -0.2598549 0.1089636
2017-01799 -0.2369847 0.1133210
2017-06576 -0.2655795 0.0777139
2017-06382 -0.1052651 0.1055277
2020-00534  1.1784630 0.0012249
2020-02439  0.0642763 0.0540678
2020-27065 -1.0265670 0.2593473
2020-06969  0.1642836 0.0257189
2020-06985  0.1091249 0.0484869
2020-10953  0.0236246 0.0458975
2020-07800 -0.2397508 0.1262036
2020-03337 -0.0671550 0.0567896
2020-09537 -0.4031048 0.1152833
2020-19032  0.0234534 0.0824950
2020-21129 -0.2123447 0.1067564
2021-00040 -4.4255448 0.2721778
2020-13449 -0.1571132 0.0737459
2017-14992  0.8983574 0.0067818
2017-05399 -0.1224922 0.1086696
2017-02281  0.4783398 0.0154070
2017-06968  0.0124935 0.0761867
2017-14378  0.3571614 0.0249412
2017-10003  0.2195444 0.0332270
2017-08818 -0.0968811 0.0597722
2017-09161 -0.0839097 0.0980844
2017-09087  0.0414640 0.0458847
2017-09574 -0.1683706 0.1018992
2017-18468  1.2140763 0.0022145
2017-18134 -0.3460087 0.0992053
2017-04837  0.4338171 0.0149195
2017-04353 -0.1468274 0.0955473
2017-02102 -0.3623731 0.0967640
2017-08990 -0.0919644 0.0961045
2017-08908 -0.1259692 0.0806742
2017-18679 -0.0986871 0.1085620
2018-27515  0.1041046 0.0385329
2018-26552 -1.7668751 0.3562491
2017-22677 -0.1968153 0.0943163
2017-27925  1.2157802 0.0014886
2018-10855  0.2550977 0.0417287
2018-10403 -0.9501431 0.2591707
2018-11335  1.1931638 0.0024278
2018-11913 -0.4237655 0.1153781
2018-11916  0.0433119 0.0432215
2018-11936 -0.0532483 0.0806817
2018-20816  1.1743605 0.0011427
2019-07656 -0.0294339 0.0595269
2019-05934 -0.1585095 0.0835691
2019-15159 -0.0816032 0.1026599
2019-15449  0.3887996 0.0312500
2019-10538  1.0612725 0.0023653
2019-27678 -1.8043581 0.3427192
2019-08797 -1.6503274 0.1970847
2019-04437 -0.1309223 0.0618348
2019-13793  1.1965716 0.0013499
2020-27353  0.1496794 0.0481440
2020-27807 -1.8096325 0.3405991
2020-27739  0.5173898 0.0176736
2020-27455 -0.0030950 0.0815857
2021-01469 -0.1080244 0.0894276
2021-01476 -0.0862769 0.0660067
2021-00305  1.0520927 0.0024846
2020-17363 -0.0356441 0.0775855
2020-04730 -0.4525368 0.1160309
2020-11301 -0.3111866 0.1015249
2020-08846  0.2525766 0.0419481
2020-09536 -0.1139137 0.0684932
2020-21160  1.1922098 0.0014692
2020-23115 -0.0949250 0.0669952
2020-23116 -0.5608172 0.1240201
2020-23780 -1.8094930 0.2162548
2019-24040 -0.0226831 0.0544434
2019-19367 -0.1295419 0.0634849
2019-22749 -0.0936741 0.1061899
2019-22073 -0.1778960 0.0972816
2019-19895  1.1590402 0.0021719
2019-06325 -0.0410795 0.0408933
2019-06548 -4.0203967 0.2207561
2019-14016  0.0848214 0.0477489
2019-28286 -4.0971357 0.2309283
2019-27217 -0.1361461 0.1059824
2019-13175 -0.0706559 0.0926607
2019-00048 -4.4255448 0.2721778
2020-12953  1.1915563 0.0015447
2019-02544 -0.1696766 0.0773724
2019-00014  0.2455416 0.0368002
2018-24254  1.2094645 0.0015701
2018-26156  1.2163423 0.0015320
2020-14077 -0.0123060 0.0709001
2020-14509 -0.1848811 0.0851757
2020-14328 -0.1194232 0.1109519
2020-18015 -0.1409920 0.0937619
2020-15338  0.0965878 0.0344088
2020-15646  1.1818549 0.0015086
2020-20887 -0.1645238 0.1064274
2020-09645 -0.2775170 0.1299953
2020-04755 -0.4121549 0.1176191
2021-01643 -0.1876050 0.1062871
2021-01644 -0.2083521 0.0983803
2021-01645 -0.3640755 0.1037291
2021-01713 -0.2072372 0.1254038
2021-01714  1.0220987 0.0027503
2021-01712 -0.2249033 0.1291692
2020-14872  0.1524307 0.0450694
2020-08392  0.5880724 0.0192144
2020-06478  0.1343793 0.0361014
2020-16625 -0.1113173 0.1027851
2020-21914 -0.5889387 0.1604861
2020-21534 -0.8523045 0.1847189
2020-12430  0.1371724 0.0527996
2020-02438  0.0770543 0.0504896
2020-25459  1.1271556 0.0023359
2020-21960 -0.2324071 0.1066525
2018-20203  1.1922501 0.0015188
2018-19514 -0.1479570 0.0984278
2018-09895  0.1121247 0.0474264
2018-00553 -0.2054002 0.1234694
2017-28160 -4.2548696 0.2453934
2019-17052  1.1952805 0.0015392
2019-21505  0.0790535 0.0614114
2019-04298 -0.1864905 0.1060871
2018-17068  1.1488906 0.0007858
2018-15195 -0.5214031 0.1932074
2020-09695  1.0026705 0.0025662
2020-06161 -0.1246162 0.0540893
2020-10993 -0.3522281 0.1022659
2020-10315  0.2038201 0.0273312
2020-18012  0.1545804 0.0300014

Estimated Feature Scores:
     physic_fit_sport presid_physic_fit health_human_servic human_servic_carri
beta           0.4858             0.483              0.3657             0.3674
psi           -4.2409            -4.423             -0.8832            -5.6050
     servic_carri_respons carri_respons_public respons_public_health
beta               0.3674               0.3674                 0.354
psi               -5.6050              -5.6050                -5.315
     public_health_human human_servic_develop regular_physic_activ
beta              0.3674                0.369               0.4015
psi              -5.6050               -5.094              -4.6304
     enhanc_coordi_among privat_public_sector compos_member_appoint
beta              0.3336               0.3632                0.3965
psi              -5.0882              -4.9111               -3.8757
     member_appoint_presid appoint_presid_presid presid_may_deat may_deat_one
beta                  4.82                0.3792          0.3015       0.3722
psi                  -3.42               -4.6263         -4.0532      -5.3182
     deat_one_member one_member_chair member_chair_vice chair_vice_chair
beta          0.4052           0.3674            0.3674           0.3906
psi          -4.0714          -5.6050           -5.6050          -3.2738
     member_serv_term serv_term_year term_year_may year_may_continu
beta           0.3596         0.3324        0.3588           0.3588
psi           -4.7563        -4.2126       -5.6035          -5.6035
     may_continu_serv continu_serv_expir serv_expir_term function_advis_presid
beta           0.3932             0.3932          0.3917                0.3833
psi           -4.2234            -4.2234         -4.3101               -4.7606
     advis_presid_concern
beta               0.3674
psi               -5.6050
textplot_scale1d(wf_model_eo_text_trigrams)

textplot_scale1d(wf_model_eo_text_trigrams, margin = "features")

plot_data_3 <- data.frame(
  score = wf_model_eo_text_trigrams$theta,
  president = docvars(dfmat_eo_text_trigrams, "president"))
plot_data_3
            score president
1    0.4203732452      Bush
2    0.2181695039      Bush
3    0.3764756770      Bush
4   -1.5859308787      Bush
5    0.3818536196      Bush
6    0.4763796267      Bush
7    1.1836441004      Bush
8    1.0532645016      Bush
9    0.5307144702      Bush
10   0.9693714863      Bush
11   1.5171910630      Bush
12   0.0096993310      Bush
13  -0.0525126769      Bush
14   0.4498633299      Bush
15  -4.2025922331      Bush
16  -0.0859434560      Bush
17   0.3753988178      Bush
18  -1.5838487453      Bush
19  -2.0187000503      Bush
20   0.1744121599      Bush
21   0.0510644417      Bush
22   0.1550060385      Bush
23   0.1117739446      Bush
24  -0.1720248515      Bush
25   1.1868015609      Bush
26  -0.0330511092      Bush
27   0.3215340573      Bush
28   1.2229886305      Bush
29   1.1988458682      Bush
30  -1.1788851122      Bush
31   0.5016061134      Bush
32  -1.1226502944      Bush
33   0.3059700978      Bush
34  -0.1543956454      Bush
35   0.2302574419      Bush
36   0.0370116844      Bush
37   1.1934877932      Bush
38   1.5685901366      Bush
39  -0.6316644378      Bush
40   0.3823356868      Bush
41   0.0953746721      Bush
42   0.2504653159      Bush
43  -0.0863394950      Bush
44   1.5830452077      Bush
45   0.0659338823      Bush
46   0.3597267679      Bush
47   0.5528778137      Bush
48   1.1271789495      Bush
49  -0.8624490931      Bush
50   1.2315907619      Bush
51   0.3911864371      Bush
52   0.2540169957      Bush
53   0.5438288678      Bush
54   0.5284556325      Bush
55  -1.2377621619      Bush
56  -0.6755490362      Bush
57   0.0004630834      Bush
58   0.6012653756      Bush
59   0.0198936036      Bush
60   0.3703107442      Bush
61   0.5297330646      Bush
62  -2.0159299864      Bush
63   1.5177931509      Bush
64   0.5097188212      Bush
65   0.5224876320      Bush
66  -1.3958483633      Bush
67   0.3193251198      Bush
68   1.5892644914      Bush
69   0.6122693859      Bush
70  -0.5527306202      Bush
71  -0.0209889897      Bush
72   0.2718269398      Bush
73  -1.8400897509      Bush
74  -0.8023716445      Bush
75   0.1751193005      Bush
76   0.0749686249      Bush
77   1.2024481260      Bush
78   0.5270107788      Bush
79   0.5544896143      Bush
80   0.2489259091      Bush
81   0.6809611252      Bush
82   0.9032757433      Bush
83   0.3983094293      Bush
84   0.0553035367      Bush
85   0.5954808561      Bush
86   0.3469180690      Bush
87  -3.9878446689      Bush
88   0.0923767883      Bush
89   0.2109384138      Bush
90   0.0607388193      Bush
91   0.2509616932      Bush
92   0.0183982886      Bush
93   0.8590075553      Bush
94   0.0297283379      Bush
95  -1.4199028729      Bush
96   0.1925677693      Bush
97  -0.8164009839      Bush
98  -1.5838487453      Bush
99  -4.1400932181      Bush
100 -0.1552775900      Bush
101  0.2404631815      Bush
102  0.2086804082      Bush
103 -4.2049993445      Bush
104 -0.0350942534      Bush
105  0.2071243133      Bush
106 -3.4080784914      Bush
107  0.0208139238      Bush
108 -1.1611461712      Bush
109  0.3027676473      Bush
110  0.5064332884      Bush
111  0.2765434565      Bush
112  0.1897946033      Bush
113 -0.1586314285      Bush
114  1.2166284981      Bush
115  1.2125648105      Bush
116 -0.0543598418      Bush
117  0.2304473874      Bush
118 -0.1127033747      Bush
119  0.3767692946      Bush
120  1.5826442828      Bush
121  0.6555462757      Bush
122  0.1377128278      Bush
123  0.2238728220      Bush
124 -2.0124064553      Bush
125  1.1812716885      Bush
126  0.0948354344      Bush
127  0.3906461736      Bush
128  0.3186133193      Bush
129  0.2784677586      Bush
130  0.3729316609      Bush
131  0.0945769990      Bush
132  0.2636725849      Bush
133  1.6062231768      Bush
134  0.1050632316      Bush
135  1.1511794929      Bush
136  0.6780024144      Bush
137  1.2141022457      Bush
138 -0.1578851381      Bush
139 -1.3919096183      Bush
140 -0.1861921352      Bush
141  0.1378487862      Bush
142  0.0848253165      Bush
143  0.0345346052      Bush
144  1.2189150471      Bush
145  0.8622847999      Bush
146 -0.2016977707      Bush
147  0.3287114954      Bush
148  0.7381936373      Bush
149 -0.0836863541      Bush
150  0.2222670771      Bush
151  0.2520910003      Bush
152 -2.6658562805      Bush
153 -1.2429658879      Bush
154  0.3666256250      Bush
155  0.4194970192      Bush
156 -0.1179212231      Bush
157  0.4042003609      Bush
158 -1.6521036203      Bush
159 -0.8340965786      Bush
160 -0.0746328511      Bush
161  0.0001519827      Bush
162  0.3876731491      Bush
163 -0.0136136741      Bush
164 -0.0119796202      Bush
165  0.0923799761      Bush
166  0.5339588194      Bush
167  0.0794319435      Bush
168  0.4551336574      Bush
169 -0.0831166061      Bush
170  1.2332419644      Bush
171 -0.6664782772      Bush
172 -0.0448739118      Bush
173  0.2168521810      Bush
174  0.0138896322      Bush
175  1.0572410212      Bush
176 -0.3490628414      Bush
177  0.1978172707      Bush
178  1.2022094540      Bush
179 -1.0482690296      Bush
180  0.2548438414      Bush
181  1.2255961024      Bush
182 -4.1494622689      Bush
183  0.4342235725      Bush
184  0.1319324252      Bush
185  0.1415691936      Bush
186  1.2308646819      Bush
187  0.0866319023      Bush
188  0.3166326965      Bush
189  1.1393599828      Bush
190  1.2346630458      Bush
191  0.1111342936      Bush
192  0.3627799061      Bush
193  0.2033824653      Bush
194  0.0620918304      Bush
195  1.0071241200      Bush
196  0.7560614061      Bush
197  0.2675537218      Bush
198  0.5073674585      Bush
199  0.1303913332      Bush
200  0.1690966681      Bush
201  0.2970992348      Bush
202  0.0605412139      Bush
203  0.5370479049      Bush
204  1.0251232672      Bush
205  0.7824497311      Bush
206 -2.0145478142      Bush
207  0.0073003406      Bush
208  1.2195613666      Bush
209 -0.0575572454      Bush
210  1.1759424284      Bush
211  0.0476620204      Bush
212  0.3075001522      Bush
213  0.2570870188      Bush
214 -0.0061189033      Bush
215  0.5467922502      Bush
216  0.2313446437      Bush
217  0.5550291562      Bush
218 -0.7149760076      Bush
219  0.1775285967      Bush
220 -0.5893719474      Bush
221 -1.5681106050      Bush
222  0.1272309922      Bush
223 -0.6532015402      Bush
224  0.0447236469      Bush
225 -1.2442753748      Bush
226 -0.3296619034      Bush
227 -4.0848970441      Bush
228  0.1892003154      Bush
229 -1.7222657645      Bush
230  0.2411616841      Bush
231  1.0607460834      Bush
232 -0.5216031502      Bush
233 -0.0517570281      Bush
234 -1.6424971892      Bush
235  0.5846530240      Bush
236 -1.9808836233      Bush
237  0.0969947208      Bush
238  1.1698887503      Bush
239  1.1476685893      Bush
240  1.2136899412      Bush
241  0.3805542913      Bush
242  0.1820645516      Bush
243 -0.2292808301      Bush
244 -0.1831964272      Bush
245  0.2455154189      Bush
246 -0.6724499286      Bush
247  0.3536722607      Bush
248  0.2623763865      Bush
249  0.2567534723      Bush
250 -4.1075331369      Bush
251  0.0719102053      Bush
252 -0.2315642554      Bush
253  0.5048869488      Bush
254 -1.2287296994      Bush
255  0.4847737727      Bush
256  0.4799443413      Bush
257  0.5169296284      Bush
258  0.5191446370      Bush
259  0.1568162009      Bush
260  0.0242416526      Bush
261  0.4376793208      Bush
262 -0.0624509982      Bush
263  0.2352669208      Bush
264  0.3778011729      Bush
265  0.4745506393      Bush
266 -3.9955658460      Bush
267  1.6027964436      Bush
268  0.0279947362      Bush
269  1.1840549929      Bush
270 -0.1268288603      Bush
271  0.2455037285      Bush
272  1.1249984353      Bush
273  0.2253646705      Bush
274  0.1023268781      Bush
275 -0.4304432311      Bush
276  0.2777070320      Bush
277 -0.2556927190      Bush
278 -4.1551128413      Bush
279  0.2176372394      Bush
280  0.0530024530      Bush
281 -0.0911518201      Bush
282  0.0355839124      Bush
283 -0.5094286479      Bush
284  0.1615738600      Bush
285 -0.1063924075      Bush
286  1.2193309083      Bush
287  1.2215310057      Bush
288  1.2261197889      Bush
289 -0.2485672330      Bush
290  0.4657570728      Bush
291 -0.0748435014     Obama
292  1.2237129407     Obama
293 -1.0843657099     Obama
294  1.2229144122     Obama
295 -0.7668296237     Obama
296 -0.1212587029     Obama
297  0.1037731387     Obama
298 -0.0632357833     Obama
299 -0.3661867634     Obama
300  0.0392664761     Obama
301 -0.1838189026     Obama
302 -0.6806767758     Obama
303  1.2333590700     Obama
304 -0.2062737827     Obama
305 -0.9888944621     Obama
306  0.4634953919     Obama
307 -0.3905020927     Obama
308 -0.1555738264     Obama
309  0.2053746513     Obama
310  0.2335731913     Obama
311  0.3392653729     Obama
312  1.2203746585     Obama
313  1.5977132248     Obama
314  1.2356572036     Obama
315 -0.2518515241     Obama
316 -0.0919660274     Obama
317  0.1515931105     Obama
318  1.2096908540     Obama
319  1.5511733941     Obama
320 -0.1977157386     Obama
321 -0.1354526290     Obama
322  0.2426346714     Obama
323 -0.0270271950     Obama
324  0.5634529505     Obama
325 -0.1937868328     Obama
326 -4.4231578048     Obama
327 -0.4176736082     Obama
328 -0.1992278358     Obama
329 -0.0497270950     Obama
330 -0.1827132958     Obama
331  0.0154219044     Obama
332  0.0881172989     Obama
333  0.5101201634     Obama
334 -0.0174844581     Obama
335 -0.2592241098     Obama
336  0.0050781018     Obama
337 -0.2941569105     Obama
338 -0.1401880181     Obama
339  0.0785884071     Obama
340  0.0728928248     Obama
341 -0.0016563882     Obama
342 -0.0053238279     Obama
343 -0.1853131234     Obama
344 -4.3595240399     Obama
345  1.5997038883     Obama
346  1.2165101110     Obama
347 -0.0252328075     Obama
348 -0.0792932270     Obama
349  1.2313211695     Obama
350  0.1736035212     Obama
351  0.0643856711     Obama
352 -0.1249107663     Obama
353 -0.1168895066     Obama
354  1.1769646937     Obama
355 -0.2605884217     Obama
356 -0.2424123373     Obama
357 -0.3552042020     Obama
358  0.1577101221     Obama
359  0.1158235067     Obama
360 -0.1658382025     Obama
361 -1.8713084258     Obama
362 -0.5014075939     Obama
363  0.1664490482     Obama
364 -0.0477302918     Obama
365  0.0882348792     Obama
366 -0.2123821530     Obama
367  1.2263289015     Obama
368 -1.8073558599     Obama
369  1.2323568075     Obama
370 -4.4255447994     Obama
371  1.5484918884     Obama
372  0.5335215414     Obama
373  0.2338198703     Obama
374  0.5278095452     Obama
375  1.1803662624     Obama
376 -0.1178134764     Obama
377 -1.4460554808     Obama
378 -0.6400877556     Obama
379  1.0517424776     Obama
380  0.1895502551     Obama
381  0.5127072637     Obama
382  0.8110000831     Obama
383 -1.2992545167     Obama
384  0.0939633911     Obama
385 -0.0050387696     Obama
386 -3.9921008437     Obama
387  0.1266467475     Obama
388  0.5130859788     Obama
389 -0.1606638263     Obama
390  1.2013496335     Obama
391 -0.1400485958     Obama
392 -0.3002451431     Obama
393 -3.9199005853     Obama
394  0.0886229042     Obama
395  0.1904056521     Obama
396 -0.2520281529     Obama
397 -1.3110339494     Obama
398  0.2770508870     Obama
399  0.0960022813     Obama
400 -0.1857858404     Obama
401 -0.1835850306     Obama
402 -0.1055048210     Obama
403  0.3305379929     Obama
404  1.2203751522     Obama
405  0.1863922321     Obama
406 -1.5283223133     Obama
407  0.9616052419     Obama
408  0.2258637901     Obama
409 -0.0791967296     Obama
410 -1.1730000238     Obama
411 -0.1437296654     Obama
412  0.2258637901     Obama
413 -0.1499262119     Obama
414 -0.2454492037     Obama
415  0.0558920908     Obama
416 -0.1568470007     Obama
417 -0.3557074651     Obama
418 -0.0839761618     Obama
419 -3.9341587493     Obama
420  1.2266105884     Obama
421  0.2371993578     Obama
422  1.2060762291     Obama
423 -0.1380915766     Obama
424  0.5132597820     Obama
425  1.1468366207     Obama
426 -0.1015916767     Obama
427  1.2125700811     Obama
428  1.1852497691     Obama
429  1.1870767527     Obama
430 -4.3061157683     Obama
431 -0.1584421797     Obama
432  1.0358351066     Obama
433  0.0949493905     Obama
434  0.5093328763     Obama
435 -4.4255447994     Obama
436 -0.2527750009     Obama
437 -0.9888944621     Obama
438 -0.9718817194     Obama
439  0.9310414080     Obama
440 -0.0823610650     Obama
441 -0.6487621428     Obama
442 -0.0897854440     Obama
443  1.5999609781     Obama
444  0.3576431547     Obama
445  0.0793890100     Obama
446 -0.3651591431     Obama
447 -0.1020179050     Obama
448 -0.1674593559     Obama
449  1.5307632047     Obama
450 -0.1018848493     Obama
451 -1.8362999091     Obama
452  1.2317348204     Obama
453  1.2186726506     Obama
454  1.2237129045     Obama
455 -0.2806587892     Obama
456 -0.8554813682     Obama
457 -0.1471327896     Obama
458  0.2258637901     Obama
459 -0.2972996659     Obama
460 -0.1704310021     Obama
461  0.4187072927     Obama
462  1.1866105030     Obama
463 -0.3357949106     Obama
464  0.1001341382     Obama
465 -0.2670598385     Obama
466 -0.0765662547     Obama
467  0.5160565709     Obama
468  0.5314353087     Obama
469  0.5106457658     Obama
470  0.2418376134     Obama
471  1.2324464948     Obama
472 -0.0473861463     Obama
473 -1.8312726955     Obama
474  1.1682781121     Obama
475  0.1646610289     Obama
476  0.1557778380     Obama
477  0.1650159373     Obama
478  0.1125927489     Obama
479  0.2302441086     Obama
480 -0.1075716134     Obama
481 -0.0212732945     Obama
482  0.3749412050     Obama
483 -0.0990339099     Obama
484  1.5944807361     Obama
485  0.2358297559     Obama
486 -0.2820119829     Obama
487 -0.0370972216     Obama
488 -0.2769092070     Obama
489  0.1449975687     Obama
490 -0.2138247423     Obama
491  0.3954205199     Obama
492  0.0230770893     Obama
493  1.2325889286     Obama
494  1.2322865637     Obama
495  1.2301943637     Obama
496 -4.1339699147     Obama
497 -0.1553212986     Obama
498 -0.2028919111     Obama
499 -0.0611001900     Obama
500  0.1010275019     Obama
501 -0.0498028569     Obama
502  0.0727394934     Obama
503  1.2321112315     Obama
504 -0.1032542061     Obama
505  0.2777504232     Obama
506  1.1918032401     Obama
507 -0.2056879174     Obama
508 -0.3303774257     Obama
509 -0.7416361517     Obama
510 -0.3905020927     Obama
511 -0.3858418240     Obama
512  0.4784038305     Obama
513  0.4997134054     Obama
514  0.5135356196     Obama
515 -0.8821611253     Obama
516 -0.1660056766     Obama
517  0.0877605660     Obama
518  0.3287114954     Obama
519  0.0448191752     Obama
520 -0.1869324354     Obama
521 -0.0892172145     Obama
522  0.2886794217     Obama
523  0.1944049916     Obama
524  0.0982956065     Obama
525  0.3902413153     Obama
526  0.1617132999     Obama
527 -0.3610368689     Obama
528  0.2156669876     Obama
529 -0.1369517975     Obama
530 -0.0462394557     Obama
531 -0.9312873570     Obama
532  0.1306044179     Obama
533  0.1507083587     Obama
534  0.0322323494     Obama
535  0.1723714459     Obama
536  0.5438989481     Obama
537  0.4313237933     Obama
538  0.1052157187     Obama
539 -0.2725455006     Obama
540 -0.1369478466     Obama
541 -0.1996390163     Obama
542  0.2349471271     Obama
543  1.2162973673     Obama
544 -0.0356814057     Obama
545 -0.0864716320     Obama
546  0.0764209664     Obama
547  1.1536697267     Obama
548  0.5189208531     Obama
549  0.2050958323     Obama
550 -1.8305267124     Obama
551  0.2083630159     Obama
552  1.1857751896     Obama
553  0.3764603355     Obama
554  1.1297719855     Obama
555  0.4806355211     Obama
556  0.2493295274     Obama
557 -0.1664729882     Obama
558  1.2317782251     Obama
559  0.2018514228     Obama
560  0.2936430034     Obama
561 -0.2267188094     Obama
562  1.2298422189     Obama
563 -0.2595792346     Obama
564  1.2423295749     Obama
565 -0.0970876997     Obama
566 -1.8206591903     Trump
567  0.2447922625     Trump
568 -0.1204046089     Trump
569  0.0240733349     Trump
570 -0.9877462855     Trump
571  1.2069273227     Trump
572 -0.0940531345     Trump
573 -0.9358862731     Trump
574 -0.0853719435     Trump
575  0.3154779007     Trump
576 -0.1453477993     Trump
577  0.1471890627     Trump
578 -1.9343061265     Trump
579 -0.4754339283     Trump
580  0.0594786739     Trump
581  0.1255891163     Trump
582 -0.0208029152     Trump
583 -0.0776573056     Trump
584  0.8359464987     Trump
585  1.2054958218     Trump
586  0.0676587307     Trump
587 -0.0831947166     Trump
588 -0.1197359575     Trump
589 -0.4865077758     Trump
590  0.0471961970     Trump
591  0.2029110658     Trump
592 -0.1812588085     Trump
593  1.0895857891     Trump
594  1.1150963752     Trump
595  0.0714108561     Trump
596 -0.6630715696     Trump
597  0.5314942555     Trump
598  0.9043798150     Trump
599  0.0622776853     Trump
600  0.2962602935     Trump
601 -0.0763103766     Trump
602  0.1651804324     Trump
603 -0.1660631700     Trump
604  0.4491829598     Trump
605 -0.1587622381     Trump
606 -0.1729925908     Trump
607 -0.1218979530     Trump
608  1.1800759769     Trump
609 -0.1567261137     Trump
610 -0.0362331852     Trump
611 -0.5405140153     Trump
612 -0.6500571200     Trump
613  0.9707475015     Trump
614 -1.1835847338     Trump
615 -0.1275898302     Trump
616 -0.3374003246     Trump
617  0.1561666311     Trump
618 -0.0951356435     Trump
619 -0.1061114587     Trump
620  0.8100915416     Trump
621  0.0412419680     Trump
622  0.3376223279     Trump
623 -0.1549699924     Trump
624 -0.1473704160     Trump
625 -0.1217271429     Trump
626 -0.0947740108     Trump
627  0.7259698917     Trump
628 -0.0542496887     Trump
629  1.1536419563     Trump
630  0.0155576439     Trump
631  1.1827056757     Trump
632  0.2850211800     Trump
633 -0.0458295849     Trump
634 -0.0547051274     Trump
635 -0.0853719435     Trump
636  0.0596959530     Trump
637 -0.0851027799     Trump
638 -0.1544356290     Trump
639  0.2507000414     Trump
640 -0.1948908863     Trump
641  0.5275624528     Trump
642 -0.0984301545     Trump
643 -0.7068808765     Trump
644  0.2538365791     Trump
645  0.1285482047     Trump
646 -0.0106468448     Trump
647  1.2122076519     Trump
648  0.4422671920     Trump
649 -0.1711758487     Trump
650 -0.0909496147     Trump
651 -0.1773934227     Trump
652  0.3147809377     Trump
653  0.0288695643     Trump
654  0.5336139679     Trump
655  0.2414648926     Trump
656 -0.5687456474     Trump
657 -0.0681720195     Trump
658 -0.2598549394     Trump
659 -0.2369847429     Trump
660 -0.2655795202     Trump
661 -0.1052651128     Trump
662  1.1784630303     Trump
663  0.0642763414     Trump
664 -1.0265669723     Trump
665  0.1642836470     Trump
666  0.1091249148     Trump
667  0.0236245719     Trump
668 -0.2397507713     Trump
669 -0.0671550280     Trump
670 -0.4031047831     Trump
671  0.0234533784     Trump
672 -0.2123447074     Trump
673 -4.4255447994     Trump
674 -0.1571131753     Trump
675  0.8983573993     Trump
676 -0.1224921973     Trump
677  0.4783398042     Trump
678  0.0124935419     Trump
679  0.3571613728     Trump
680  0.2195443594     Trump
681 -0.0968810993     Trump
682 -0.0839096713     Trump
683  0.0414639990     Trump
684 -0.1683706094     Trump
685  1.2140763355     Trump
686 -0.3460087139     Trump
687  0.4338170939     Trump
688 -0.1468274075     Trump
689 -0.3623730627     Trump
690 -0.0919643911     Trump
691 -0.1259692475     Trump
692 -0.0986871334     Trump
693  0.1041045863     Trump
694 -1.7668751067     Trump
695 -0.1968153411     Trump
696  1.2157802394     Trump
697  0.2550976812     Trump
698 -0.9501430614     Trump
699  1.1931637949     Trump
700 -0.4237654540     Trump
701  0.0433119115     Trump
702 -0.0532483235     Trump
703  1.1743605415     Trump
704 -0.0294338840     Trump
705 -0.1585094732     Trump
706 -0.0816031557     Trump
707  0.3887995533     Trump
708  1.0612725498     Trump
709 -1.8043581215     Trump
710 -1.6503274497     Trump
711 -0.1309223497     Trump
712  1.1965716202     Trump
713  0.1496793527     Trump
714 -1.8096324651     Trump
715  0.5173898446     Trump
716 -0.0030949655     Trump
717 -0.1080243898     Trump
718 -0.0862768540     Trump
719  1.0520927176     Trump
720 -0.0356440865     Trump
721 -0.4525367801     Trump
722 -0.3111865700     Trump
723  0.2525765983     Trump
724 -0.1139137206     Trump
725  1.1922098048     Trump
726 -0.0949249886     Trump
727 -0.5608171798     Trump
728 -1.8094929846     Trump
729 -0.0226830971     Trump
730 -0.1295419381     Trump
731 -0.0936740816     Trump
732 -0.1778959860     Trump
733  1.1590401660     Trump
734 -0.0410795001     Trump
735 -4.0203966930     Trump
736  0.0848213945     Trump
737 -4.0971356560     Trump
738 -0.1361460738     Trump
739 -0.0706558832     Trump
740 -4.4255447994     Trump
741  1.1915563064     Trump
742 -0.1696765513     Trump
743  0.2455416289     Trump
744  1.2094644618     Trump
745  1.2163423271     Trump
746 -0.0123059749     Trump
747 -0.1848810670     Trump
748 -0.1194232039     Trump
749 -0.1409919594     Trump
750  0.0965878107     Trump
751  1.1818549085     Trump
752 -0.1645237875     Trump
753 -0.2775169797     Trump
754 -0.4121548861     Trump
755 -0.1876050140     Trump
756 -0.2083520744     Trump
757 -0.3640754866     Trump
758 -0.2072372247     Trump
759  1.0220986688     Trump
760 -0.2249032942     Trump
761  0.1524306881     Trump
762  0.5880723839     Trump
763  0.1343792695     Trump
764 -0.1113173058     Trump
765 -0.5889387186     Trump
766 -0.8523045421     Trump
767  0.1371723689     Trump
768  0.0770543161     Trump
769  1.1271556487     Trump
770 -0.2324070762     Trump
771  1.1922500997     Trump
772 -0.1479570127     Trump
773  0.1121246765     Trump
774 -0.2054001745     Trump
775 -4.2548695921     Trump
776  1.1952804657     Trump
777  0.0790534679     Trump
778 -0.1864904684     Trump
779  1.1488905843     Trump
780 -0.5214030648     Trump
781  1.0026705482     Trump
782 -0.1246161794     Trump
783 -0.3522280638     Trump
784  0.2038200910     Trump
785  0.1545804180     Trump
ggplot(plot_data_3, aes(x = score, fill = president)) +
  geom_density(alpha = 0.6) +
  labs(
    title = "Wordfish Score (Trigrams) Distribution by President",
    x = "Wordfish Score (Trigrams)",
    y = "Density",
    fill = "President"
  ) +
  theme_minimal()

ggplot(data = plot_data_3, aes(x = president, y = score, fill = president)) +
  geom_violin(trim = FALSE) +
  geom_boxplot(width = 0.1, fill = "white", color = "black") + # Add a boxplot inside for more detail
  labs(
    title = "Distribution of Wordfish Scores (Trigrams) by President",
    x = "President",
    y = "Wordfish Score (Theta) (Trigrams)",
    fill = "President"
  ) +
  theme_minimal() +
  scale_fill_brewer(palette = "Set3")