EO_4_V2

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 = "|")
# Remove the "Title 3- The President"
merged_df_all$text <-  text <- str_remove_all(merged_df_all$text, regex("Title\\s*3[^\\n]", ignore_case = TRUE))
merged_df_all$text <-  gsub("The President", "", merged_df_all$text, fixed = TRUE)

# Remove everything before the first "Section"
pattern <- "(?:\\.\\s*)?[^.]*? hereby ordered as follows:.*?:?\\s*"

# Use str_replace() to replace the matched sentence with an empty string
merged_df_all$text<- str_replace(merged_df_all$text , pattern, "")

merged_df_all$text <- sub(".*?of the United States of America", "", 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<-gsub("executive order", "",merged_df_all$text, 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")
.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) 13101 of September 14, 1998; (ii) 13123 of June 3, 1999; (iii) 13134 of August 12, 1999, as amended;
(iv) 13148 of April 21, 2000; and (v) 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 13327 of
February 4, 2004, is amended by striking “ 13148 of April 21, 2000” and inserting in lieu thereof “other s”.
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. 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")
. 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 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 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 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")
. 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) 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. 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 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 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")
.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 s 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 13035 of
February 11, 1997, as amended by s 13092 and 13113 (“ 13035, as amended”), is further amended as follows:(b) of 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")
. 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 , 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")
.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 . 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.  .  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 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 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 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")
.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) 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) 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 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 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 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 13338 of May 11, 2004, as modified in scope and relied
upon for additional steps taken in 13399 of April 25, 2006, 13460 of February 13, 2008, 13572 of April 29, 2011, and
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 13338 and
expanded in scope in 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 13338 and expanded in scope in 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.  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")
.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")
. 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 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) 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 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 .  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
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 .  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 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 .
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 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 .  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 .  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")
.  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.  ial 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 .  Policy .  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 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 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.  13658 therefore
should continue to apply to lodging and food services associated with seasonal recreational services.  .  Exemption
from 13658 . (f) of 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 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   287    839        15
 02-11166   332    930        20
  01-2851   286    941        16
 04-11991   196   1097        10
 03-12661    36     51         1
 03-24217   237    735        15
 03-19573   413   1750        23
 03-20013   428   2284        56
 03-29644   268    825        11
  04-1322   195    420         6
 04-18575   165    415        18
 04-20050   458   2029        17
 04-20052   501   2039        12
 03-32332    97    262        10
 03-32328   184    550        16
  04-6622   267    817        13
 04-12745   261    849        14
 04-13123    89    161         4
 03-30913    83    148         4
 03-30513    81    150         5
  03-7736  1479  11768       149
  03-5343  1058   8972        49
  03-8108    83    159         2
  05-7830   107    193         2
  05-3385   222    700        10
 04-28079   325   1201        14
 04-10024   327   1003        11
 05-13214   360   1560        14
 03-22543   414   1619        27
 03-13750    35     73         3
 03-14116   111    234         5
 03-14117    56     93         1
   08-970   424   2363        22
   07-780   133    296         9
  07-2027   722   5079        83
  07-2570   327   1326        14
  08-1215   345   1259        14
  07-5919   166    358        16
 E8-28912   223    840        28
  04-4884   345   1097        12
  04-4436   202    652        11
  04-4451   381   1139        16
 04-10377   398   1341        26
  04-8616   141    316        15
 05-12284    52     83         2
 05-12354   166    515         3
 04-26684   120    309         3
 04-26686   273    814         9
 04-25866   188    468         5
  08-1480   347   1311        11
  07-4906   429   1513        26
  07-4907   109    222         4
  07-4023   172    508         7
   08-797   146    393         5
  08-1409   664   3120        23
  07-4600    58    110         1
  07-5299   228    615         7
 E8-23235   141    329         2
  05-5097   168    573         3
   E9-811   168    474         3
   E9-814   181    506         6
  07-6022    83    148         4
  07-1816   169    426        19
 01-31671   103    291         4
 01-31670   119    363         4
  07-5816    75    131         4
  01-4622   325   1004         9
  01-6558   154    334        14
  02-7087   166   1065         5
  07-3656   407   1451        14
  07-3593   280    845        17
 E8-27777   301   1180        12
 E8-30042   108    208         5
  E9-1574   315   1090        18
  E9-1538   160    374        10
   E9-818   318   1100        11
 01-16668   355   1204        12
  02-1594   127    259         1
   02-917   103    297         4
  02-4071   262    741         6
  02-5069   121    851         3
  01-8835   132    375         8
  01-8836    53    120         1
  02-2638   354   1327        25
   02-918   176    718         4
 01-29831   108    175         5
 E8-30700   194    586        16
 02-14497    67    120         4
 02-31624   293    793        12
 02-16040   274    682        13
 02-16041   151    388        12
 01-28762   156    377        11
 01-29219    77    162         3
 01-27917   453   2350        47
   06-554    57     92         5
  06-4652   172    542         2
   07-293   367   1303        12
  06-9993    91    163         5
  06-9896   185    599        18
 05-21571   340   1297        12
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] "purpos"  "health"  "human"   "servic"  "carri"   "respons" "public" 
 [8] "health"  "human"   "servic"  "develop" "coordin"
[ ... and 275 more ]

text2 :
 [1] "ment"       "presid"     "new"        "freedom"    "commiss"   
 [6] "mental"     "health"     "commiss"    "membership" "commiss"   
[11] "membership" "compos"    
[ ... and 365 more ]

text3 :
 [1] "ment"      "center"    "faith-bas" "communiti" "attorney"  "general"  
 [7] "educ"      "labor"     "health"    "human"     "servic"    "hous"     
[ ... and 313 more ]

text4 :
 [1] "result"    "enact"     "ocean"     "atmospher" "administr" "commiss"  
 [7] "corp"      "act"       "public"    "law"       "107-372"   "follow"   
[ ... and 297 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] "purpos"  "health"  "human"   "servic"  "carri"   "respons" "public" 
 [8] "health"  "human"   "servic"  "develop" "coordin"
[ ... and 275 more ]

text2 :
 [1] "ment"       "presid"     "new"        "freedom"    "commiss"   
 [6] "mental"     "health"     "commiss"    "membership" "commiss"   
[11] "membership" "compos"    
[ ... and 365 more ]

text3 :
 [1] "ment"      "center"    "faith-bas" "communiti" "attorney"  "general"  
 [7] "educ"      "labor"     "health"    "human"     "servic"    "hous"     
[ ... and 313 more ]

text4 :
 [1] "result"    "enact"     "ocean"     "atmospher" "administr" "commiss"  
 [7] "corp"      "act"       "public"    "law"       "107-372"   "follow"   
[ ... and 297 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,460 features (97.85% sparse) and 1 docvar.
          features
docs       purpos health human servic carri respons public develop coordin
  02-14807      1      2     2      5     2       1      4       1       1
  02-11166      0     12     4     17     1       0      4       0       1
  01-2851       2      3     3      6     2       6      0       3       3
  04-11991      0      1     1      5     0       0     13       0       0
  03-12661      0      0     0      0     0       0      0       0       0
  03-24217      0      5     3      4     0       0      0       0       0
          features
docs       enhanc
  02-14807      4
  02-11166      0
  01-2851       0
  04-11991      0
  03-12661      0
  03-24217      0
[ reached max_ndoc ... 782 more documents, reached max_nfeat ... 8,450 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: 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: benefit, presid, may, function, provis, entiti, administr, law, includ, person, appropri, general, procedur, 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: ., the, of, and, (, ), shall, ,, in, a, to, 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: ., the, of, and, (, ), shall, ,, in, for, a, to, this, :, ;, b, that, c, agencies, with, as, or, is, be, by, order, not, at, law, other, its, any, united, states, officers, employees 
cat("Terms in 70% or more of documents:", paste(terms_70_percent_1, collapse = ", "), "\n")
Terms in 70% or more of documents: purpos, human, carri, public, enhanc, physic, activ, sport, particip, benefit, among, promot, regard, broader, children, adolesc, identifi, appoint, concern, acceler, address, campaign, private-sector, extent, fund, work, howev, receiv, white, appropri, aid, prescrib, juli, congress, februari, officio, each—bi, ill, technolog, wide, differ, maximum, unnecessari, ism, flexibl, forth, audit, discourag, disadvantag, interior, infrastructur, black, block, withdrawn, consular, headquart, legal, equival, privileg, immun, promulg, des, met, regist, overse, 5311-5318 
quanteda::ntoken(dfmat_eo_text)
     02-14807      02-11166       01-2851      04-11991      03-12661 
          287           377           325           309            11 
     03-24217      03-19573      03-20013      03-29644       04-1322 
          194           509           702           286           152 
     04-18575      04-20050      04-20052      03-32332      03-32328 
          130           658           690            67           190 
      04-6622      04-12745      04-13123      03-30913      03-30513 
          235           300            44            47            49 
      03-7736       03-5343       03-8108       05-7830       05-3385 
         4220          2321            50            49           185 
     04-28079      04-10024      05-13214      03-22543      03-13750 
          403           405           459           496            10 
     03-14116      03-14117        08-970        07-780       07-2027 
           88            45           712            87          1733 
      07-2570       08-1215       07-5919      E8-28912       04-4884 
          418           380           110           247           391 
      04-4436       04-4451      04-10377       04-8616      05-12284 
          190           412           518            94            18 
     05-12354      04-26684      04-26686      04-25866       08-1480 
          121            81           246           118           383 
      07-4906       07-4907       07-4023        08-797       08-1409 
          477            76           126           106          1097 
      07-4600       07-5299      E8-23235       05-5097        E9-811 
           41           197           102           171           121 
       E9-814       07-6022       07-1816      01-31671      01-31670 
          137            47           136            68           106 
      07-5816       01-4622       01-6558       02-7087       07-3656 
           62           341            99           230           502 
      07-3593      E8-27777      E8-30042       E9-1574       E9-1538 
          319           357            61           383           118 
       E9-818      01-16668       02-1594        02-917       02-4071 
          349           361            83            77           260 
      02-5069       01-8835       01-8836       02-2638        02-918 
          223           107            22           447           151 
     01-29831      E8-30700      02-14497      02-31624      02-16040 
           60           208            29           285           263 
     02-16041      01-28762      01-29219      01-27917        06-554 
          118           132            47           940            45 
      06-4652        07-293       06-9993       06-9896      05-21571 
          120           344            44           207           385 
     05-20944      02-21056        03-464      03-11969      03-12071 
         1580           288           181           204            87 
      03-7313      03-10194      01-14319      01-15958      01-24917 
           53            77            75           434           178 
     01-24983      02-17274       06-4132       06-4121       06-9020 
          157           634           261           520           445 
      06-9619       06-7220       06-3865       06-2362      01-31959 
          421           398           367           257            99 
      01-9086      01-26509      01-26339      01-30624      01-13381 
          129          1707           529            47           299 
      03-2606       03-1798       03-8832      03-19675       07-3259 
          289           297           115           131            13 
      07-3258       07-2367       06-6101      05-20156      04-17636 
           22           121           102            25           310 
     04-15787       03-5848      E8-24465       05-9892       07-2518 
           21           224           351           148           165 
     E8-20436      01-15758      01-13869       06-5592      01-21338 
           47           325           268           382           190 
      04-2773      03-20764      03-31594      04-11592      04-11271 
          783            15            45           544           453 
      04-2408       04-1941       01-3883       01-2852      04-10378 
          250           127            33           321           374 
     04-20051      03-05344       03-6445       03-8109      03-12766 
          866           654           215            63           216 
      06-7492      05-19993      05-22132      05-22133       07-3112 
          351           446           235           249           361 
     01-25788       03-2069      03-19572      04-17150      04-17205 
           17           425            54           265           464 
     04-17204      04-20049      04-19909      04-24098      03-19676 
           30           405           196           392           324 
      06-5828       06-5829       06-8769        07-374       06-5984 
          194           435           401           958            13 
     05-23412      05-24596      05-24597      05-24255       06-5351 
          359           194           144           868           213 
      06-4085       06-4552       06-9770       06-9148       03-7160 
          404           428            33            46           163 
      07-3835       01-4624      01-17041      01-13117      01-13116 
          387            36            22           174           221 
     02-16951      02-17273      02-22526       01-4621       01-4623 
          152            56           102           749            47 
     01-29948      02-07086      02-07085      01-31119      03-11713 
          387           328            87            22           102 
     02-25900      02-32518      03-10606       06-1316      01-19562 
          119            54           234           512           107 
     01-24205      01-25677      01-25344      03-16102      04-23994 
          589          1132           452           128           101 
     01-11210      01-11505      02-29580      02-29832      02-31831 
           17           284           325           295           756 
     04-15933      04-15934      03-24919      05-13098       05-1886 
          331           233           323           490           169 
     04-28404      04-22212        05-306        05-771      04-26685 
           74           164           193           278           186 
     04-27076      04-21411      05-14452        08-658       05-7831 
         1395           117            55           438            41 
      05-1170       05-5434      E8-24342      03-13694      03-13412 
           82            96            89           466           278 
       08-761       06-9561        07-419       06-9895      05-15160 
          367            29            14           334            49 
      02-9536        02-919       02-3337       02-3826      01-14862 
         1733            40            13           445            30 
        08-62        08-325        08-360      E8-29564      01-31665 
          190           329           679           120            49 
     01-31667      01-31668      01-31669      01-31672       08-1182 
           81           116            73            91            34 
     02-17640      01-23359      02-24252       04-3170      02-31832 
          314           278           354           604           284 
     01-26990        02-448       06-9632       05-6907       07-5270 
           22           190           107            46           446 
     E8-17940       08-1472      E8-26531       07-4115      E8-27771 
         3672            64           198           232            79 
     E8-23125        08-568        08-483       04-5322      E8-21651 
          253            93           307           192           209 
      07-1704       07-2462       07-1137       07-1152       08-1348 
           46           396           460            48           245 
      07-4890      04-11058       07-3552       08-1399       07-5726 
          353           692           366           254           572 
     01-31666    2015-03714    2015-07788    2015-07016    2015-05677 
           83           951           497          3261           539 
   2015-18292    2015-19183     2010-9078    2010-10172     2010-7154 
          266           761           232           235           384 
   2010-11557     2010-9796    2015-16334    2011-19156    2015-20801 
          157           358           212           431           317 
   2015-22888     2010-4884     2010-1229       2010-38    2010-12805 
           98           182            74           262           320 
    2010-3725    2011-30990    2010-24839    2011-26574    2011-12645 
          217           107           570           119           352 
   2011-29683    2011-17953    2011-17447    2014-11442    2014-06768 
          352           188           271           582           146 
   2014-08426    2012-22030    2011-32486    2014-03805    2013-05967 
          270           474            63           618           568 
   2014-22805    2013-31445    2014-18561    2014-17522    2010-29579 
         1128           186          1407           104           820 
    2012-1568      E9-11547      E9-26834      E9-23886      E9-29781 
          524          1321           172           121           710 
    2012-7636    2013-08501    2011-21704    2011-26729    2013-15942 
          744            63           447           916           552 
   2013-16387    2012-31574    2012-30060    2012-30170    2013-00002 
          459            61           432            82           192 
   2013-28581    2014-07895    2011-15181    2010-18169     2010-8878 
          110           490           485           983           497 
   2010-21016    2010-21020    2013-17478    2014-03474    2014-16360 
         1115           151           600            44           434 
   2011-18065    2010-28854       E9-1893       E9-2893       E9-1712 
          373           300           674           504           433 
     E9-28493      E9-30020       E9-2484       E9-3106    2014-18998 
          844            68           655            31           368 
   2014-30195    2014-29625    2010-22002    2014-29121    2014-30323 
          214           210           503            89           421 
   2014-30363    2014-24851    2016-30272    2016-30101    2016-31792 
          186           145           133            92           129 
   2016-31922    2016-30277    2017-01623    2017-01169    2015-29403 
          282          1132          2666           803           138 
   2016-29519    2017-01487    2017-01197     2011-5903     2011-8642 
         1236           108           326            81            88 
   2011-28728    2011-33087    2010-27004    2010-28365    2010-28360 
          419           240           874           107           470 
   2011-13173    2010-25578       E9-5441      E9-31098      E9-28022 
          443           981           183           207           430 
     E9-25268    2016-06250    2016-07703    2016-08713    2016-03141 
          719           660           167            70           451 
   2015-02379    2015-01522    2015-01255    2016-26753    2015-30191 
          707           659           541            39           484 
   2016-03038    2016-24066    2016-24847    2016-22962    2016-28203 
          714           675           208            67           706 
   2016-29165    2016-11300    2016-12579    2016-15542     2012-9473 
          347           449            67           541           320 
   2012-10715    2012-10968     2012-5366    2012-27002    2013-08626 
          907           512           352           479           206 
   2012-10034    2012-18868     2012-3097    2012-11798    2012-12889 
          564          1178           565           376           116 
   2012-19055    2012-17022    2012-18237    2012-25236    2012-15954 
         1246           965           377          1331           353 
   2016-31875    2016-27156    2016-22454    2016-27171    2017-01489 
          194           818           123          1082           136 
   2015-32582    2017-01164    2017-01168    2016-29169    2015-13055 
          186           226           105           290           102 
   2015-19209    2016-17945    2016-18872    2015-17926    2015-15828 
          759           223           150           106            32 
   2015-16122    2016-25288    2016-25290    2016-20713    2015-29498 
          647           293          1005           101           144 
   2016-02475    2015-31749    2015-00058    2016-06355    2016-09483 
          741            97           385           619           547 
   2016-09346    2016-04770    2015-23630    2015-15495    2015-25744 
          403           157           395            67           191 
   2015-22998    2015-25489    2016-01325    2015-32060    2016-12307 
          784           331          1030           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 
           63           374           406           901           744 
   2011-33335     2010-2419     2010-5837      E9-31418 C1-2009-31418 
          118           439           448          5462            26 
    2010-4593    2013-26785    2010-18988    2011-33089    2010-15851 
          512          1259             0           338           352 
   2010-16864    2014-14432    2014-14429    2013-19220    2012-24374 
          694           106            69           944           855 
   2012-22062    2011-31624    2014-04254    2013-24388    2014-01523 
         1003          1050           737           545           150 
   2014-05323    2014-06141    2014-06612    2010-32960    2014-18682 
          402           406           385           206            81 
     2010-705    2010-14613    2011-14919    2011-15443     2011-5728 
          233           562           314           388           923 
    2011-4753     2011-3257     2011-2577     2011-9739     2011-1385 
          440           438           283           202           514 
   2014-23228    2014-24218    2014-25292    2014-25439    2012-12881 
         1110            92            80           428           171 
   2012-12882    2012-12883       E9-1719       E9-3113       E9-5802 
          121           135          1003           473           463 
     E9-16034      E9-15368       E9-1885       E9-1895       E9-3112 
           23           360           741           257           240 
      E9-3108       E9-8572       E9-2483       E9-2486       E9-2485 
           48           321           229            31           712 
     E9-26408      E9-30413      E9-27441      E9-24518       E9-4068 
          150            27           683          2429           235 
      E9-4103     2012-7019      E9-28805      E9-24203      E9-23915 
           24          2147           405           409            24 
   2012-22807    2013-06712    2013-03915     2012-2557    2013-12157 
          748           280          1310            90            65 
   2012-10884     2012-6797    2012-30310    2013-15782    2013-13523 
          523           501           771           544          1775 
   2011-26141    2013-07837    2012-31225    2010-31878    2013-19520 
          170           297            89           282           299 
   2014-09343    2014-12651    2010-12070     2010-9451    2012-20259 
           15           160           171           255           629 
   2012-17264     2012-3616    2013-12650    2013-11533    2011-21505 
          481           412            72           454           399 
   2011-23891    2012-12225    2012-15183    2018-27945    2017-23630 
          580           363           690            84           675 
   2017-27034    2018-04860    2018-08883    2018-05916    2018-05113 
          167           510           765           230           617 
   2018-11101    2018-00240    2017-23270    2017-27899    2018-07874 
          580            47            66           395           795 
   2018-15202    2018-13640    2018-15955    2018-15299    2019-24288 
          638           671           827           394            83 
   2019-26178    2019-05370    2019-16383    2018-02261    2018-00630 
          455           138           559           321           242 
   2018-08272    2018-11939    2018-13696    2019-10398    2020-17364 
          375           873           310           764           433 
   2020-17699    2020-17700    2020-07530    2020-27948    2021-01094 
          372           399          1446           752           145 
   2021-01228    2020-12030    2018-04414    2020-03556    2020-27740 
          224          1124           435            89           348 
   2019-07645    2019-21630    2019-09750    2019-12802    2019-13945 
          390           252          1070           632           767 
   2019-22849    2019-20804    2019-23525    2019-22623    2019-22624 
          931          1030           443           721          1002 
   2019-00615    2019-04595    2019-01426    2020-14337    2020-12584 
          147           143           382           523          1233 
   2020-22510    2020-29235    2020-22064    2020-24793    2020-28605 
          503           574          1163           746          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           289          1260           733           288 
   2017-13458    2017-13012    2017-02762    2017-10004    2017-15860 
           63           742           150          1205           448 
   2017-08586    2017-03113    2017-03115    2017-03116    2017-03118 
          232           543           213           112           234 
   2017-02450    2017-02451    2017-09156    2017-06716    2017-20647 
         1003           331           304           328           889 
   2017-21555    2017-21559    2017-09083    2017-08905    2017-08311 
          267           105           321           207           443 
   2017-06967    2017-06971    2017-04357    2017-04107    2017-02095 
          275           113           553           382           953 
   2017-02029    2017-01799    2017-06576    2017-06382    2020-00534 
          255           185           954            54           746 
   2020-02439    2020-27065    2020-06969    2020-06985    2020-10953 
          918           980           527           148           285 
   2020-07800    2020-03337    2020-09537    2020-19032    2020-21129 
          314           556           147           222           376 
   2021-00040    2020-13449    2017-14992    2017-05399    2017-02281 
          186           728            87           188          1043 
   2017-06968    2017-14378    2017-10003    2017-08818    2017-09161 
          283           447           321           452           108 
   2017-09087    2017-09574    2017-18468    2017-18134    2017-04837 
          783           231           279          1555          2376 
   2017-04353    2017-02102    2017-08990    2017-08908    2017-18679 
          170           763           180           350            62 
   2018-27515    2018-26552    2017-22677    2017-27925    2018-10855 
          673            84           498           574           555 
   2018-10403    2018-11335    2018-11913    2018-11916    2018-11936 
          445           237          1234          1346           247 
   2018-20816    2019-07656    2019-05934    2019-15159    2019-15449 
         1003           961           644           482           362 
   2019-10538    2019-27678    2019-08797    2019-04437    2019-13793 
          715            84          1177           707           609 
   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           570           266           197           774 
   2020-08846    2020-09536    2020-21160    2020-23115    2020-23116 
          118           355           632           451           892 
   2020-23780    2019-24040    2019-19367    2019-22749    2019-22073 
          904           600           268           306           856 
   2019-19895    2019-06325    2019-06548    2019-14016    2019-28286 
          302          1291           197           702           189 
   2019-27217    2019-13175    2019-00048    2020-12953    2019-02544 
          260           314           186           652          1143 
   2019-00014    2018-24254    2018-26156    2020-14077    2020-14509 
          921           467           467          1007           796 
   2020-14328    2020-18015    2020-15338    2020-15646    2020-20887 
           57           465           601          1031           347 
   2020-09645    2020-04755    2021-01643    2021-01644    2021-01645 
           80           214          1028           293           595 
   2021-01713    2021-01714    2021-01712    2020-14872    2020-08392 
           53          1281           158           894            84 
   2020-06478    2020-16625    2020-21914    2020-21534    2020-12430 
          274           274          2139          1574           492 
   2020-02438    2020-25459    2020-21960    2018-20203    2018-19514 
          521           559           488          1010           475 
   2018-09895    2018-00553    2017-28160    2019-17052    2019-21505 
          425           348           195           488           268 
   2019-04298    2018-17068    2018-15195    2020-09695    2020-06161 
          331          2501           166           966           236 
   2020-10993    2020-10315    2020-18012 
          159          1142          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.497194 0.010057
02-11166      -0.490565 0.009010
01-2851       -0.600350 0.006645
04-11991       0.018639 0.036186
03-12661       1.164749 0.457040
03-24217      -0.592536 0.008648
03-19573       0.665512 0.061849
03-20013      -0.016299 0.022486
03-29644      -0.066479 0.031133
04-1322        0.389624 0.088470
04-18575       0.896951 0.139475
04-20050      -0.434297 0.008210
04-20052      -0.409967 0.008615
03-32332       0.072122 0.086268
03-32328       5.448215 0.013104
04-6622       -0.272582 0.021817
04-12745      -0.603701 0.006848
04-13123       0.788090 0.222668
03-30913       1.566481 0.176971
03-30513      -0.366317 0.035708
03-7736       -0.228236 0.005586
03-5343       -0.323327 0.005918
03-8108        0.034936 0.088089
05-7830       -0.166762 0.064695
05-3385        0.632774 0.099978
04-28079      -0.521099 0.007997
04-10024      -0.520709 0.007862
05-13214       0.153259 0.036520
03-22543       0.271428 0.041050
03-13750       0.543493 0.357704
03-14116      -0.215975 0.040706
03-14117       0.119136 0.111082
08-970        -0.322646 0.011102
07-780         0.025972 0.069917
07-2027        0.411952 0.028085
07-2570       -0.604475 0.005798
08-1215        0.679676 0.072625
07-5919        0.815574 0.145525
E8-28912      -0.334152 0.018081
04-4884       -0.476768 0.009274
04-4436       -0.437100 0.015639
04-4451       -0.446455 0.010186
04-10377      -0.660644 0.004235
04-8616        0.800339 0.156248
05-12284       0.594999 0.344452
05-12354      -0.375115 0.023052
04-26684       0.000074 0.064164
04-26686       0.347287 0.064022
04-25866      -0.305566 0.028578
08-1480        0.607699 0.068455
07-4906       -0.528219 0.007067
07-4907        1.722074 0.100596
07-4023       -0.236500 0.031356
08-797        -0.226309 0.034904
08-1409       -0.241080 0.010755
07-4600       -0.269793 0.054381
07-5299       -0.493450 0.013682
E8-23235      -0.402186 0.023791
05-5097       -0.117175 0.036048
E9-811        -0.282625 0.029474
E9-814        -0.238027 0.031242
07-6022        1.564667 0.177520
07-1816        0.626521 0.114313
01-31671       0.083966 0.082452
01-31670      -0.014049 0.054582
07-5816       -0.287494 0.041911
01-4622       -0.293000 0.017044
01-6558        0.467446 0.117393
02-7087       -0.311921 0.019172
07-3656       -0.150286 0.020103
07-3593       -0.499467 0.009561
E8-27777      -0.379210 0.013358
E8-30042       1.502810 0.180625
E9-1574        0.013219 0.031342
E9-1538       -0.275119 0.031781
E9-818        -0.453378 0.010656
01-16668       0.097370 0.037987
02-1594        0.175925 0.086069
02-917         0.036808 0.070339
02-4071       -0.524769 0.009983
02-5069       -0.335401 0.018222
01-8835        0.737678 0.140049
01-8836        0.960091 0.328274
02-2638       -0.452280 0.009321
02-918        -0.191042 0.032684
01-29831       0.546117 0.167640
E8-30700       4.225294 0.032760
02-14497       0.226139 0.174641
02-31624      -0.382254 0.014525
02-16040      -0.478725 0.011576
02-16041      -0.447171 0.018296
01-28762      -0.558478 0.011812
01-29219      -0.098012 0.069837
01-27917       0.005648 0.019429
06-554        -0.309993 0.044857
06-4652       -0.217686 0.034335
07-293        -0.267314 0.017709
06-9993        0.796068 0.229043
06-9896        5.311220 0.015774
05-21571      -0.326475 0.014606
05-20944       0.188636 0.020794
02-21056      -0.240500 0.021331
03-464         5.602523 0.009786
03-11969      -0.373336 0.018077
03-12071       0.068804 0.074359
03-7313        3.578955 0.049610
03-10194      -0.378806 0.027874
01-14319      -0.391124 0.027658
01-15958      -0.531198 0.007349
01-24917      -0.625044 0.008106
01-24983      -0.604454 0.009398
02-17274      -0.633664 0.004280
06-4132       -0.474080 0.011630
06-4121       -0.010031 0.025969
06-9020        0.222133 0.041118
06-9619       -0.475970 0.009002
06-7220       -0.378520 0.012496
06-3865       -0.475147 0.009679
06-2362       -0.587284 0.007953
01-31959       0.535189 0.125654
01-9086       -0.326552 0.024816
01-26509      -0.550896 0.003459
01-26339      -0.628368 0.004665
01-30624       1.580210 0.172807
01-13381       0.142833 0.043834
03-2606       -0.511598 0.009530
03-1798       -0.523633 0.009114
03-8832       -0.134472 0.047105
03-19675      -0.144915 0.039901
07-3259        1.031501 0.450481
07-3258       -0.110428 0.098185
07-2367       -0.120148 0.044851
06-6101        0.733316 0.143817
05-20156       0.713350 0.306329
04-17636       0.200276 0.046922
04-15787      -0.051112 0.115867
03-5848        0.724970 0.099564
E8-24465      -0.341894 0.014788
05-9892       -0.334518 0.023559
07-2518       -0.005027 0.045857
E8-20436      -0.082361 0.077280
01-15758      -0.436128 0.011754
01-13869      -0.532356 0.009279
06-5592        0.449093 0.058923
01-21338       0.216914 0.060577
04-2773       -0.375309 0.008841
03-20764       1.056237 0.423340
03-31594       0.770834 0.230888
04-11592      -0.662700 0.004132
04-11271      -0.619919 0.005239
04-2408       -0.561758 0.008769
04-1941        2.003463 0.042855
01-3883       -0.437168 0.037722
01-2852       -0.639457 0.005856
04-10378      -0.258884 0.017489
04-20051      -0.375002 0.008561
03-05344      -0.555123 0.005552
03-6445       -0.251851 0.023117
03-8109        0.144233 0.098731
03-12766      -0.538634 0.010240
06-7492       -0.449205 0.010715
05-19993      -0.574614 0.006143
05-22132      -0.525774 0.010307
05-22133      -0.567568 0.008553
07-3112       -0.454539 0.010765
01-25788      -0.500302 0.040220
03-2069       -0.352025 0.012864
03-19572      -0.452658 0.026354
04-17150      -0.426883 0.013292
04-17205       0.260884 0.041836
04-17204      -0.548574 0.026553
04-20049      -0.375295 0.012561
04-19909      -0.552005 0.010154
04-24098      -0.330640 0.014753
03-19676       0.049397 0.036386
06-5828       -0.261814 0.024553
06-5829       -0.481209 0.008678
06-8769        0.261678 0.045840
07-374        -0.520036 0.005123
06-5984        0.539521 0.317366
05-23412       0.809748 0.083389
05-24596       5.275272 0.017266
05-24597      -0.269173 0.027762
05-24255      -0.356088 0.009458
06-5351       -0.499998 0.011776
06-4085        0.168483 0.040402
06-4552       -0.462703 0.009442
06-9770       -0.618618 0.019041
06-9148       -0.499063 0.024836
03-7160        0.585943 0.101061
07-3835        0.648491 0.070797
01-4624       -0.144052 0.074799
01-17041       1.157475 0.348657
01-13117      -0.573973 0.009967
01-13116      -0.389175 0.016138
02-16951       0.483050 0.099113
02-17273      -0.093822 0.069688
02-22526       0.070484 0.067447
01-4621       -0.030509 0.020619
01-4623       -0.262695 0.049370
01-29948      -0.455526 0.010062
02-07086      -0.526756 0.008861
02-07085      -0.316516 0.033017
01-31119      -0.240046 0.079218
03-11713       0.720791 0.146285
02-25900      -0.185915 0.038128
02-32518       1.748002 0.115149
03-10606       1.661825 0.070803
06-1316        0.048801 0.029785
01-19562      -0.309087 0.030232
01-24205      -0.042526 0.022718
01-25677      -0.517832 0.004690
01-25344      -0.532343 0.007141
03-16102      -0.212695 0.033850
04-23994      -0.537322 0.015411
01-11210      -0.114672 0.110564
01-11505      -0.490147 0.010525
02-29580      -0.266898 0.019053
02-29832      -0.204126 0.022476
02-31831      -0.398100 0.008468
04-15933      -0.331912 0.016046
04-15934      -0.131001 0.030711
03-24919      -0.586434 0.006997
05-13098      -0.191033 0.018142
05-1886       -0.544392 0.011070
04-28404      -0.006465 0.073151
04-22212       0.285820 0.072126
05-306         5.254982 0.017723
05-771        -0.477168 0.011087
04-26685      -0.030961 0.039850
04-27076       0.245819 0.023873
04-21411       0.269993 0.085171
05-14452      -0.049116 0.074610
08-658        -0.554475 0.006741
05-7831       -0.137151 0.070768
05-1170       -0.099992 0.052471
05-5434        1.903551 0.062625
E8-24342       0.371815 0.110491
03-13694       0.155716 0.036748
03-13412       0.191947 0.049122
08-761         0.397046 0.056403
06-9561        0.649935 0.273415
07-419        -0.061631 0.135314
06-9895       -0.563726 0.007435
05-15160       0.284496 0.136214
02-9536        1.290982 0.041661
02-919        -0.150731 0.067850
02-3337       -0.412732 0.060589
02-3826       -0.652364 0.004668
01-14862      -0.489309 0.031414
08-62          5.178966 0.019499
08-325        -0.412478 0.012439
08-360        -0.413956 0.008507
E8-29564       0.060991 0.061315
01-31665       0.009598 0.088899
01-31667      -0.288800 0.034330
01-31668      -0.595563 0.011081
01-31669      -0.503648 0.019337
01-31672       0.037287 0.064717
08-1182       -0.090594 0.084915
02-17640      -0.362533 0.014665
01-23359      -0.012299 0.034437
02-24252      -0.565268 0.007227
04-3170       -0.416894 0.008983
02-31832      -0.612094 0.006841
01-26990       0.051530 0.139688
02-448         5.075689 0.022110
06-9632        1.076059 0.166044
05-6907       -0.380361 0.038973
07-5270        0.440645 0.053401
E8-17940      -0.401026 0.003840
08-1472        1.740471 0.105429
E8-26531       0.209243 0.061788
07-4115       -0.632790 0.007127
E8-27771       0.040775 0.076560
E8-23125       0.081415 0.042921
08-568        -0.284391 0.033878
08-483        -0.192431 0.023127
04-5322        5.275897 0.017394
E8-21651      -0.127023 0.031743
07-1704       -0.387895 0.040929
07-2462       -0.451696 0.010184
07-1137       -0.500181 0.007897
07-1152       -0.214543 0.056675
08-1348       -0.151040 0.028799
07-4890       -0.518450 0.008476
04-11058       0.236148 0.033653
07-3552        0.343851 0.052696
08-1399        0.447425 0.071564
07-5726       -0.425069 0.009001
01-31666      -0.407762 0.024520
2015-03714    -0.506688 0.005424
2015-07788    -0.045992 0.024455
2015-07016    -0.587450 0.002208
2015-05677     0.377646 0.045379
2015-18292    -0.341889 0.016812
2015-19183    -0.644786 0.003824
2010-9078     -0.359318 0.017808
2010-10172    -0.406836 0.015048
2010-7154     -0.274649 0.017521
2010-11557    -0.332206 0.023705
2010-9796     -0.609345 0.006133
2015-16334    -0.421679 0.015793
2011-19156     0.323516 0.047792
2015-20801    -0.451991 0.011302
2015-22888    -0.142930 0.047358
2010-4884     -0.255557 0.025287
2010-1229     -0.186110 0.049025
2010-38       -0.526320 0.009826
2010-12805    -0.512041 0.009164
2010-3725     -0.429923 0.014622
2011-30990    -0.569612 0.012668
2010-24839     0.471907 0.049304
2011-26574     0.335715 0.089460
2011-12645     0.688804 0.076465
2011-29683    -0.432151 0.011503
2011-17953    -0.449257 0.014800
2011-17447    -0.539490 0.009252
2014-11442    -0.014896 0.024037
2014-06768     0.905724 0.131669
2014-08426    -0.190507 0.025140
2012-22030    -0.652609 0.004659
2011-32486     1.741846 0.105953
2014-03805     0.002586 0.024088
2013-05967     0.188358 0.033828
2014-22805    -0.620228 0.003373
2013-31445     5.166101 0.019985
2014-18561    -0.215983 0.010019
2014-17522     0.091686 0.068802
2010-29579    -0.410708 0.007868
2012-1568     -0.582176 0.005554
E9-11547      -0.696356 0.002457
E9-26834      -0.377050 0.019427
E9-23886      -0.630435 0.009575
E9-29781      -0.416216 0.008444
2012-7636     -0.596525 0.004401
2013-08501    -0.343380 0.035894
2011-21704    -0.524848 0.007415
2011-26729    -0.522310 0.005234
2013-15942    -0.655912 0.004216
2013-16387    -0.599139 0.005704
2012-31574    -0.487341 0.023572
2012-30060    -0.529381 0.007369
2012-30170    -0.422689 0.024856
2013-00002     5.148608 0.020255
2013-28581     0.837069 0.146776
2014-07895     0.138056 0.034066
2011-15181    -0.528277 0.007089
2010-18169    -0.610394 0.003685
2010-8878      0.295203 0.042785
2010-21016    -0.411203 0.006765
2010-21020    -0.305495 0.026429
2013-17478    -0.671081 0.003802
2014-03474    -0.220498 0.059539
2014-16360    -0.072869 0.025230
2011-18065    -0.648631 0.005237
2010-28854    -0.473156 0.011023
E9-1893       -0.263479 0.012835
E9-2893       -0.466753 0.008464
E9-1712        0.287453 0.044767
E9-28493      -0.381114 0.008519
E9-30020       1.699072 0.118879
E9-2484        0.136808 0.029875
E9-3106       -0.478488 0.032019
2014-18998    -0.655530 0.005121
2014-30195    -0.518227 0.011099
2014-29625    -0.450323 0.013974
2010-22002     0.329727 0.044338
2014-29121     1.048970 0.187054
2014-30323     0.323861 0.048306
2014-30363     5.182112 0.019590
2014-24851     0.637686 0.112429
2016-30272    -0.306105 0.025972
2016-30101    -0.065802 0.056220
2016-31792    -0.053184 0.047776
2016-31922    -0.140661 0.026705
2016-30277    -0.657038 0.003026
2017-01623    -0.247333 0.006807
2017-01169    -0.465857 0.007248
2015-29403     0.210234 0.071681
2016-29519    -0.662568 0.002732
2017-01487     0.090080 0.067238
2017-01197    -0.258257 0.019134
2011-5903     -0.024336 0.066962
2011-8642     -0.551367 0.015368
2011-28728    -0.465414 0.009457
2011-33087     2.892790 0.011417
2010-27004    -0.663554 0.003220
2010-28365     0.144035 0.074479
2010-28360    -0.327964 0.013658
2011-13173     0.840872 0.077207
2010-25578    -0.682939 0.002860
E9-5441       -0.550247 0.011187
E9-31098       4.454177 0.031465
E9-28022      -0.466973 0.009374
E9-25268      -0.605344 0.004504
2016-06250    -0.549602 0.005633
2016-07703    -0.188991 0.031021
2016-08713     0.377132 0.131866
2016-03141    -0.571990 0.006230
2015-02379    -0.524463 0.005946
2015-01522    -0.720238 0.003121
2015-01255    -0.445041 0.009027
2016-26753     0.701493 0.235170
2015-30191     0.266094 0.041566
2016-03038    -0.578212 0.004826
2016-24066    -0.314619 0.011303
2016-24847     0.093022 0.050413
2016-22962     1.741351 0.102836
2016-28203    -0.617466 0.004244
2016-29165    -0.203665 0.020922
2016-11300    -0.467255 0.008982
2016-12579     1.741351 0.102836
2016-15542    -0.620784 0.004802
2012-9473     -0.595781 0.006844
2012-10715    -0.386173 0.008144
2012-10968    -0.512218 0.007224
2012-5366     -0.505696 0.009054
2012-27002    -0.620833 0.005072
2013-08626     4.442703 0.031727
2012-10034    -0.059261 0.022401
2012-18868    -0.635339 0.003078
2012-3097      0.567795 0.054228
2012-11798    -0.414712 0.011498
2012-12889    -0.117890 0.044001
2012-19055     0.146549 0.021762
2012-17022    -0.548301 0.004651
2012-18237     0.076448 0.035333
2012-25236     0.289410 0.025899
2012-15954     0.117064 0.038932
2016-31875     4.786980 0.027656
2016-27156    -0.704518 0.002944
2016-22454    -0.142993 0.041522
2016-27171    -0.609725 0.003680
2017-01489    -0.379787 0.021449
2015-32582     5.182112 0.019590
2017-01164    -0.027667 0.037376
2017-01168    -0.092914 0.051081
2016-29169    -0.200392 0.023658
2015-13055     0.319042 0.096314
2015-19209    -0.684057 0.003293
2016-17945    -0.280949 0.021775
2016-18872    -0.626469 0.008927
2015-17926     1.143189 0.166450
2015-15828    -0.340182 0.049831
2015-16122    -0.543169 0.005893
2016-25288    -0.087552 0.029082
2016-25290    -0.692579 0.002787
2016-20713     0.108111 0.072201
2015-29498     1.044499 0.140062
2016-02475    -0.469809 0.006943
2015-31749     1.486284 0.144792
2015-00058     0.589913 0.066997
2016-06355     0.182674 0.032593
2016-09483     0.052942 0.028049
2016-09346    -0.442019 0.010467
2016-04770    -0.222181 0.030419
2015-23630    -0.512875 0.008269
2015-15495     1.741351 0.102836
2015-25744    -0.143403 0.033272
2015-22998    -0.031392 0.020195
2015-25489    -0.626827 0.005849
2016-01325     0.389642 0.033463
2015-32060    -0.410778 0.007249
2016-12307    -0.604311 0.003929
2016-12155    -0.532639 0.006587
2016-16295    -0.434185 0.008375
2016-19723    -0.079181 0.044625
2016-19724    -0.123548 0.040234
2016-19725    -0.376198 0.021498
2010-22279     1.741846 0.105953
2011-10910     0.461721 0.059988
2011-10732    -0.439742 0.010265
2010-33169    -0.176248 0.013625
2011-30463     0.159527 0.028864
2011-33335    -0.475159 0.016885
2010-2419     -0.447520 0.009629
2010-5837     -0.531232 0.007412
E9-31418      -0.253537 0.004618
C1-2009-31418  0.157178 0.169750
2010-4593     -0.631340 0.004738
2013-26785    -0.685619 0.002501
2011-33089    -0.508299 0.009161
2010-15851    -0.481000 0.009694
2010-16864    -0.415488 0.008641
2014-14432     1.181365 0.165398
2014-14429     1.707437 0.108911
2013-19220    -0.579901 0.004280
2012-24374    -0.337717 0.009856
2012-22062    -0.480466 0.005741
2011-31624    -0.633441 0.003314
2014-04254    -0.505973 0.006263
2013-24388    -0.587324 0.005287
2014-01523    -0.279928 0.027651
2014-05323     0.471471 0.058450
2014-06141     0.503254 0.060239
2014-06612     0.372435 0.053469
2010-32960     3.909873 0.031757
2014-18682    -0.220286 0.044302
2010-705      -0.297964 0.020187
2010-14613    -0.534131 0.006416
2011-14919    -0.600411 0.006777
2011-15443    -0.578506 0.006569
2011-5728     -0.294230 0.010375
2011-4753      0.421346 0.053372
2011-3257     -0.541449 0.007432
2011-2577     -0.490542 0.010757
2011-9739      0.455030 0.080660
2011-1385     -0.479434 0.008107
2014-23228    -0.683045 0.002701
2014-24218     0.586442 0.139621
2014-25292    -0.330805 0.032912
2014-25439    -0.364251 0.012688
2012-12881    -0.307214 0.023165
2012-12882    -0.302090 0.028053
2012-12883    -0.404287 0.019986
E9-1719        0.168551 0.025183
E9-3113       -0.393000 0.010942
E9-5802       -0.551122 0.006679
E9-16034       1.333286 0.323266
E9-15368      -0.544272 0.007716
E9-1885       -0.299024 0.011555
E9-1895       -0.462626 0.012141
E9-3112       -0.448362 0.013453
E9-3108       -0.481460 0.025488
E9-8572       -0.513355 0.009034
E9-2483       -0.078447 0.034918
E9-2486       -0.302771 0.061702
E9-2485       -0.053918 0.020040
E9-26408      -0.181509 0.034777
E9-30413       0.443657 0.213561
E9-27441      -0.428499 0.008131
E9-24518      -0.602272 0.002410
E9-4068       -0.594904 0.008031
E9-4103       -0.542672 0.030581
2012-7019     -0.410160 0.004878
E9-28805      -0.498061 0.008578
E9-24203      -0.330502 0.014571
E9-23915      -0.531969 0.031046
2012-22807    -0.696461 0.003141
2013-06712    -0.159923 0.026212
2013-03915    -0.602064 0.003247
2012-2557      0.241204 0.094009
2013-12157     1.735770 0.105671
2012-10884     0.341280 0.044412
2012-6797     -0.638650 0.004661
2012-30310    -0.630275 0.003890
2013-15782    -0.503274 0.007213
2013-13523     0.199462 0.019717
2011-26141    -0.612259 0.008635
2013-07837    -0.404771 0.013560
2012-31225     1.045403 0.186884
2010-31878    -0.511802 0.009844
2013-19520     0.437400 0.068906
2014-09343    -0.041721 0.135912
2014-12651     0.188972 0.064638
2010-12070    -0.306523 0.023207
2010-9451     -0.402454 0.015038
2012-20259    -0.613945 0.004504
2012-17264     0.196258 0.037566
2012-3616     -0.547183 0.007134
2013-12650    -0.195766 0.047595
2013-11533    -0.530307 0.007259
2011-21505     0.561647 0.064642
2011-23891    -0.570360 0.005532
2012-12225     0.626872 0.071244
2012-15183    -0.620815 0.004228
2018-27945     1.027894 0.192014
2017-23630    -0.348243 0.010383
2017-27034    -0.123517 0.038578
2018-04860     1.509976 0.059992
2018-08883    -0.069515 0.018969
2018-05916     0.573789 0.085907
2018-05113    -0.538289 0.006120
2018-11101    -0.552649 0.005844
2018-00240    -0.297325 0.048086
2017-23270     0.040130 0.081630
2017-27899    -0.621187 0.005666
2018-07874    -0.474304 0.006606
2018-15202     0.457752 0.046276
2018-13640    -0.595272 0.004766
2018-15955    -0.568981 0.004693
2018-15299    -0.393316 0.012011
2019-24288     0.131222 0.086448
2019-26178    -0.601861 0.005724
2019-05370    -0.081058 0.043921
2019-16383     0.054802 0.028421
2018-02261    -0.405041 0.013101
2018-00630    -0.257195 0.021956
2018-08272    -0.475980 0.009598
2018-11939    -0.155002 0.015093
2018-13696    -0.113441 0.027423
2019-10398    -0.591419 0.004572
2020-17364    -0.452283 0.009661
2020-17699    -0.156124 0.023457
2020-17700    -0.123747 0.024047
2020-07530    -0.475756 0.004931
2020-27948    -0.398874 0.008573
2021-01094    -0.377605 0.020851
2021-01228     0.318983 0.067553
2020-12030    -0.368110 0.007842
2018-04414    -0.523426 0.007596
2020-03556    -0.440473 0.022353
2020-27740    -0.282745 0.017715
2019-07645    -0.315493 0.014912
2019-21630    -0.650218 0.006214
2019-09750    -0.591094 0.003832
2019-12802    -0.546981 0.005889
2019-13945    -0.337248 0.010148
2019-22849     0.131902 0.024757
2019-20804    -0.694777 0.002753
2019-23525    -0.606358 0.005639
2019-22623    -0.196194 0.014982
2019-22624    -0.093540 0.016025
2019-00615     0.353318 0.086350
2019-04595    -0.137936 0.038562
2019-01426    -0.447475 0.010741
2020-14337    -0.419489 0.009670
2020-12584    -0.487306 0.005023
2020-22510    -0.487481 0.008155
2020-29235    -0.470621 0.007993
2020-22064    -0.563182 0.004048
2020-24793    -0.501244 0.006368
2020-28605    -0.469941 0.005840
2020-28606    -0.448384 0.011335
2020-16623    -0.170976 0.027439
2020-16624    -0.224642 0.027627
2021-01635    -0.143436 0.018479
2021-01646    -0.410087 0.009581
2021-01013    -0.612602 0.003810
2019-16879     0.205039 0.049323
2019-15222    -0.364264 0.007437
2019-09877     0.159522 0.028906
2017-15680    -0.536456 0.008925
2017-13458    -0.262418 0.044199
2017-13012    -0.564598 0.005044
2017-02762    -0.387017 0.020078
2017-10004    -0.537589 0.004296
2017-15860    -0.567093 0.006377
2017-08586    -0.186244 0.026639
2017-03113    -0.448080 0.008961
2017-03115    -0.541823 0.010849
2017-03116     0.100001 0.067031
2017-03118    -0.507308 0.010978
2017-02450     0.261799 0.028677
2017-02451    -0.253259 0.019115
2017-09156    -0.488626 0.010166
2017-06716    -0.450395 0.011190
2017-20647     0.216252 0.028613
2017-21555    -0.657321 0.005866
2017-21559    -0.345230 0.027327
2017-09083    -0.467134 0.010940
2017-08905    -0.381853 0.018199
2017-08311    -0.335796 0.013558
2017-06967    -0.234999 0.022767
2017-06971     0.078111 0.064320
2017-04357    -0.648536 0.004308
2017-04107    -0.426534 0.011051
2017-02095    -0.290078 0.010388
2017-02029    -0.525532 0.009873
2017-01799    -0.218244 0.028128
2017-06576    -0.486015 0.005753
2017-06382    -0.015431 0.083927
2020-00534     0.045375 0.023701
2020-02439    -0.274720 0.011107
2020-27065    -0.493968 0.005592
2020-06969    -0.319515 0.012568
2020-06985    -0.083992 0.041408
2020-10953    -0.436620 0.012484
2020-07800    -0.620400 0.006406
2020-03337    -0.563607 0.006089
2020-09537    -0.492019 0.014682
2020-19032    -0.395778 0.016024
2020-21129    -0.061448 0.027753
2021-00040     5.182112 0.019590
2020-13449    -0.456409 0.007777
2017-14992     0.238035 0.097881
2017-05399    -0.385570 0.018219
2017-02281    -0.235804 0.011188
2017-06968    -0.493149 0.010402
2017-14378    -0.558097 0.006663
2017-10003    -0.367479 0.014489
2017-08818    -0.606091 0.005564
2017-09161    -0.505719 0.016807
2017-09087    -0.493138 0.006375
2017-09574    -0.250702 0.023807
2017-18468     0.502589 0.072507
2017-18134    -0.572708 0.003376
2017-04837    -0.254013 0.007084
2017-04353    -0.394452 0.018367
2017-02102    -0.251964 0.012794
2017-08990    -0.308879 0.023211
2017-08908    -0.471879 0.010016
2017-18679    -0.203768 0.052742
2018-27515    -0.605580 0.004553
2018-26552     0.721939 0.165254
2017-22677    -0.334403 0.013052
2017-27925     0.161251 0.032864
2018-10855    -0.413893 0.009482
2018-10403    -0.225056 0.017681
2018-11335     0.364607 0.068384
2018-11913    -0.265522 0.009669
2018-11916    -0.075393 0.014083
2018-11936    -0.190991 0.026174
2018-20816     0.523849 0.039622
2019-07656    -0.540399 0.004827
2019-05934    -0.440150 0.008216
2019-15159    -0.456946 0.009450
2019-15449    -0.107720 0.025380
2019-10538    -0.395738 0.008841
2019-27678     1.033400 0.192320
2019-08797    -0.160137 0.012481
2019-04437    -0.580033 0.004830
2019-13793     0.251398 0.036273
2020-27353    -0.571068 0.007090
2020-27807     1.032168 0.192252
2020-27739    -0.280743 0.024626
2020-27455    -0.634241 0.007528
2021-01469    -0.317248 0.019381
2021-01476    -0.652926 0.004050
2021-00305    -0.267034 0.014550
2020-17363    -0.328222 0.017793
2020-04730    -0.514729 0.011589
2020-11301    -0.361136 0.009597
2020-08846     0.165670 0.072670
2020-09536    -0.413841 0.012429
2020-21160     0.108298 0.029130
2020-23115    -0.630224 0.005191
2020-23116    -0.690090 0.003009
2020-23780     0.470821 0.038529
2019-24040    -0.481671 0.007711
2019-19367    -0.570387 0.008293
2019-22749    -0.217536 0.021866
2019-22073    -0.356679 0.009065
2019-19895     0.250476 0.051565
2019-06325    -0.619226 0.003204
2019-06548     4.912588 0.025243
2019-14016    -0.582031 0.004875
2019-28286     5.107478 0.021228
2019-27217    -0.203004 0.025700
2019-13175    -0.425179 0.012296
2019-00048     5.182112 0.019590
2020-12953     0.195741 0.032559
2019-02544    -0.596197 0.003580
2019-00014    -0.665383 0.003170
2018-24254     0.201796 0.038972
2018-26156     0.332451 0.046924
2020-14077    -0.469038 0.006001
2020-14509    -0.294358 0.011729
2020-14328    -0.193775 0.055045
2020-18015    -0.402189 0.011246
2020-15338    -0.644620 0.004187
2020-15646     0.143023 0.023934
2020-20887    -0.164357 0.023146
2020-09645    -0.080762 0.059536
2020-04755    -0.477419 0.012624
2021-01643    -0.458840 0.008331
2021-01644    -0.128940 0.026781
2021-01645    -0.033170 0.023281
2021-01713     0.341729 0.149849
2021-01714    -0.297028 0.008982
2021-01712    -0.215145 0.030923
2020-14872    -0.473624 0.006670
2020-08392    -0.505320 0.017910
2020-06478    -0.269433 0.020073
2020-16625    -0.030810 0.035224
2020-21914    -0.405374 0.005065
2020-21534    -0.205579 0.010170
2020-12430    -0.416281 0.010197
2020-02438    -0.564258 0.006107
2020-25459    -0.082474 0.022002
2020-21960    -0.235746 0.017856
2018-20203    -0.145580 0.014036
2018-19514    -0.312728 0.013868
2018-09895    -0.581639 0.006193
2018-00553    -0.498559 0.009203
2017-28160     4.715269 0.028766
2019-17052     0.395886 0.049596
2019-21505    -0.412368 0.013773
2019-04298    -0.337521 0.015294
2018-17068     0.121022 0.014752
2018-15195     0.458141 0.091507
2020-09695    -0.455069 0.006507
2020-06161    -0.327373 0.018657
2020-10993    -0.502141 0.013557
2020-10315    -0.557672 0.004257
2020-18012    -0.483845 0.004934

Estimated Feature Scores:
       purpos   health   human servic   carri respons public develop coordin
beta -0.13093 -0.03558 -1.9356 0.2297 -0.1624 -2.6650 0.2299 -5.2315  -7.644
psi   0.06837  0.27000 -0.7232 1.1645 -0.5206 -0.4871 0.6125 -0.7795  -2.426
     enhanc  physic    activ  sport particip   seek expand interest   awar
beta -4.336 -0.1473 -1.61439 -5.674  -2.1939 -1.291 -1.413 -0.01519 -3.688
psi  -2.013 -1.5421 -0.03761 -4.315  -0.8994 -1.773 -1.396  0.19105 -3.638
     benefit regular stimul coordi  among privat sector promot   safe   easi
beta -0.1968  -1.992 -2.677 -8.405 -3.388 -5.983 -6.487 -4.544 -3.503 -2.266
psi   0.2334  -2.406 -5.296 -3.073 -1.734 -2.376 -2.644 -1.556 -3.009 -5.869
      access    avail
beta -1.6050 -1.15780
psi  -0.4592 -0.09152
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.4971937504      Bush
2   -0.4905652440      Bush
3   -0.6003504070      Bush
4    0.0186394195      Bush
5    1.1647494639      Bush
6   -0.5925363955      Bush
7    0.6655116083      Bush
8   -0.0162990752      Bush
9   -0.0664788409      Bush
10   0.3896244856      Bush
11   0.8969512623      Bush
12  -0.4342973260      Bush
13  -0.4099665587      Bush
14   0.0721221134      Bush
15   5.4482148795      Bush
16  -0.2725817970      Bush
17  -0.6037014943      Bush
18   0.7880902962      Bush
19   1.5664812206      Bush
20  -0.3663169946      Bush
21  -0.2282357348      Bush
22  -0.3233266862      Bush
23   0.0349362532      Bush
24  -0.1667620667      Bush
25   0.6327736202      Bush
26  -0.5210986008      Bush
27  -0.5207087063      Bush
28   0.1532590519      Bush
29   0.2714281850      Bush
30   0.5434929916      Bush
31  -0.2159748840      Bush
32   0.1191362465      Bush
33  -0.3226458699      Bush
34   0.0259716827      Bush
35   0.4119524341      Bush
36  -0.6044749708      Bush
37   0.6796763617      Bush
38   0.8155740461      Bush
39  -0.3341518989      Bush
40  -0.4767683211      Bush
41  -0.4370997942      Bush
42  -0.4464547291      Bush
43  -0.6606436815      Bush
44   0.8003392063      Bush
45   0.5949989553      Bush
46  -0.3751151172      Bush
47   0.0000740022      Bush
48   0.3472870939      Bush
49  -0.3055657560      Bush
50   0.6076985473      Bush
51  -0.5282188226      Bush
52   1.7220740752      Bush
53  -0.2365000509      Bush
54  -0.2263090683      Bush
55  -0.2410799237      Bush
56  -0.2697933632      Bush
57  -0.4934501702      Bush
58  -0.4021863008      Bush
59  -0.1171747954      Bush
60  -0.2826249219      Bush
61  -0.2380270324      Bush
62   1.5646668381      Bush
63   0.6265208557      Bush
64   0.0839662201      Bush
65  -0.0140494512      Bush
66  -0.2874937112      Bush
67  -0.2930000800      Bush
68   0.4674463772      Bush
69  -0.3119209680      Bush
70  -0.1502860932      Bush
71  -0.4994668099      Bush
72  -0.3792104074      Bush
73   1.5028098299      Bush
74   0.0132188076      Bush
75  -0.2751194398      Bush
76  -0.4533782688      Bush
77   0.0973697931      Bush
78   0.1759245986      Bush
79   0.0368083366      Bush
80  -0.5247693781      Bush
81  -0.3354010959      Bush
82   0.7376782420      Bush
83   0.9600909593      Bush
84  -0.4522796349      Bush
85  -0.1910422646      Bush
86   0.5461171811      Bush
87   4.2252935203      Bush
88   0.2261390827      Bush
89  -0.3822543735      Bush
90  -0.4787249272      Bush
91  -0.4471705434      Bush
92  -0.5584775667      Bush
93  -0.0980122252      Bush
94   0.0056479714      Bush
95  -0.3099929637      Bush
96  -0.2176863574      Bush
97  -0.2673142723      Bush
98   0.7960679877      Bush
99   5.3112202610      Bush
100 -0.3264753989      Bush
101  0.1886355657      Bush
102 -0.2405003478      Bush
103  5.6025227463      Bush
104 -0.3733359124      Bush
105  0.0688035783      Bush
106  3.5789545478      Bush
107 -0.3788059734      Bush
108 -0.3911236994      Bush
109 -0.5311977297      Bush
110 -0.6250439916      Bush
111 -0.6044541301      Bush
112 -0.6336637164      Bush
113 -0.4740802146      Bush
114 -0.0100306121      Bush
115  0.2221328315      Bush
116 -0.4759700492      Bush
117 -0.3785197476      Bush
118 -0.4751472953      Bush
119 -0.5872840719      Bush
120  0.5351891392      Bush
121 -0.3265521768      Bush
122 -0.5508956418      Bush
123 -0.6283682381      Bush
124  1.5802097558      Bush
125  0.1428329159      Bush
126 -0.5115980061      Bush
127 -0.5236328239      Bush
128 -0.1344716545      Bush
129 -0.1449149595      Bush
130  1.0315005840      Bush
131 -0.1104282869      Bush
132 -0.1201477554      Bush
133  0.7333162768      Bush
134  0.7133498388      Bush
135  0.2002756855      Bush
136 -0.0511121514      Bush
137  0.7249700328      Bush
138 -0.3418937478      Bush
139 -0.3345176882      Bush
140 -0.0050265368      Bush
141 -0.0823607042      Bush
142 -0.4361281101      Bush
143 -0.5323559075      Bush
144  0.4490926469      Bush
145  0.2169135741      Bush
146 -0.3753085925      Bush
147  1.0562374876      Bush
148  0.7708341752      Bush
149 -0.6627003232      Bush
150 -0.6199188879      Bush
151 -0.5617583246      Bush
152  2.0034630886      Bush
153 -0.4371675890      Bush
154 -0.6394570663      Bush
155 -0.2588838905      Bush
156 -0.3750015780      Bush
157 -0.5551232570      Bush
158 -0.2518505387      Bush
159  0.1442327036      Bush
160 -0.5386340726      Bush
161 -0.4492049203      Bush
162 -0.5746137554      Bush
163 -0.5257743902      Bush
164 -0.5675675903      Bush
165 -0.4545394101      Bush
166 -0.5003018881      Bush
167 -0.3520251447      Bush
168 -0.4526584415      Bush
169 -0.4268829151      Bush
170  0.2608842727      Bush
171 -0.5485740542      Bush
172 -0.3752949050      Bush
173 -0.5520047532      Bush
174 -0.3306397539      Bush
175  0.0493967881      Bush
176 -0.2618137124      Bush
177 -0.4812089209      Bush
178  0.2616781555      Bush
179 -0.5200364686      Bush
180  0.5395212834      Bush
181  0.8097479580      Bush
182  5.2752723369      Bush
183 -0.2691725995      Bush
184 -0.3560884380      Bush
185 -0.4999979636      Bush
186  0.1684831613      Bush
187 -0.4627029777      Bush
188 -0.6186175716      Bush
189 -0.4990625546      Bush
190  0.5859429385      Bush
191  0.6484905945      Bush
192 -0.1440522275      Bush
193  1.1574753644      Bush
194 -0.5739731745      Bush
195 -0.3891749823      Bush
196  0.4830501289      Bush
197 -0.0938224132      Bush
198  0.0704843126      Bush
199 -0.0305088996      Bush
200 -0.2626946980      Bush
201 -0.4555264484      Bush
202 -0.5267557210      Bush
203 -0.3165162196      Bush
204 -0.2400456589      Bush
205  0.7207911514      Bush
206 -0.1859149799      Bush
207  1.7480023688      Bush
208  1.6618252813      Bush
209  0.0488010836      Bush
210 -0.3090868887      Bush
211 -0.0425260250      Bush
212 -0.5178323083      Bush
213 -0.5323428022      Bush
214 -0.2126951363      Bush
215 -0.5373218413      Bush
216 -0.1146716657      Bush
217 -0.4901471465      Bush
218 -0.2668983299      Bush
219 -0.2041257166      Bush
220 -0.3980996967      Bush
221 -0.3319115538      Bush
222 -0.1310010434      Bush
223 -0.5864339668      Bush
224 -0.1910328942      Bush
225 -0.5443921467      Bush
226 -0.0064651157      Bush
227  0.2858204451      Bush
228  5.2549821339      Bush
229 -0.4771679322      Bush
230 -0.0309607294      Bush
231  0.2458185748      Bush
232  0.2699932671      Bush
233 -0.0491158618      Bush
234 -0.5544746411      Bush
235 -0.1371514644      Bush
236 -0.0999924961      Bush
237  1.9035511684      Bush
238  0.3718149768      Bush
239  0.1557162511      Bush
240  0.1919474217      Bush
241  0.3970459764      Bush
242  0.6499345517      Bush
243 -0.0616309006      Bush
244 -0.5637257623      Bush
245  0.2844958964      Bush
246  1.2909820168      Bush
247 -0.1507305975      Bush
248 -0.4127320879      Bush
249 -0.6523643771      Bush
250 -0.4893093010      Bush
251  5.1789657143      Bush
252 -0.4124782012      Bush
253 -0.4139564112      Bush
254  0.0609912883      Bush
255  0.0095977330      Bush
256 -0.2888003559      Bush
257 -0.5955626870      Bush
258 -0.5036484501      Bush
259  0.0372866028      Bush
260 -0.0905944321      Bush
261 -0.3625327427      Bush
262 -0.0122985826      Bush
263 -0.5652677609      Bush
264 -0.4168944432      Bush
265 -0.6120936813      Bush
266  0.0515301993      Bush
267  5.0756891681      Bush
268  1.0760591101      Bush
269 -0.3803613705      Bush
270  0.4406447064      Bush
271 -0.4010256461      Bush
272  1.7404708082      Bush
273  0.2092429407      Bush
274 -0.6327901182      Bush
275  0.0407754503      Bush
276  0.0814146487      Bush
277 -0.2843911257      Bush
278 -0.1924305851      Bush
279  5.2758972265      Bush
280 -0.1270225053      Bush
281 -0.3878946174      Bush
282 -0.4516963715      Bush
283 -0.5001814159      Bush
284 -0.2145426416      Bush
285 -0.1510402872      Bush
286 -0.5184499467      Bush
287  0.2361475233      Bush
288  0.3438505365      Bush
289  0.4474248224      Bush
290 -0.4250692402      Bush
291 -0.4077615794      Bush
292 -0.5066884223     Obama
293 -0.0459916398     Obama
294 -0.5874495591     Obama
295  0.3776462666     Obama
296 -0.3418885513     Obama
297 -0.6447855350     Obama
298 -0.3593182500     Obama
299 -0.4068363957     Obama
300 -0.2746488942     Obama
301 -0.3322062955     Obama
302 -0.6093450794     Obama
303 -0.4216792132     Obama
304  0.3235163929     Obama
305 -0.4519910211     Obama
306 -0.1429304167     Obama
307 -0.2555571714     Obama
308 -0.1861095334     Obama
309 -0.5263203041     Obama
310 -0.5120408056     Obama
311 -0.4299226620     Obama
312 -0.5696124387     Obama
313  0.4719073716     Obama
314  0.3357152412     Obama
315  0.6888043437     Obama
316 -0.4321508170     Obama
317 -0.4492568181     Obama
318 -0.5394904738     Obama
319 -0.0148963569     Obama
320  0.9057242383     Obama
321 -0.1905071922     Obama
322 -0.6526087159     Obama
323  1.7418457002     Obama
324  0.0025856711     Obama
325  0.1883578869     Obama
326 -0.6202275428     Obama
327  5.1661007034     Obama
328 -0.2159833407     Obama
329  0.0916855905     Obama
330 -0.4107082337     Obama
331 -0.5821764641     Obama
332 -0.6963563921     Obama
333 -0.3770499040     Obama
334 -0.6304354017     Obama
335 -0.4162162635     Obama
336 -0.5965250025     Obama
337 -0.3433795864     Obama
338 -0.5248484703     Obama
339 -0.5223096350     Obama
340 -0.6559118137     Obama
341 -0.5991390534     Obama
342 -0.4873408400     Obama
343 -0.5293813130     Obama
344 -0.4226889702     Obama
345  5.1486082907     Obama
346  0.8370689046     Obama
347  0.1380557437     Obama
348 -0.5282769013     Obama
349 -0.6103943262     Obama
350  0.2952033676     Obama
351 -0.4112032564     Obama
352 -0.3054953152     Obama
353 -0.6710813411     Obama
354 -0.2204979850     Obama
355 -0.0728687226     Obama
356 -0.6486306078     Obama
357 -0.4731560449     Obama
358 -0.2634790811     Obama
359 -0.4667531811     Obama
360  0.2874525732     Obama
361 -0.3811144559     Obama
362  1.6990718091     Obama
363  0.1368075438     Obama
364 -0.4784881503     Obama
365 -0.6555299203     Obama
366 -0.5182274320     Obama
367 -0.4503230343     Obama
368  0.3297271764     Obama
369  1.0489701957     Obama
370  0.3238608041     Obama
371  5.1821116599     Obama
372  0.6376858828     Obama
373 -0.3061046700     Obama
374 -0.0658016622     Obama
375 -0.0531835032     Obama
376 -0.1406607483     Obama
377 -0.6570383639     Obama
378 -0.2473325798     Obama
379 -0.4658567196     Obama
380  0.2102337992     Obama
381 -0.6625676732     Obama
382  0.0900798905     Obama
383 -0.2582570830     Obama
384 -0.0243355510     Obama
385 -0.5513665107     Obama
386 -0.4654139406     Obama
387  2.8927903657     Obama
388 -0.6635537080     Obama
389  0.1440348029     Obama
390 -0.3279635753     Obama
391  0.8408717574     Obama
392 -0.6829386126     Obama
393 -0.5502474251     Obama
394  4.4541773930     Obama
395 -0.4669733884     Obama
396 -0.6053443636     Obama
397 -0.5496021579     Obama
398 -0.1889906811     Obama
399  0.3771321385     Obama
400 -0.5719900983     Obama
401 -0.5244631073     Obama
402 -0.7202382998     Obama
403 -0.4450410071     Obama
404  0.7014925464     Obama
405  0.2660938987     Obama
406 -0.5782117167     Obama
407 -0.3146193384     Obama
408  0.0930220020     Obama
409  1.7413510570     Obama
410 -0.6174655382     Obama
411 -0.2036653429     Obama
412 -0.4672549894     Obama
413  1.7413510570     Obama
414 -0.6207839392     Obama
415 -0.5957812537     Obama
416 -0.3861731584     Obama
417 -0.5122183150     Obama
418 -0.5056962412     Obama
419 -0.6208326782     Obama
420  4.4427032301     Obama
421 -0.0592614626     Obama
422 -0.6353392025     Obama
423  0.5677952699     Obama
424 -0.4147123695     Obama
425 -0.1178903584     Obama
426  0.1465490742     Obama
427 -0.5483007410     Obama
428  0.0764481502     Obama
429  0.2894104920     Obama
430  0.1170636047     Obama
431  4.7869795072     Obama
432 -0.7045183196     Obama
433 -0.1429930283     Obama
434 -0.6097253970     Obama
435 -0.3797873047     Obama
436  5.1821116599     Obama
437 -0.0276673913     Obama
438 -0.0929135980     Obama
439 -0.2003924422     Obama
440  0.3190416962     Obama
441 -0.6840572017     Obama
442 -0.2809491982     Obama
443 -0.6264693841     Obama
444  1.1431892141     Obama
445 -0.3401823138     Obama
446 -0.5431687525     Obama
447 -0.0875515486     Obama
448 -0.6925791882     Obama
449  0.1081114998     Obama
450  1.0444988683     Obama
451 -0.4698089878     Obama
452  1.4862835003     Obama
453  0.5899128051     Obama
454  0.1826741055     Obama
455  0.0529420134     Obama
456 -0.4420187153     Obama
457 -0.2221806791     Obama
458 -0.5128752177     Obama
459  1.7413510570     Obama
460 -0.1434030189     Obama
461 -0.0313918997     Obama
462 -0.6268273757     Obama
463  0.3896421064     Obama
464 -0.4107779161     Obama
465 -0.6043105295     Obama
466 -0.5326389163     Obama
467 -0.4341851878     Obama
468 -0.0791810161     Obama
469 -0.1235475737     Obama
470 -0.3761980046     Obama
471  1.7418457002     Obama
472  0.4617209133     Obama
473 -0.4397423309     Obama
474 -0.1762479423     Obama
475  0.1595271332     Obama
476 -0.4751586984     Obama
477 -0.4475196305     Obama
478 -0.5312321952     Obama
479 -0.2535365772     Obama
480  0.1571783338     Obama
481 -0.6313404421     Obama
482 -0.6856192410     Obama
483 -0.5082987437     Obama
484 -0.4809998267     Obama
485 -0.4154883980     Obama
486  1.1813653387     Obama
487  1.7074366567     Obama
488 -0.5799010382     Obama
489 -0.3377169494     Obama
490 -0.4804662237     Obama
491 -0.6334406855     Obama
492 -0.5059733084     Obama
493 -0.5873244649     Obama
494 -0.2799282581     Obama
495  0.4714711632     Obama
496  0.5032544982     Obama
497  0.3724347995     Obama
498  3.9098727583     Obama
499 -0.2202858287     Obama
500 -0.2979640545     Obama
501 -0.5341312286     Obama
502 -0.6004112512     Obama
503 -0.5785055545     Obama
504 -0.2942296284     Obama
505  0.4213457039     Obama
506 -0.5414494722     Obama
507 -0.4905417006     Obama
508  0.4550296616     Obama
509 -0.4794340459     Obama
510 -0.6830448543     Obama
511  0.5864420522     Obama
512 -0.3308053561     Obama
513 -0.3642514562     Obama
514 -0.3072139543     Obama
515 -0.3020897349     Obama
516 -0.4042873735     Obama
517  0.1685510836     Obama
518 -0.3930003077     Obama
519 -0.5511215595     Obama
520  1.3332855798     Obama
521 -0.5442718540     Obama
522 -0.2990241466     Obama
523 -0.4626256252     Obama
524 -0.4483623142     Obama
525 -0.4814597315     Obama
526 -0.5133546128     Obama
527 -0.0784465816     Obama
528 -0.3027713073     Obama
529 -0.0539182653     Obama
530 -0.1815086233     Obama
531  0.4436574437     Obama
532 -0.4284989178     Obama
533 -0.6022717859     Obama
534 -0.5949043254     Obama
535 -0.5426717176     Obama
536 -0.4101601840     Obama
537 -0.4980606195     Obama
538 -0.3305020698     Obama
539 -0.5319692514     Obama
540 -0.6964607711     Obama
541 -0.1599233143     Obama
542 -0.6020643135     Obama
543  0.2412041808     Obama
544  1.7357695993     Obama
545  0.3412803106     Obama
546 -0.6386503800     Obama
547 -0.6302747414     Obama
548 -0.5032743514     Obama
549  0.1994623981     Obama
550 -0.6122591992     Obama
551 -0.4047714319     Obama
552  1.0454028910     Obama
553 -0.5118015084     Obama
554  0.4373998639     Obama
555 -0.0417205455     Obama
556  0.1889722105     Obama
557 -0.3065232460     Obama
558 -0.4024544127     Obama
559 -0.6139448188     Obama
560  0.1962580150     Obama
561 -0.5471831336     Obama
562 -0.1957663544     Obama
563 -0.5303065207     Obama
564  0.5616467178     Obama
565 -0.5703595807     Obama
566  0.6268719360     Obama
567 -0.6208152511     Obama
568  1.0278940259     Trump
569 -0.3482430845     Trump
570 -0.1235165948     Trump
571  1.5099759772     Trump
572 -0.0695154548     Trump
573  0.5737893641     Trump
574 -0.5382891214     Trump
575 -0.5526486939     Trump
576 -0.2973245882     Trump
577  0.0401296209     Trump
578 -0.6211870081     Trump
579 -0.4743043974     Trump
580  0.4577517601     Trump
581 -0.5952723547     Trump
582 -0.5689808424     Trump
583 -0.3933156736     Trump
584  0.1312223860     Trump
585 -0.6018612418     Trump
586 -0.0810584578     Trump
587  0.0548020456     Trump
588 -0.4050414994     Trump
589 -0.2571947840     Trump
590 -0.4759798473     Trump
591 -0.1550015973     Trump
592 -0.1134409422     Trump
593 -0.5914187075     Trump
594 -0.4522830981     Trump
595 -0.1561243320     Trump
596 -0.1237469812     Trump
597 -0.4757556242     Trump
598 -0.3988742952     Trump
599 -0.3776054792     Trump
600  0.3189825837     Trump
601 -0.3681099119     Trump
602 -0.5234261412     Trump
603 -0.4404732714     Trump
604 -0.2827453784     Trump
605 -0.3154930402     Trump
606 -0.6502175256     Trump
607 -0.5910939920     Trump
608 -0.5469809496     Trump
609 -0.3372476785     Trump
610  0.1319024122     Trump
611 -0.6947774057     Trump
612 -0.6063579439     Trump
613 -0.1961939865     Trump
614 -0.0935398337     Trump
615  0.3533180457     Trump
616 -0.1379358919     Trump
617 -0.4474748036     Trump
618 -0.4194889775     Trump
619 -0.4873064366     Trump
620 -0.4874808690     Trump
621 -0.4706213657     Trump
622 -0.5631824197     Trump
623 -0.5012441894     Trump
624 -0.4699407115     Trump
625 -0.4483838729     Trump
626 -0.1709756508     Trump
627 -0.2246422773     Trump
628 -0.1434355146     Trump
629 -0.4100871889     Trump
630 -0.6126017434     Trump
631  0.2050393777     Trump
632 -0.3642642073     Trump
633  0.1595215044     Trump
634 -0.5364562891     Trump
635 -0.2624177933     Trump
636 -0.5645982023     Trump
637 -0.3870173772     Trump
638 -0.5375887165     Trump
639 -0.5670930264     Trump
640 -0.1862437807     Trump
641 -0.4480798208     Trump
642 -0.5418229089     Trump
643  0.1000010623     Trump
644 -0.5073081388     Trump
645  0.2617987966     Trump
646 -0.2532590702     Trump
647 -0.4886258865     Trump
648 -0.4503947551     Trump
649  0.2162517733     Trump
650 -0.6573213861     Trump
651 -0.3452296552     Trump
652 -0.4671343729     Trump
653 -0.3818532920     Trump
654 -0.3357955356     Trump
655 -0.2349985248     Trump
656  0.0781105895     Trump
657 -0.6485359139     Trump
658 -0.4265338272     Trump
659 -0.2900775060     Trump
660 -0.5255321946     Trump
661 -0.2182441763     Trump
662 -0.4860149362     Trump
663 -0.0154309611     Trump
664  0.0453753741     Trump
665 -0.2747200695     Trump
666 -0.4939679661     Trump
667 -0.3195147664     Trump
668 -0.0839915400     Trump
669 -0.4366199061     Trump
670 -0.6204003427     Trump
671 -0.5636070394     Trump
672 -0.4920190128     Trump
673 -0.3957780346     Trump
674 -0.0614477399     Trump
675  5.1821116599     Trump
676 -0.4564090916     Trump
677  0.2380345337     Trump
678 -0.3855697140     Trump
679 -0.2358040119     Trump
680 -0.4931491769     Trump
681 -0.5580967587     Trump
682 -0.3674787724     Trump
683 -0.6060910700     Trump
684 -0.5057189061     Trump
685 -0.4931384826     Trump
686 -0.2507022589     Trump
687  0.5025888298     Trump
688 -0.5727082878     Trump
689 -0.2540125555     Trump
690 -0.3944518733     Trump
691 -0.2519636634     Trump
692 -0.3088793791     Trump
693 -0.4718792679     Trump
694 -0.2037675688     Trump
695 -0.6055802342     Trump
696  0.7219394772     Trump
697 -0.3344032334     Trump
698  0.1612508033     Trump
699 -0.4138930328     Trump
700 -0.2250560394     Trump
701  0.3646065494     Trump
702 -0.2655223303     Trump
703 -0.0753930841     Trump
704 -0.1909910700     Trump
705  0.5238491619     Trump
706 -0.5403989963     Trump
707 -0.4401502549     Trump
708 -0.4569461009     Trump
709 -0.1077198483     Trump
710 -0.3957376563     Trump
711  1.0333999606     Trump
712 -0.1601367238     Trump
713 -0.5800325043     Trump
714  0.2513978981     Trump
715 -0.5710677681     Trump
716  1.0321679440     Trump
717 -0.2807425402     Trump
718 -0.6342414442     Trump
719 -0.3172482599     Trump
720 -0.6529259152     Trump
721 -0.2670339448     Trump
722 -0.3282223739     Trump
723 -0.5147285484     Trump
724 -0.3611362326     Trump
725  0.1656702287     Trump
726 -0.4138411442     Trump
727  0.1082978148     Trump
728 -0.6302243284     Trump
729 -0.6900895721     Trump
730  0.4708207762     Trump
731 -0.4816705254     Trump
732 -0.5703874677     Trump
733 -0.2175360347     Trump
734 -0.3566789218     Trump
735  0.2504759087     Trump
736 -0.6192256055     Trump
737  4.9125880874     Trump
738 -0.5820311260     Trump
739  5.1074783992     Trump
740 -0.2030041150     Trump
741 -0.4251793947     Trump
742  5.1821116599     Trump
743  0.1957409500     Trump
744 -0.5961969123     Trump
745 -0.6653831028     Trump
746  0.2017958144     Trump
747  0.3324513556     Trump
748 -0.4690381480     Trump
749 -0.2943584019     Trump
750 -0.1937746801     Trump
751 -0.4021885832     Trump
752 -0.6446196018     Trump
753  0.1430228172     Trump
754 -0.1643571483     Trump
755 -0.0807623314     Trump
756 -0.4774194940     Trump
757 -0.4588401080     Trump
758 -0.1289403273     Trump
759 -0.0331700513     Trump
760  0.3417289706     Trump
761 -0.2970283853     Trump
762 -0.2151448270     Trump
763 -0.4736241364     Trump
764 -0.5053202939     Trump
765 -0.2694325060     Trump
766 -0.0308103746     Trump
767 -0.4053741164     Trump
768 -0.2055792892     Trump
769 -0.4162811730     Trump
770 -0.5642576676     Trump
771 -0.0824736581     Trump
772 -0.2357461054     Trump
773 -0.1455795134     Trump
774 -0.3127284035     Trump
775 -0.5816391747     Trump
776 -0.4985590835     Trump
777  4.7152689251     Trump
778  0.3958862390     Trump
779 -0.4123680764     Trump
780 -0.3375206631     Trump
781  0.1210219125     Trump
782  0.4581408048     Trump
783 -0.4550694899     Trump
784 -0.3273728357     Trump
785 -0.5021412293     Trump
786 -0.5576720016     Trump
787 -0.4838450599     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, 130,775 features (99.74% sparse) and 1 docvar.
          features
docs       purpos_health health_human human_servic servic_carri carri_respons
  02-14807             1            2            2            1             1
  02-11166             0            4            4            0             0
  01-2851              0            3            3            0             1
  04-11991             0            1            1            0             0
  03-12661             0            0            0            0             0
  03-24217             0            2            2            0             0
          features
docs       respons_public public_health servic_develop develop_coordin
  02-14807              1             1              1               1
  02-11166              0             0              0               0
  01-2851               0             0              0               1
  04-11991              0             0              0               0
  03-12661              0             0              0               0
  03-24217              0             0              0               0
          features
docs       coordin_enhanc
  02-14807              1
  02-11166              0
  01-2851               0
  04-11991              0
  03-12661              0
  03-24217              0
[ reached max_ndoc ... 782 more documents, reached max_nfeat ... 130,765 more features ]
quanteda::ntoken(dfmat_eo_text_bigrams)
     02-14807      02-11166       01-2851      04-11991      03-12661 
          286           376           324           308            10 
     03-24217      03-19573      03-20013      03-29644       04-1322 
          193           508           701           285           151 
     04-18575      04-20050      04-20052      03-32332      03-32328 
          129           657           689            66           189 
      04-6622      04-12745      04-13123      03-30913      03-30513 
          234           299            43            46            48 
      03-7736       03-5343       03-8108       05-7830       05-3385 
         4219          2320            49            48           184 
     04-28079      04-10024      05-13214      03-22543      03-13750 
          402           404           458           495             9 
     03-14116      03-14117        08-970        07-780       07-2027 
           87            44           711            86          1732 
      07-2570       08-1215       07-5919      E8-28912       04-4884 
          417           379           109           246           390 
      04-4436       04-4451      04-10377       04-8616      05-12284 
          189           411           517            93            17 
     05-12354      04-26684      04-26686      04-25866       08-1480 
          120            80           245           117           382 
      07-4906       07-4907       07-4023        08-797       08-1409 
          476            75           125           105          1096 
      07-4600       07-5299      E8-23235       05-5097        E9-811 
           40           196           101           170           120 
       E9-814       07-6022       07-1816      01-31671      01-31670 
          136            46           135            67           105 
      07-5816       01-4622       01-6558       02-7087       07-3656 
           61           340            98           229           501 
      07-3593      E8-27777      E8-30042       E9-1574       E9-1538 
          318           356            60           382           117 
       E9-818      01-16668       02-1594        02-917       02-4071 
          348           360            82            76           259 
      02-5069       01-8835       01-8836       02-2638        02-918 
          222           106            21           446           150 
     01-29831      E8-30700      02-14497      02-31624      02-16040 
           59           207            28           284           262 
     02-16041      01-28762      01-29219      01-27917        06-554 
          117           131            46           939            44 
      06-4652        07-293       06-9993       06-9896      05-21571 
          119           343            43           206           384 
     05-20944      02-21056        03-464      03-11969      03-12071 
         1579           287           180           203            86 
      03-7313      03-10194      01-14319      01-15958      01-24917 
           52            76            74           433           177 
     01-24983      02-17274       06-4132       06-4121       06-9020 
          156           633           260           519           444 
      06-9619       06-7220       06-3865       06-2362      01-31959 
          420           397           366           256            98 
      01-9086      01-26509      01-26339      01-30624      01-13381 
          128          1706           528            46           298 
      03-2606       03-1798       03-8832      03-19675       07-3259 
          288           296           114           130            12 
      07-3258       07-2367       06-6101      05-20156      04-17636 
           21           120           101            24           309 
     04-15787       03-5848      E8-24465       05-9892       07-2518 
           20           223           350           147           164 
     E8-20436      01-15758      01-13869       06-5592      01-21338 
           46           324           267           381           189 
      04-2773      03-20764      03-31594      04-11592      04-11271 
          782            14            44           543           452 
      04-2408       04-1941       01-3883       01-2852      04-10378 
          249           126            32           320           373 
     04-20051      03-05344       03-6445       03-8109      03-12766 
          865           653           214            62           215 
      06-7492      05-19993      05-22132      05-22133       07-3112 
          350           445           234           248           360 
     01-25788       03-2069      03-19572      04-17150      04-17205 
           16           424            53           264           463 
     04-17204      04-20049      04-19909      04-24098      03-19676 
           29           404           195           391           323 
      06-5828       06-5829       06-8769        07-374       06-5984 
          193           434           400           957            12 
     05-23412      05-24596      05-24597      05-24255       06-5351 
          358           193           143           867           212 
      06-4085       06-4552       06-9770       06-9148       03-7160 
          403           427            32            45           162 
      07-3835       01-4624      01-17041      01-13117      01-13116 
          386            35            21           173           220 
     02-16951      02-17273      02-22526       01-4621       01-4623 
          151            55           101           748            46 
     01-29948      02-07086      02-07085      01-31119      03-11713 
          386           327            86            21           101 
     02-25900      02-32518      03-10606       06-1316      01-19562 
          118            53           233           511           106 
     01-24205      01-25677      01-25344      03-16102      04-23994 
          588          1131           451           127           100 
     01-11210      01-11505      02-29580      02-29832      02-31831 
           16           283           324           294           755 
     04-15933      04-15934      03-24919      05-13098       05-1886 
          330           232           322           489           168 
     04-28404      04-22212        05-306        05-771      04-26685 
           73           163           192           277           185 
     04-27076      04-21411      05-14452        08-658       05-7831 
         1394           116            54           437            40 
      05-1170       05-5434      E8-24342      03-13694      03-13412 
           81            95            88           465           277 
       08-761       06-9561        07-419       06-9895      05-15160 
          366            28            13           333            48 
      02-9536        02-919       02-3337       02-3826      01-14862 
         1732            39            12           444            29 
        08-62        08-325        08-360      E8-29564      01-31665 
          189           328           678           119            48 
     01-31667      01-31668      01-31669      01-31672       08-1182 
           80           115            72            90            33 
     02-17640      01-23359      02-24252       04-3170      02-31832 
          313           277           353           603           283 
     01-26990        02-448       06-9632       05-6907       07-5270 
           21           189           106            45           445 
     E8-17940       08-1472      E8-26531       07-4115      E8-27771 
         3671            63           197           231            78 
     E8-23125        08-568        08-483       04-5322      E8-21651 
          252            92           306           191           208 
      07-1704       07-2462       07-1137       07-1152       08-1348 
           45           395           459            47           244 
      07-4890      04-11058       07-3552       08-1399       07-5726 
          352           691           365           253           571 
     01-31666    2015-03714    2015-07788    2015-07016    2015-05677 
           82           950           496          3260           538 
   2015-18292    2015-19183     2010-9078    2010-10172     2010-7154 
          265           760           231           234           383 
   2010-11557     2010-9796    2015-16334    2011-19156    2015-20801 
          156           357           211           430           316 
   2015-22888     2010-4884     2010-1229       2010-38    2010-12805 
           97           181            73           261           319 
    2010-3725    2011-30990    2010-24839    2011-26574    2011-12645 
          216           106           569           118           351 
   2011-29683    2011-17953    2011-17447    2014-11442    2014-06768 
          351           187           270           581           145 
   2014-08426    2012-22030    2011-32486    2014-03805    2013-05967 
          269           473            62           617           567 
   2014-22805    2013-31445    2014-18561    2014-17522    2010-29579 
         1127           185          1406           103           819 
    2012-1568      E9-11547      E9-26834      E9-23886      E9-29781 
          523          1320           171           120           709 
    2012-7636    2013-08501    2011-21704    2011-26729    2013-15942 
          743            62           446           915           551 
   2013-16387    2012-31574    2012-30060    2012-30170    2013-00002 
          458            60           431            81           191 
   2013-28581    2014-07895    2011-15181    2010-18169     2010-8878 
          109           489           484           982           496 
   2010-21016    2010-21020    2013-17478    2014-03474    2014-16360 
         1114           150           599            43           433 
   2011-18065    2010-28854       E9-1893       E9-2893       E9-1712 
          372           299           673           503           432 
     E9-28493      E9-30020       E9-2484       E9-3106    2014-18998 
          843            67           654            30           367 
   2014-30195    2014-29625    2010-22002    2014-29121    2014-30323 
          213           209           502            88           420 
   2014-30363    2014-24851    2016-30272    2016-30101    2016-31792 
          185           144           132            91           128 
   2016-31922    2016-30277    2017-01623    2017-01169    2015-29403 
          281          1131          2665           802           137 
   2016-29519    2017-01487    2017-01197     2011-5903     2011-8642 
         1235           107           325            80            87 
   2011-28728    2011-33087    2010-27004    2010-28365    2010-28360 
          418           239           873           106           469 
   2011-13173    2010-25578       E9-5441      E9-31098      E9-28022 
          442           980           182           206           429 
     E9-25268    2016-06250    2016-07703    2016-08713    2016-03141 
          718           659           166            69           450 
   2015-02379    2015-01522    2015-01255    2016-26753    2015-30191 
          706           658           540            38           483 
   2016-03038    2016-24066    2016-24847    2016-22962    2016-28203 
          713           674           207            66           705 
   2016-29165    2016-11300    2016-12579    2016-15542     2012-9473 
          346           448            66           540           319 
   2012-10715    2012-10968     2012-5366    2012-27002    2013-08626 
          906           511           351           478           205 
   2012-10034    2012-18868     2012-3097    2012-11798    2012-12889 
          563          1177           564           375           115 
   2012-19055    2012-17022    2012-18237    2012-25236    2012-15954 
         1245           964           376          1330           352 
   2016-31875    2016-27156    2016-22454    2016-27171    2017-01489 
          193           817           122          1081           135 
   2015-32582    2017-01164    2017-01168    2016-29169    2015-13055 
          185           225           104           289           101 
   2015-19209    2016-17945    2016-18872    2015-17926    2015-15828 
          758           222           149           105            31 
   2015-16122    2016-25288    2016-25290    2016-20713    2015-29498 
          646           292          1004           100           143 
   2016-02475    2015-31749    2015-00058    2016-06355    2016-09483 
          740            96           384           618           546 
   2016-09346    2016-04770    2015-23630    2015-15495    2015-25744 
          402           156           394            66           190 
   2015-22998    2015-25489    2016-01325    2015-32060    2016-12307 
          783           330          1029           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 
           62           373           405           900           743 
   2011-33335     2010-2419     2010-5837      E9-31418 C1-2009-31418 
          117           438           447          5461            25 
    2010-4593    2013-26785    2010-18988    2011-33089    2010-15851 
          511          1258             0           337           351 
   2010-16864    2014-14432    2014-14429    2013-19220    2012-24374 
          693           105            68           943           854 
   2012-22062    2011-31624    2014-04254    2013-24388    2014-01523 
         1002          1049           736           544           149 
   2014-05323    2014-06141    2014-06612    2010-32960    2014-18682 
          401           405           384           205            80 
     2010-705    2010-14613    2011-14919    2011-15443     2011-5728 
          232           561           313           387           922 
    2011-4753     2011-3257     2011-2577     2011-9739     2011-1385 
          439           437           282           201           513 
   2014-23228    2014-24218    2014-25292    2014-25439    2012-12881 
         1109            91            79           427           170 
   2012-12882    2012-12883       E9-1719       E9-3113       E9-5802 
          120           134          1002           472           462 
     E9-16034      E9-15368       E9-1885       E9-1895       E9-3112 
           22           359           740           256           239 
      E9-3108       E9-8572       E9-2483       E9-2486       E9-2485 
           47           320           228            30           711 
     E9-26408      E9-30413      E9-27441      E9-24518       E9-4068 
          149            26           682          2428           234 
      E9-4103     2012-7019      E9-28805      E9-24203      E9-23915 
           23          2146           404           408            23 
   2012-22807    2013-06712    2013-03915     2012-2557    2013-12157 
          747           279          1309            89            64 
   2012-10884     2012-6797    2012-30310    2013-15782    2013-13523 
          522           500           770           543          1774 
   2011-26141    2013-07837    2012-31225    2010-31878    2013-19520 
          169           296            88           281           298 
   2014-09343    2014-12651    2010-12070     2010-9451    2012-20259 
           14           159           170           254           628 
   2012-17264     2012-3616    2013-12650    2013-11533    2011-21505 
          480           411            71           453           398 
   2011-23891    2012-12225    2012-15183    2018-27945    2017-23630 
          579           362           689            83           674 
   2017-27034    2018-04860    2018-08883    2018-05916    2018-05113 
          166           509           764           229           616 
   2018-11101    2018-00240    2017-23270    2017-27899    2018-07874 
          579            46            65           394           794 
   2018-15202    2018-13640    2018-15955    2018-15299    2019-24288 
          637           670           826           393            82 
   2019-26178    2019-05370    2019-16383    2018-02261    2018-00630 
          454           137           558           320           241 
   2018-08272    2018-11939    2018-13696    2019-10398    2020-17364 
          374           872           309           763           432 
   2020-17699    2020-17700    2020-07530    2020-27948    2021-01094 
          371           398          1445           751           144 
   2021-01228    2020-12030    2018-04414    2020-03556    2020-27740 
          223          1123           434            88           347 
   2019-07645    2019-21630    2019-09750    2019-12802    2019-13945 
          389           251          1069           631           766 
   2019-22849    2019-20804    2019-23525    2019-22623    2019-22624 
          930          1029           442           720          1001 
   2019-00615    2019-04595    2019-01426    2020-14337    2020-12584 
          146           142           381           522          1232 
   2020-22510    2020-29235    2020-22064    2020-24793    2020-28605 
          502           573          1162           745          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           288          1259           732           287 
   2017-13458    2017-13012    2017-02762    2017-10004    2017-15860 
           62           741           149          1204           447 
   2017-08586    2017-03113    2017-03115    2017-03116    2017-03118 
          231           542           212           111           233 
   2017-02450    2017-02451    2017-09156    2017-06716    2017-20647 
         1002           330           303           327           888 
   2017-21555    2017-21559    2017-09083    2017-08905    2017-08311 
          266           104           320           206           442 
   2017-06967    2017-06971    2017-04357    2017-04107    2017-02095 
          274           112           552           381           952 
   2017-02029    2017-01799    2017-06576    2017-06382    2020-00534 
          254           184           953            53           745 
   2020-02439    2020-27065    2020-06969    2020-06985    2020-10953 
          917           979           526           147           284 
   2020-07800    2020-03337    2020-09537    2020-19032    2020-21129 
          313           555           146           221           375 
   2021-00040    2020-13449    2017-14992    2017-05399    2017-02281 
          185           727            86           187          1042 
   2017-06968    2017-14378    2017-10003    2017-08818    2017-09161 
          282           446           320           451           107 
   2017-09087    2017-09574    2017-18468    2017-18134    2017-04837 
          782           230           278          1554          2375 
   2017-04353    2017-02102    2017-08990    2017-08908    2017-18679 
          169           762           179           349            61 
   2018-27515    2018-26552    2017-22677    2017-27925    2018-10855 
          672            83           497           573           554 
   2018-10403    2018-11335    2018-11913    2018-11916    2018-11936 
          444           236          1233          1345           246 
   2018-20816    2019-07656    2019-05934    2019-15159    2019-15449 
         1002           960           643           481           361 
   2019-10538    2019-27678    2019-08797    2019-04437    2019-13793 
          714            83          1176           706           608 
   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           569           265           196           773 
   2020-08846    2020-09536    2020-21160    2020-23115    2020-23116 
          117           354           631           450           891 
   2020-23780    2019-24040    2019-19367    2019-22749    2019-22073 
          903           599           267           305           855 
   2019-19895    2019-06325    2019-06548    2019-14016    2019-28286 
          301          1290           196           701           188 
   2019-27217    2019-13175    2019-00048    2020-12953    2019-02544 
          259           313           185           651          1142 
   2019-00014    2018-24254    2018-26156    2020-14077    2020-14509 
          920           466           466          1006           795 
   2020-14328    2020-18015    2020-15338    2020-15646    2020-20887 
           56           464           600          1030           346 
   2020-09645    2020-04755    2021-01643    2021-01644    2021-01645 
           79           213          1027           292           594 
   2021-01713    2021-01714    2021-01712    2020-14872    2020-08392 
           52          1280           157           893            83 
   2020-06478    2020-16625    2020-21914    2020-21534    2020-12430 
          273           273          2138          1573           491 
   2020-02438    2020-25459    2020-21960    2018-20203    2018-19514 
          520           558           487          1009           474 
   2018-09895    2018-00553    2017-28160    2019-17052    2019-21505 
          424           347           194           487           267 
   2019-04298    2018-17068    2018-15195    2020-09695    2020-06161 
          330          2500           165           965           235 
   2020-10993    2020-10315    2020-18012 
          158          1141          1316 
dfmat_eo_text_bigrams[ntoken(dfmat_eo_text_bigrams) <= 0,]
Document-feature matrix of: 1 document, 130,775 features (100.00% sparse) and 1 docvar.
            features
docs         purpos_health health_human human_servic servic_carri carri_respons
  2010-18988             0            0            0            0             0
            features
docs         respons_public public_health servic_develop develop_coordin
  2010-18988              0             0              0               0
            features
docs         coordin_enhanc
  2010-18988              0
[ reached max_nfeat ... 130,765 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, 15,977 features (100.00% sparse) and 1 docvar.
               features
docs            purpos_health health_human human_servic servic_carri
  C1-2009-31418             0            0            0            0
               features
docs            carri_respons respons_public public_health servic_develop
  C1-2009-31418             0              0             0              0
               features
docs            develop_coordin coordin_enhanc
  C1-2009-31418               0              0
[ reached max_nfeat ... 15,967 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.336341 0.0075326
02-11166    0.250523 0.0124035
01-2851     0.428338 0.0038656
04-11991   -3.389287 0.0321209
03-12661   -0.383998 0.6741669
03-24217    0.329938 0.0087074
03-19573    0.856864 0.0004134
03-20013    0.697442 0.0010239
03-29644    0.186744 0.0276316
04-1322     0.734397 0.0017248
04-18575   -1.984275 0.1894405
04-20050    0.144053 0.0170113
04-20052    0.182829 0.0129766
03-32332    0.568876 0.0057685
03-32328   -3.874644 0.0520883
04-6622     0.392995 0.0062378
04-12745    0.432675 0.0038042
04-13123   -1.782634 0.4410730
03-30913   -2.159269 0.2475642
03-30513   -0.635483 0.4710954
03-7736     0.312423 0.0028251
03-5343     0.269173 0.0046256
03-8108    -1.111349 0.5788496
05-7830    -0.785318 0.4830401
05-3385     0.842494 0.0007612
04-28079    0.023707 0.0378211
04-10024    0.304761 0.0092628
05-13214    0.891760 0.0003912
03-22543    0.858770 0.0004591
03-13750   -0.237161 0.5241568
03-14116    0.648498 0.0056427
03-14117    0.600847 0.0058092
08-970      0.389400 0.0042092
07-780      0.402960 0.0108798
07-2027     0.272953 0.0086523
07-2570     0.339868 0.0063593
08-1215     0.877151 0.0004208
07-5919    -0.117029 0.1159867
E8-28912   -1.179693 0.3039373
04-4884     0.433260 0.0047459
04-4436     0.208196 0.0222252
04-4451     0.352406 0.0069007
04-10377    0.112523 0.0248760
04-8616    -1.765231 0.2733235
05-12284    0.214140 0.0605151
05-12354    0.575354 0.0046011
04-26684    0.353815 0.0113308
04-26686    0.795563 0.0008767
04-25866   -1.100345 0.3396524
08-1480     0.912518 0.0003905
07-4906     0.277265 0.0082388
07-4907    -2.586266 0.1305835
07-4023     0.364764 0.0089736
08-797      0.281819 0.0157024
08-1409     0.113046 0.0147631
07-4600    -1.027510 0.5660508
07-5299     0.484563 0.0054950
E8-23235    0.564744 0.0049269
05-5097    -2.115157 0.1981955
E9-811     -1.394399 0.3020691
E9-814      0.312690 0.0135291
07-6022    -2.159391 0.2500974
07-1816    -1.954613 0.1972835
01-31671   -0.556143 0.3503430
01-31670    0.027496 0.0802932
07-5816     0.454082 0.0091332
01-4622     0.517970 0.0035015
01-6558    -2.097107 0.2031734
02-7087     0.296643 0.0099147
07-3656     0.249019 0.0141821
07-3593     0.367038 0.0058548
E8-27777    0.186999 0.0177971
E8-30042   -1.816859 0.3022595
E9-1574    -0.340804 0.1452915
E9-1538     0.337522 0.0130866
E9-818      0.179252 0.0185611
01-16668    0.854472 0.0005097
02-1594     0.278821 0.0221343
02-917      0.359454 0.0112912
02-4071     0.434431 0.0051554
02-5069    -2.087142 0.1667833
01-8835     0.694782 0.0024337
01-8836    -0.880724 0.7738492
02-2638     0.341933 0.0064393
02-918      0.365162 0.0104236
01-29831    0.526179 0.0081747
E8-30700   -3.814907 0.0482350
02-14497   -0.133959 0.2487738
02-31624    0.452198 0.0043167
02-16040    0.277956 0.0138144
02-16041   -0.313843 0.2880910
01-28762    0.134659 0.0382822
01-29219    0.656704 0.0044414
01-27917   -0.812257 0.1816022
06-554      0.494982 0.0089044
06-4652    -0.452855 0.2661252
07-293     -0.458265 0.2111999
06-9993    -1.786657 0.4468903
06-9896    -3.877352 0.0516525
05-21571   -0.670231 0.1780455
05-20944   -1.561393 0.1461567
02-21056    0.464755 0.0050887
03-464     -3.918184 0.0550313
03-11969   -0.035341 0.0703028
03-12071    0.497049 0.0081075
03-7313    -3.563101 0.0920832
03-10194   -0.528161 0.4043339
01-14319   -1.448902 0.4296032
01-15958    0.128813 0.0254905
01-24917    0.318017 0.0101977
01-24983    0.142175 0.0330344
02-17274    0.373808 0.0048926
06-4132    -0.065261 0.0777988
06-4121     0.869234 0.0004127
06-9020     0.880592 0.0004056
06-9619     0.103182 0.0282071
06-7220     0.386818 0.0065864
06-3865     0.141745 0.0248636
06-2362     0.461344 0.0037720
01-31959   -2.084489 0.2058363
01-9086     0.561770 0.0049874
01-26509    0.342526 0.0031978
01-26339    0.159527 0.0187203
01-30624   -2.154833 0.2512983
01-13381    0.807828 0.0007945
03-2606     0.211561 0.0163762
03-1798     0.418254 0.0058368
03-8832     0.529688 0.0067377
03-19675    0.267910 0.0174129
07-3259    -0.317456 0.5277360
07-3258    -0.698032 0.6141103
07-2367     0.364501 0.0110599
06-6101     0.053759 0.0587940
05-20156    0.185184 0.0721131
04-17636    0.828711 0.0006296
04-15787    0.477000 0.0130911
03-5848     0.889145 0.0005450
E8-24465    0.310569 0.0090108
05-9892    -1.486351 0.3435147
07-2518     0.401960 0.0076109
E8-20436    0.182308 0.0528949
01-15758    0.267458 0.0139672
01-13869   -0.674909 0.2196316
06-5592     0.891805 0.0004081
01-21338    0.672009 0.0020814
04-2773     0.217739 0.0116768
03-20764   -0.505554 0.5974228
03-31594    0.649235 0.0043535
04-11592    0.114713 0.0246695
04-11271    0.346658 0.0056820
04-2408     0.399692 0.0061287
04-1941    -3.203068 0.0745487
01-3883    -1.712578 0.5190913
01-2852     0.416240 0.0054470
04-10378    0.522753 0.0036672
04-20051    0.345963 0.0047054
03-05344    0.426378 0.0042223
03-6445    -1.877011 0.1872124
03-8109    -1.834181 0.3472516
03-12766    0.106217 0.0350756
06-7492     0.198619 0.0160317
05-19993    0.285591 0.0077244
05-22132    0.106856 0.0317684
05-22133    0.315617 0.0096957
07-3112     0.371929 0.0081667
01-25788    0.012803 0.2207449
03-2069     0.451332 0.0038410
03-19572    0.269448 0.0315379
04-17150   -0.408297 0.1622659
04-17205    0.905915 0.0003809
04-17204   -0.747713 0.5936319
04-20049    0.116433 0.0232654
04-19909    0.437815 0.0058154
04-24098    0.202055 0.0187862
03-19676    0.754170 0.0010214
06-5828     0.353812 0.0098810
06-5829     0.295958 0.0090213
06-8769     0.858744 0.0005077
07-374      0.183141 0.0110878
06-5984    -0.421069 0.6014490
05-23412    0.902904 0.0003976
05-24596   -3.863469 0.0511405
05-24597    0.257099 0.0159269
05-24255    0.061562 0.0287962
06-5351     0.327677 0.0091385
06-4085     0.891159 0.0004498
06-4552     0.404381 0.0043724
06-9770     0.524412 0.0170351
06-9148     0.381737 0.0162978
03-7160     0.771844 0.0013800
07-3835     0.915167 0.0003920
01-4624    -0.053365 0.2075324
01-17041   -0.053193 0.2337350
01-13117    0.294140 0.0120614
01-13116    0.156545 0.0323593
02-16951    0.754449 0.0015659
02-17273    0.622175 0.0064701
02-22526    0.248083 0.0367372
01-4621     0.229423 0.0106588
01-4623    -0.602043 0.5546591
01-29948    0.177881 0.0194526
02-07086    0.215169 0.0156276
02-07085    0.590946 0.0063847
01-31119    0.220275 0.0822793
03-11713    0.759811 0.0015484
02-25900    0.205214 0.0388388
02-32518   -2.164172 0.2390719
03-10606   -2.346862 0.1500556
06-1316     0.878626 0.0004071
01-19562   -0.530777 0.4190592
01-24205    0.834005 0.0004517
01-25677    0.302733 0.0050371
01-25344    0.260836 0.0117702
03-16102    0.484110 0.0056624
04-23994    0.129826 0.0442815
01-11210    0.028039 0.2325657
01-11505    0.239894 0.0152422
02-29580    0.567322 0.0032410
02-29832    0.386697 0.0054601
02-31831    0.450548 0.0030074
04-15933    0.319562 0.0088391
04-15934   -0.332635 0.1757360
03-24919    0.400968 0.0061712
05-13098   -0.281545 0.0978032
05-1886     0.224841 0.0223788
04-28404    0.507105 0.0078054
04-22212   -0.742945 0.3057895
05-306     -3.851519 0.0503213
05-771      0.440105 0.0046686
04-26685   -2.102226 0.1641619
04-27076   -2.102959 0.1028698
04-21411    0.757465 0.0014771
05-14452   -0.848949 0.4592268
08-658      0.272573 0.0098043
05-7831     0.494652 0.0086494
05-1170     0.330672 0.0135218
05-5434    -2.579768 0.1473405
E8-24342    0.458415 0.0081416
03-13694    0.839167 0.0005167
03-13412    0.815164 0.0007101
08-761      0.878841 0.0004493
06-9561     0.447744 0.0139439
07-419      0.039372 0.1862335
06-9895     0.407037 0.0052495
05-15160   -0.288619 0.2651090
02-9536    -2.240598 0.0783044
02-919     -1.623067 0.4770127
02-3337     0.162526 0.1087743
02-3826     0.313199 0.0076653
01-14862   -0.399389 0.4568281
08-62      -3.879240 0.0514635
08-325      0.224455 0.0131497
08-360      0.482623 0.0027991
E8-29564    0.367352 0.0087208
01-31665    0.483967 0.0090103
01-31667   -0.140426 0.1486522
01-31668   -0.258779 0.1922624
01-31669   -0.472696 0.3250262
01-31672   -1.605636 0.3335543
08-1182    -0.047054 0.2025895
02-17640    0.488782 0.0035340
01-23359    0.525951 0.0036231
02-24252    0.229216 0.0135681
04-3170     0.295692 0.0077046
02-31832    0.436280 0.0038869
01-26990   -0.233381 0.4734575
02-448     -3.838676 0.0502930
06-9632    -0.158678 0.1325857
05-6907    -0.047967 0.1493839
07-5270     0.865874 0.0004085
E8-17940    0.357027 0.0022100
08-1472    -2.597590 0.1298581
E8-26531    0.771013 0.0014944
07-4115     0.352774 0.0101530
E8-27771    0.269939 0.0214297
E8-23125   -1.325856 0.2734434
08-568      0.422700 0.0091544
08-483      0.269779 0.0142461
04-5322    -3.843880 0.0508009
E8-21651    0.305460 0.0117573
07-1704     0.273373 0.0327213
07-2462     0.198176 0.0166340
07-1137    -0.108856 0.0602539
07-1152    -0.471154 0.4718227
08-1348     0.426571 0.0054461
07-4890     0.200091 0.0156325
04-11058    0.857037 0.0004012
07-3552     0.898557 0.0004102
08-1399     0.881786 0.0005647
07-5726    -0.739547 0.1715401
01-31666   -1.201540 0.3610140
2015-03714  0.311855 0.0054434
2015-07788  0.883664 0.0003807
2015-07016  0.022920 0.0182600
2015-05677  0.889332 0.0003603
2015-18292  0.333407 0.0071975
2015-19183  0.300854 0.0082317
2010-9078   0.228177 0.0169821
2010-10172  0.526010 0.0037081
2010-7154   0.438074 0.0054138
2010-11557  0.402460 0.0077124
2010-9796   0.203750 0.0149623
2015-16334  0.099241 0.0420916
2011-19156  0.901888 0.0003841
2015-20801 -0.104015 0.0893652
2015-22888  0.391026 0.0085902
2010-4884   0.262257 0.0136022
2010-1229   0.357389 0.0131574
2010-38     0.064453 0.0462253
2010-12805  0.363841 0.0063470
2010-3725  -0.128412 0.1125715
2011-30990  0.212489 0.0231419
2010-24839  0.884683 0.0003552
2011-26574  0.200892 0.0256389
2011-12645  0.924966 0.0003894
2011-29683  0.180619 0.0237472
2011-17953  0.153252 0.0289780
2011-17447  0.293453 0.0122061
2014-11442  0.884132 0.0003469
2014-06768 -0.294562 0.1605882
2014-08426  0.402758 0.0068160
2012-22030  0.172163 0.0226204
2011-32486 -2.597673 0.1288114
2014-03805 -0.178912 0.0784928
2013-05967  0.594084 0.0019539
2014-22805  0.319887 0.0054736
2013-31445 -3.918686 0.0540076
2014-18561  0.328573 0.0049530
2014-17522  0.432183 0.0090187
2010-29579  0.470376 0.0025947
2012-1568   0.338819 0.0066080
E9-11547    0.245260 0.0093766
E9-26834   -0.342034 0.1950019
E9-23886    0.314402 0.0111828
E9-29781    0.194398 0.0136381
2012-7636   0.253403 0.0094772
2013-08501  0.177196 0.0375603
2011-21704 -0.895577 0.2391706
2011-26729  0.339924 0.0047658
2013-15942  0.286943 0.0083887
2013-16387  0.437366 0.0042566
2012-31574  0.180550 0.0397041
2012-30060  0.562580 0.0027591
2012-30170 -0.116271 0.1383923
2013-00002 -3.919908 0.0536426
2013-28581 -1.126204 0.3293135
2014-07895  0.896967 0.0003628
2011-15181  0.041253 0.0442303
2010-18169  0.258666 0.0077107
2010-8878   0.897831 0.0003728
2010-21016  0.322194 0.0045767
2010-21020  0.275005 0.0168557
2013-17478  0.069723 0.0339820
2014-03474  0.178045 0.0483646
2014-16360  0.849939 0.0004870
2011-18065  0.358939 0.0063709
2010-28854  0.443543 0.0045746
E9-1893     0.471741 0.0034243
E9-2893     0.251441 0.0101901
E9-1712     0.172996 0.0214445
E9-28493    0.380108 0.0047460
E9-30020   -1.952515 0.2617942
E9-2484     0.336846 0.0059486
E9-3106     0.039167 0.1191454
2014-18998  0.224460 0.0159524
2014-30195  0.265393 0.0124371
2014-29625 -0.044890 0.0823063
2010-22002  0.896823 0.0003744
2014-29121 -1.875677 0.2394423
2014-30323  0.918689 0.0003653
2014-30363 -3.932289 0.0545778
2014-24851 -1.126514 0.3019802
2016-30272  0.365020 0.0089609
2016-30101  0.394432 0.0101332
2016-31792  0.412917 0.0071435
2016-31922  0.836039 0.0006499
2016-30277  0.402485 0.0040548
2017-01623 -0.017571 0.0201095
2017-01169 -1.110120 0.2428697
2015-29403  0.760349 0.0014215
2016-29519  0.345900 0.0044289
2017-01487  0.371961 0.0087128
2017-01197  0.648814 0.0020219
2011-5903   0.464734 0.0103461
2011-8642  -0.105869 0.1411265
2011-28728  0.205532 0.0214699
2011-33087 -3.771645 0.0448495
2010-27004  0.324758 0.0049987
2010-28365  0.376246 0.0085143
2010-28360  0.113720 0.0287984
2011-13173  0.880067 0.0003985
2010-25578  0.330861 0.0049696
E9-5441     0.123418 0.0432417
E9-31098   -3.785225 0.0464713
E9-28022    0.500418 0.0028779
E9-25268    0.341793 0.0048946
2016-06250  0.387246 0.0045004
2016-07703 -1.265265 0.2909916
2016-08713  0.029589 0.0876062
2016-03141  0.289272 0.0094215
2015-02379  0.329957 0.0070443
2015-01522  0.258130 0.0094751
2015-01255  0.206427 0.0144455
2016-26753  0.437930 0.0124343
2015-30191  0.898040 0.0003532
2016-03038  0.282510 0.0076706
2016-24066 -1.211550 0.1632175
2016-24847  0.748104 0.0013507
2016-22962 -2.596456 0.1250920
2016-28203 -0.040383 0.0474102
2016-29165 -1.658062 0.2133605
2016-11300  0.364483 0.0059886
2016-12579 -2.596456 0.1250920
2016-15542  0.387025 0.0055791
2012-9473   0.484619 0.0039172
2012-10715  0.424902 0.0038235
2012-10968  0.315441 0.0073238
2012-5366   0.433300 0.0048370
2012-27002  0.212477 0.0141569
2013-08626 -3.831887 0.0485615
2012-10034  0.891849 0.0003557
2012-18868  0.336694 0.0041938
2012-3097   0.887682 0.0003442
2012-11798  0.352059 0.0071506
2012-12889  0.287038 0.0146443
2012-19055  0.849489 0.0002619
2012-17022  0.157983 0.0153433
2012-18237  0.869363 0.0004844
2012-25236  0.873937 0.0002362
2012-15954  0.838979 0.0005818
2016-31875 -3.881078 0.0514245
2016-27156  0.388927 0.0046377
2016-22454  0.769238 0.0014335
2016-27171  0.405646 0.0037814
2017-01489  0.310980 0.0108401
2015-32582 -3.932289 0.0545778
2017-01164  0.251353 0.0185730
2017-01168  0.395805 0.0082872
2016-29169  0.368310 0.0077159
2015-13055  0.741946 0.0017136
2015-19209  0.176391 0.0159377
2016-17945  0.497929 0.0039504
2016-18872  0.189166 0.0317802
2015-17926  0.282053 0.0151034
2015-15828 -0.119266 0.3268158
2015-16122  0.509974 0.0031875
2016-25288  0.469711 0.0054474
2016-25290  0.333412 0.0055437
2016-20713  0.402713 0.0092629
2015-29498 -1.512372 0.2522245
2016-02475  0.129490 0.0222775
2015-31749 -1.926398 0.2231393
2015-00058  0.916542 0.0003800
2016-06355  0.900171 0.0003289
2016-09483  0.895785 0.0003710
2016-09346  0.373781 0.0068335
2016-04770  0.346925 0.0087638
2015-23630  0.167436 0.0254043
2015-15495 -2.596456 0.1250920
2015-25744 -0.093836 0.1271195
2015-22998  0.093868 0.0242293
2015-25489  0.268942 0.0091963
2016-01325  0.868937 0.0002844
2015-32060 -1.301792 0.1879179
2016-12307  0.468842 0.0032131
2016-12155 -0.038861 0.0567650
2016-16295  0.313665 0.0078608
2016-19723  0.278559 0.0156787
2016-19724  0.132175 0.0383990
2016-19725  0.290578 0.0121904
2010-22279 -2.597673 0.1288114
2011-10910  0.917192 0.0003805
2011-10732  0.421865 0.0048193
2010-33169 -2.166314 0.0904965
2011-30463  0.860821 0.0003246
2011-33335  0.355134 0.0104847
2010-2419   0.311270 0.0070843
2010-5837   0.502314 0.0034907
E9-31418    0.330207 0.0022911
2010-4593   0.338923 0.0060385
2013-26785  0.319028 0.0046716
2011-33089  0.520589 0.0037217
2010-15851  0.302438 0.0084338
2010-16864  0.228367 0.0127624
2014-14432  0.146118 0.0341958
2014-14429 -2.598089 0.1267524
2013-19220  0.187331 0.0130611
2012-24374  0.482034 0.0030767
2012-22062 -0.397020 0.1096410
2011-31624  0.355522 0.0042377
2014-04254  0.448626 0.0035319
2013-24388  0.301781 0.0063232
2014-01523  0.394147 0.0082626
2014-05323  0.918969 0.0003646
2014-06141  0.916687 0.0003662
2014-06612  0.916596 0.0003762
2010-32960 -3.853677 0.0500206
2014-18682  0.427909 0.0096701
2010-705    0.277829 0.0123056
2010-14613  0.228103 0.0116331
2011-14919  0.293644 0.0095330
2011-15443  0.330791 0.0078607
2011-5728   0.417362 0.0040454
2011-4753   0.918286 0.0003657
2011-3257   0.385474 0.0052610
2011-2577   0.461273 0.0042717
2011-9739   0.856101 0.0006377
2011-1385   0.088020 0.0306457
2014-23228  0.335677 0.0050112
2014-24218 -1.390965 0.3850863
2014-25292  0.254503 0.0247215
2014-25439  0.442327 0.0048725
2012-12881  0.008511 0.0588359
2012-12882  0.283136 0.0151594
2012-12883  0.310173 0.0110192
E9-1719    -0.610223 0.1454985
E9-3113     0.247258 0.0126881
E9-5802     0.255216 0.0109665
E9-16034   -0.407255 0.4915629
E9-15368    0.280770 0.0095996
E9-1885     0.332805 0.0059542
E9-1895     0.327978 0.0084297
E9-3112     0.432147 0.0052760
E9-3108    -0.270262 0.3025567
E9-8572     0.301385 0.0095796
E9-2483     0.563783 0.0038066
E9-2486     0.253944 0.0361506
E9-2485     0.376550 0.0042295
E9-26408   -0.031615 0.0790478
E9-30413    0.582236 0.0095498
E9-27441   -0.022618 0.0421981
E9-24518    0.175046 0.0086269
E9-4068     0.402973 0.0064919
E9-4103     0.198816 0.0603124
2012-7019   0.457804 0.0018735
E9-28805    0.322401 0.0071967
E9-24203    0.491201 0.0042438
E9-23915    0.468463 0.0131582
2012-22807  0.334000 0.0064293
2013-06712  0.312134 0.0119005
2013-03915  0.318065 0.0045965
2012-2557  -0.560218 0.3490478
2013-12157 -2.598089 0.1267524
2012-10884  0.872780 0.0003932
2012-6797   0.165428 0.0175347
2012-30310  0.248823 0.0091708
2013-15782  0.223310 0.0120019
2013-13523  0.859358 0.0002124
2011-26141  0.314281 0.0102810
2013-07837  0.315745 0.0088020
2012-31225 -1.893740 0.2370344
2010-31878  0.250961 0.0128949
2013-19520  0.828834 0.0007073
2014-09343 -0.311759 0.5432236
2014-12651  0.782814 0.0011301
2010-12070  0.023960 0.0556228
2010-9451   0.087204 0.0348934
2012-20259  0.395243 0.0045919
2012-17264  0.902348 0.0003766
2012-3616   0.294041 0.0086505
2013-12650  0.145234 0.0460900
2013-11533 -0.076349 0.0741455
2011-21505  0.917148 0.0003732
2011-23891  0.353839 0.0061469
2012-12225  0.924740 0.0003926
2012-15183  0.315609 0.0074537
2018-27945 -1.873812 0.2465129
2017-23630  0.511717 0.0027167
2017-27034  0.409894 0.0086813
2018-04860 -2.465089 0.0839739
2018-08883 -0.482834 0.1491273
2018-05916  0.877390 0.0005656
2018-05113  0.286807 0.0083536
2018-11101 -0.599718 0.1497049
2018-00240  0.191379 0.0406677
2017-23270  0.483550 0.0069098
2017-27899  0.291418 0.0111685
2018-07874  0.420960 0.0040684
2018-15202 -2.533807 0.0636169
2018-13640 -0.104230 0.0574432
2018-15955  0.165984 0.0150493
2018-15299  0.450217 0.0036746
2019-24288  0.287478 0.0184154
2019-26178  0.187296 0.0167578
2019-05370  0.705445 0.0019842
2019-16383  0.875574 0.0003761
2018-02261  0.496042 0.0042863
2018-00630 -1.624747 0.2530412
2018-08272  0.024161 0.0527075
2018-11939 -1.463134 0.1727230
2018-13696  0.519390 0.0043803
2019-10398  0.404725 0.0036520
2020-17364  0.039041 0.0497958
2020-17699  0.791008 0.0007463
2020-17700  0.809094 0.0006466
2020-07530  0.427503 0.0026871
2020-27948  0.065111 0.0320499
2021-01094  0.350082 0.0085746
2021-01228  0.701068 0.0016348
2020-12030  0.532481 0.0027985
2018-04414  0.306220 0.0084535
2020-03556  0.257505 0.0201446
2020-27740  0.500633 0.0043244
2019-07645  0.410603 0.0053568
2019-21630  0.308504 0.0082652
2019-09750 -0.543333 0.1397769
2019-12802  0.345059 0.0066250
2019-13945  0.382950 0.0051616
2019-22849  0.870396 0.0002869
2019-20804  0.191589 0.0149267
2019-23525  0.029955 0.0381279
2019-22623  0.059356 0.0307979
2019-22624  0.395199 0.0040640
2019-00615  0.754991 0.0013520
2019-04595  0.448805 0.0067655
2019-01426  0.427275 0.0050845
2020-14337 -0.608694 0.2313850
2020-12584  0.449934 0.0026161
2020-22510  0.279147 0.0107643
2020-29235  0.423271 0.0060087
2020-22064  0.618727 0.0014546
2020-24793  0.076441 0.0312441
2020-28605  0.427926 0.0041514
2020-28606  0.264144 0.0188263
2020-16623 -0.022053 0.0881630
2020-16624  0.362377 0.0103172
2021-01635  0.457017 0.0039248
2021-01646  0.615723 0.0019637
2021-01013  0.369318 0.0058070
2019-16879  0.827193 0.0006596
2019-15222  0.339506 0.0058210
2019-09877  0.871380 0.0003185
2017-15680  0.361139 0.0065869
2017-13458  0.198200 0.0360698
2017-13012  0.245778 0.0101421
2017-02762  0.536910 0.0052901
2017-10004  0.345046 0.0042447
2017-15860  0.306251 0.0091791
2017-08586  0.467130 0.0054261
2017-03113  0.522253 0.0031361
2017-03115  0.288577 0.0129880
2017-03116  0.407053 0.0070679
2017-03118  0.247350 0.0152280
2017-02450  0.272077 0.0078072
2017-02451  0.415371 0.0060918
2017-09156  0.448617 0.0057225
2017-06716  0.119104 0.0282390
2017-20647  0.896932 0.0002769
2017-21555  0.304921 0.0081728
2017-21559 -0.201766 0.1707500
2017-09083 -0.093074 0.0752846
2017-08905  0.258347 0.0180713
2017-08311  0.455355 0.0041024
2017-06967  0.470511 0.0050764
2017-06971  0.408475 0.0070524
2017-04357  0.288641 0.0081912
2017-04107 -0.419305 0.1761429
2017-02095  0.524752 0.0023186
2017-02029  0.435204 0.0054626
2017-01799  0.137522 0.0362838
2017-06576  0.341056 0.0050946
2017-06382  0.164165 0.0451496
2020-00534  0.868342 0.0003173
2020-02439  0.544067 0.0025346
2020-27065 -0.043848 0.0422406
2020-06969  0.484077 0.0026358
2020-06985  0.482717 0.0048396
2020-10953  0.421143 0.0047761
2020-07800  0.314663 0.0117745
2020-03337  0.286304 0.0091640
2020-09537  0.192632 0.0239053
2020-19032  0.069035 0.0509219
2020-21129  0.376319 0.0075019
2021-00040 -3.932289 0.0545778
2020-13449  0.222784 0.0126944
2017-14992  0.697191 0.0024179
2017-05399  0.131439 0.0373610
2017-02281  0.542019 0.0020810
2017-06968  0.485078 0.0046792
2017-14378  0.256451 0.0107372
2017-10003  0.428498 0.0048745
2017-08818  0.320104 0.0074108
2017-09161  0.265590 0.0196943
2017-09087  0.465453 0.0032570
2017-09574  0.356035 0.0097579
2017-18468  0.879903 0.0005501
2017-18134  0.360526 0.0038033
2017-04837  0.565118 0.0014240
2017-04353 -0.045994 0.0879433
2017-02102  0.486410 0.0029373
2017-08990  0.007308 0.0752927
2017-08908  0.041162 0.0447489
2017-18679  0.152047 0.0479332
2018-27515  0.301246 0.0067619
2018-26552 -1.782300 0.2763368
2017-22677 -0.099998 0.0812687
2017-27925  0.882578 0.0003590
2018-10855  0.432226 0.0041628
2018-10403 -1.005927 0.2565892
2018-11335  0.855738 0.0006421
2018-11913 -1.311549 0.1600953
2018-11916  0.200534 0.0111141
2018-11936  0.246344 0.0187666
2018-20816  0.869448 0.0002773
2019-07656  0.340686 0.0057812
2019-05934  0.389706 0.0054635
2019-15159  0.249349 0.0175455
2019-15449  0.217186 0.0181747
2019-10538  0.745704 0.0006753
2019-27678 -1.855021 0.2532945
2019-08797 -0.582569 0.1115352
2019-04437  0.204236 0.0132074
2019-13793  0.885809 0.0003338
2020-27353  0.397641 0.0055859
2020-27807 -1.864004 0.2499706
2020-27739  0.332349 0.0091971
2020-27455  0.408833 0.0074366
2021-01469  0.430838 0.0064468
2021-01476  0.306284 0.0083070
2021-00305  0.761523 0.0007525
2020-17363  0.397924 0.0068406
2020-04730  0.376547 0.0070463
2020-11301  0.316502 0.0068861
2020-08846  0.552717 0.0043067
2020-09536  0.436647 0.0047527
2020-21160  0.868471 0.0003648
2020-23115  0.279389 0.0103627
2020-23116  0.139934 0.0174592
2020-23780 -2.099599 0.0884997
2019-24040  0.326708 0.0064155
2019-19367  0.193588 0.0177427
2019-22749  0.426015 0.0061821
2019-22073  0.163603 0.0198481
2019-19895  0.865419 0.0005282
2019-06325  0.321417 0.0048272
2019-06548 -3.814988 0.0481127
2019-14016  0.246713 0.0118673
2019-28286 -3.865426 0.0510879
2019-27217  0.349535 0.0112314
2019-13175  0.206885 0.0212931
2019-00048 -3.932289 0.0545778
2020-12953  0.862248 0.0003957
2019-02544  0.297841 0.0061532
2019-00014  0.348961 0.0056894
2018-24254  0.885869 0.0003859
2018-26156  0.898286 0.0003710
2020-14077  0.236143 0.0114301
2020-14509  0.351830 0.0067087
2020-14328  0.121092 0.0583610
2020-18015  0.389541 0.0068432
2020-15338  0.200982 0.0130850
2020-15646  0.844346 0.0003697
2020-20887  0.346331 0.0093805
2020-09645 -0.125666 0.1547270
2020-04755  0.321770 0.0095288
2021-01643  0.265019 0.0151599
2021-01644  0.389643 0.0067899
2021-01645  0.431846 0.0049521
2021-01713  0.048266 0.0882340
2021-01714  0.724148 0.0007255
2021-01712 -0.436328 0.2779977
2020-14872  0.391056 0.0053388
2020-08392  0.318841 0.0150830
2020-06478  0.391250 0.0058162
2020-16625  0.256193 0.0189508
2020-21914 -0.560741 0.1355190
2020-21534  0.318512 0.0062293
2020-12430  0.548691 0.0031031
2020-02438  0.360653 0.0070031
2020-25459  0.780720 0.0006789
2020-21960  0.197582 0.0206279
2018-20203  0.830351 0.0003821
2018-19514  0.440645 0.0051163
2018-09895  0.270534 0.0114434
2018-00553 -0.018735 0.0685605
2017-28160 -3.863817 0.0503495
2019-17052  0.876597 0.0003854
2019-21505  0.438742 0.0056065
2019-04298  0.362942 0.0080070
2018-17068  0.850808 0.0001965
2018-15195 -1.506319 0.3206057
2020-09695  0.713738 0.0007805
2020-06161  0.392556 0.0054488
2020-10993  0.223602 0.0189850
2020-10315  0.442000 0.0028085
2020-18012  0.454074 0.0024622

Estimated Feature Scores:
     purpos_health health_human human_servic servic_carri carri_respons
beta        0.2411       0.2733       0.2738       0.2853        0.2396
psi        -5.6013      -0.8827      -0.8769      -5.0986       -3.3674
     respons_public public_health servic_develop develop_coordin coordin_enhanc
beta          0.266        0.2536         0.6801          0.4508         0.3383
psi          -4.913       -1.7323        -3.8995         -3.9077        -5.6196
     enhanc_physic physic_activ sport_particip seek_expand awar_benefit
beta        0.2825       0.3546         0.3335      0.3174         0.29
psi        -5.6089      -3.1950        -3.8841     -5.6155        -5.61
     regular_physic enhanc_coordi coordi_among among_privat privat_public
beta          0.304        0.2919       0.2707       0.2788        0.2958
psi          -4.632       -3.8189      -3.5698      -4.0678       -4.6306
     public_sector sector_promot expand_avail qualiti_inform inform_regard
beta        0.2438        0.3403       0.2791         0.1914         0.248
psi        -4.5032       -5.3323      -4.9151        -4.2064        -2.873
     privat_sector particular_emphasi communiti_specif access_knowledg
beta        0.2986              0.322           0.2745          0.2793
psi        -1.3169             -5.616          -5.6074         -5.6083
     activ_identifi
beta         0.3753
psi         -5.3392
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.336341045      Bush
2    0.250522840      Bush
3    0.428338283      Bush
4   -3.389286662      Bush
5   -0.383997601      Bush
6    0.329937926      Bush
7    0.856864477      Bush
8    0.697442114      Bush
9    0.186744444      Bush
10   0.734397415      Bush
11  -1.984275308      Bush
12   0.144052949      Bush
13   0.182828773      Bush
14   0.568876122      Bush
15  -3.874643592      Bush
16   0.392995099      Bush
17   0.432675215      Bush
18  -1.782633605      Bush
19  -2.159269142      Bush
20  -0.635482601      Bush
21   0.312422891      Bush
22   0.269173025      Bush
23  -1.111348774      Bush
24  -0.785318297      Bush
25   0.842494072      Bush
26   0.023706927      Bush
27   0.304761006      Bush
28   0.891760052      Bush
29   0.858770204      Bush
30  -0.237160625      Bush
31   0.648498370      Bush
32   0.600846713      Bush
33   0.389400197      Bush
34   0.402960008      Bush
35   0.272953275      Bush
36   0.339867660      Bush
37   0.877151387      Bush
38  -0.117029303      Bush
39  -1.179693290      Bush
40   0.433260063      Bush
41   0.208196453      Bush
42   0.352406038      Bush
43   0.112523226      Bush
44  -1.765231157      Bush
45   0.214140035      Bush
46   0.575354147      Bush
47   0.353814941      Bush
48   0.795562501      Bush
49  -1.100345428      Bush
50   0.912518243      Bush
51   0.277264744      Bush
52  -2.586266074      Bush
53   0.364763753      Bush
54   0.281818950      Bush
55   0.113046264      Bush
56  -1.027509668      Bush
57   0.484562583      Bush
58   0.564744048      Bush
59  -2.115157206      Bush
60  -1.394399395      Bush
61   0.312689526      Bush
62  -2.159391077      Bush
63  -1.954613210      Bush
64  -0.556143054      Bush
65   0.027495832      Bush
66   0.454081641      Bush
67   0.517969869      Bush
68  -2.097106592      Bush
69   0.296642661      Bush
70   0.249018931      Bush
71   0.367037555      Bush
72   0.186998952      Bush
73  -1.816859260      Bush
74  -0.340803579      Bush
75   0.337522325      Bush
76   0.179251942      Bush
77   0.854471538      Bush
78   0.278820662      Bush
79   0.359454188      Bush
80   0.434431000      Bush
81  -2.087141705      Bush
82   0.694781875      Bush
83  -0.880723718      Bush
84   0.341932985      Bush
85   0.365161917      Bush
86   0.526179005      Bush
87  -3.814906962      Bush
88  -0.133958626      Bush
89   0.452198096      Bush
90   0.277956473      Bush
91  -0.313842643      Bush
92   0.134659178      Bush
93   0.656703610      Bush
94  -0.812257188      Bush
95   0.494981638      Bush
96  -0.452855020      Bush
97  -0.458265128      Bush
98  -1.786657081      Bush
99  -3.877352358      Bush
100 -0.670231005      Bush
101 -1.561393173      Bush
102  0.464755081      Bush
103 -3.918184438      Bush
104 -0.035340853      Bush
105  0.497049431      Bush
106 -3.563100896      Bush
107 -0.528161095      Bush
108 -1.448901662      Bush
109  0.128813032      Bush
110  0.318017209      Bush
111  0.142174617      Bush
112  0.373808119      Bush
113 -0.065260694      Bush
114  0.869234484      Bush
115  0.880592051      Bush
116  0.103181970      Bush
117  0.386818133      Bush
118  0.141744934      Bush
119  0.461344012      Bush
120 -2.084489238      Bush
121  0.561769568      Bush
122  0.342526487      Bush
123  0.159526939      Bush
124 -2.154832632      Bush
125  0.807827793      Bush
126  0.211560763      Bush
127  0.418254329      Bush
128  0.529688089      Bush
129  0.267909617      Bush
130 -0.317455964      Bush
131 -0.698032300      Bush
132  0.364500633      Bush
133  0.053759271      Bush
134  0.185184372      Bush
135  0.828711471      Bush
136  0.477000194      Bush
137  0.889145068      Bush
138  0.310568691      Bush
139 -1.486351266      Bush
140  0.401960167      Bush
141  0.182308485      Bush
142  0.267457711      Bush
143 -0.674909164      Bush
144  0.891805167      Bush
145  0.672009389      Bush
146  0.217738817      Bush
147 -0.505553816      Bush
148  0.649235456      Bush
149  0.114712984      Bush
150  0.346657878      Bush
151  0.399691638      Bush
152 -3.203068162      Bush
153 -1.712578412      Bush
154  0.416239589      Bush
155  0.522752666      Bush
156  0.345963155      Bush
157  0.426377822      Bush
158 -1.877010546      Bush
159 -1.834181075      Bush
160  0.106216765      Bush
161  0.198618670      Bush
162  0.285591389      Bush
163  0.106855830      Bush
164  0.315617113      Bush
165  0.371929310      Bush
166  0.012803273      Bush
167  0.451331862      Bush
168  0.269448389      Bush
169 -0.408297032      Bush
170  0.905915225      Bush
171 -0.747713124      Bush
172  0.116433010      Bush
173  0.437814993      Bush
174  0.202054892      Bush
175  0.754170499      Bush
176  0.353811898      Bush
177  0.295957761      Bush
178  0.858744193      Bush
179  0.183140820      Bush
180 -0.421068798      Bush
181  0.902903818      Bush
182 -3.863469077      Bush
183  0.257099341      Bush
184  0.061561895      Bush
185  0.327677264      Bush
186  0.891159496      Bush
187  0.404381193      Bush
188  0.524412003      Bush
189  0.381737285      Bush
190  0.771843742      Bush
191  0.915166620      Bush
192 -0.053364708      Bush
193 -0.053193308      Bush
194  0.294140159      Bush
195  0.156544768      Bush
196  0.754449324      Bush
197  0.622174807      Bush
198  0.248083347      Bush
199  0.229422749      Bush
200 -0.602043309      Bush
201  0.177880949      Bush
202  0.215168735      Bush
203  0.590946456      Bush
204  0.220275099      Bush
205  0.759811043      Bush
206  0.205213522      Bush
207 -2.164172472      Bush
208 -2.346862201      Bush
209  0.878626153      Bush
210 -0.530776601      Bush
211  0.834005268      Bush
212  0.302732605      Bush
213  0.260835627      Bush
214  0.484109587      Bush
215  0.129826370      Bush
216  0.028038721      Bush
217  0.239894412      Bush
218  0.567321899      Bush
219  0.386696675      Bush
220  0.450547675      Bush
221  0.319562220      Bush
222 -0.332635494      Bush
223  0.400968002      Bush
224 -0.281544925      Bush
225  0.224841221      Bush
226  0.507104948      Bush
227 -0.742945151      Bush
228 -3.851519290      Bush
229  0.440105247      Bush
230 -2.102226083      Bush
231 -2.102959070      Bush
232  0.757465214      Bush
233 -0.848948649      Bush
234  0.272572707      Bush
235  0.494652043      Bush
236  0.330672152      Bush
237 -2.579768427      Bush
238  0.458414606      Bush
239  0.839167478      Bush
240  0.815163643      Bush
241  0.878840670      Bush
242  0.447744493      Bush
243  0.039372485      Bush
244  0.407037256      Bush
245 -0.288618639      Bush
246 -2.240597822      Bush
247 -1.623067283      Bush
248  0.162525830      Bush
249  0.313199262      Bush
250 -0.399388652      Bush
251 -3.879239866      Bush
252  0.224454887      Bush
253  0.482622843      Bush
254  0.367352042      Bush
255  0.483966691      Bush
256 -0.140425603      Bush
257 -0.258779461      Bush
258 -0.472696411      Bush
259 -1.605636360      Bush
260 -0.047054206      Bush
261  0.488782158      Bush
262  0.525950568      Bush
263  0.229216366      Bush
264  0.295691744      Bush
265  0.436279907      Bush
266 -0.233380500      Bush
267 -3.838676153      Bush
268 -0.158677910      Bush
269 -0.047966989      Bush
270  0.865873642      Bush
271  0.357027221      Bush
272 -2.597590271      Bush
273  0.771012796      Bush
274  0.352774401      Bush
275  0.269938814      Bush
276 -1.325856424      Bush
277  0.422700057      Bush
278  0.269779197      Bush
279 -3.843879668      Bush
280  0.305459789      Bush
281  0.273372905      Bush
282  0.198176294      Bush
283 -0.108856214      Bush
284 -0.471154460      Bush
285  0.426571287      Bush
286  0.200091187      Bush
287  0.857036994      Bush
288  0.898557402      Bush
289  0.881785663      Bush
290 -0.739546610      Bush
291 -1.201540248      Bush
292  0.311854971     Obama
293  0.883663913     Obama
294  0.022920464     Obama
295  0.889332005     Obama
296  0.333407267     Obama
297  0.300853761     Obama
298  0.228177171     Obama
299  0.526009912     Obama
300  0.438073857     Obama
301  0.402459972     Obama
302  0.203749697     Obama
303  0.099240677     Obama
304  0.901887746     Obama
305 -0.104014674     Obama
306  0.391026245     Obama
307  0.262256795     Obama
308  0.357389085     Obama
309  0.064453027     Obama
310  0.363841483     Obama
311 -0.128412373     Obama
312  0.212489215     Obama
313  0.884683319     Obama
314  0.200891630     Obama
315  0.924965652     Obama
316  0.180619463     Obama
317  0.153251791     Obama
318  0.293452982     Obama
319  0.884131817     Obama
320 -0.294561784     Obama
321  0.402757786     Obama
322  0.172162928     Obama
323 -2.597672799     Obama
324 -0.178911957     Obama
325  0.594083992     Obama
326  0.319887229     Obama
327 -3.918685637     Obama
328  0.328572712     Obama
329  0.432183263     Obama
330  0.470376487     Obama
331  0.338818934     Obama
332  0.245260471     Obama
333 -0.342034312     Obama
334  0.314402065     Obama
335  0.194398413     Obama
336  0.253402821     Obama
337  0.177196433     Obama
338 -0.895576888     Obama
339  0.339923614     Obama
340  0.286942613     Obama
341  0.437365519     Obama
342  0.180549915     Obama
343  0.562579570     Obama
344 -0.116271143     Obama
345 -3.919908466     Obama
346 -1.126204281     Obama
347  0.896967322     Obama
348  0.041253440     Obama
349  0.258665773     Obama
350  0.897831444     Obama
351  0.322193591     Obama
352  0.275005134     Obama
353  0.069723332     Obama
354  0.178044886     Obama
355  0.849939058     Obama
356  0.358939419     Obama
357  0.443543333     Obama
358  0.471741094     Obama
359  0.251441375     Obama
360  0.172995819     Obama
361  0.380107700     Obama
362 -1.952514751     Obama
363  0.336846482     Obama
364  0.039167245     Obama
365  0.224459782     Obama
366  0.265392589     Obama
367 -0.044890128     Obama
368  0.896823087     Obama
369 -1.875677355     Obama
370  0.918688746     Obama
371 -3.932288721     Obama
372 -1.126513872     Obama
373  0.365019768     Obama
374  0.394432464     Obama
375  0.412917118     Obama
376  0.836038600     Obama
377  0.402485124     Obama
378 -0.017570925     Obama
379 -1.110119695     Obama
380  0.760349020     Obama
381  0.345899780     Obama
382  0.371961153     Obama
383  0.648814176     Obama
384  0.464733907     Obama
385 -0.105868974     Obama
386  0.205532174     Obama
387 -3.771645160     Obama
388  0.324757850     Obama
389  0.376246416     Obama
390  0.113719567     Obama
391  0.880066872     Obama
392  0.330860796     Obama
393  0.123417620     Obama
394 -3.785225407     Obama
395  0.500417876     Obama
396  0.341793323     Obama
397  0.387246481     Obama
398 -1.265264743     Obama
399  0.029589065     Obama
400  0.289271925     Obama
401  0.329956746     Obama
402  0.258129772     Obama
403  0.206427498     Obama
404  0.437929630     Obama
405  0.898040114     Obama
406  0.282510385     Obama
407 -1.211550326     Obama
408  0.748103964     Obama
409 -2.596456404     Obama
410 -0.040383461     Obama
411 -1.658062487     Obama
412  0.364482622     Obama
413 -2.596456404     Obama
414  0.387024917     Obama
415  0.484618940     Obama
416  0.424902378     Obama
417  0.315440854     Obama
418  0.433299893     Obama
419  0.212476764     Obama
420 -3.831887243     Obama
421  0.891848907     Obama
422  0.336694461     Obama
423  0.887681753     Obama
424  0.352059133     Obama
425  0.287037735     Obama
426  0.849489022     Obama
427  0.157982954     Obama
428  0.869362714     Obama
429  0.873936943     Obama
430  0.838978517     Obama
431 -3.881078312     Obama
432  0.388926944     Obama
433  0.769238338     Obama
434  0.405645553     Obama
435  0.310979950     Obama
436 -3.932288721     Obama
437  0.251352534     Obama
438  0.395805121     Obama
439  0.368309643     Obama
440  0.741946487     Obama
441  0.176391418     Obama
442  0.497928642     Obama
443  0.189166292     Obama
444  0.282053461     Obama
445 -0.119265671     Obama
446  0.509973974     Obama
447  0.469711425     Obama
448  0.333411930     Obama
449  0.402713331     Obama
450 -1.512372221     Obama
451  0.129489891     Obama
452 -1.926398358     Obama
453  0.916542466     Obama
454  0.900171186     Obama
455  0.895784532     Obama
456  0.373781270     Obama
457  0.346925127     Obama
458  0.167436143     Obama
459 -2.596456404     Obama
460 -0.093835538     Obama
461  0.093867996     Obama
462  0.268941514     Obama
463  0.868937000     Obama
464 -1.301792251     Obama
465  0.468842464     Obama
466 -0.038860769     Obama
467  0.313664625     Obama
468  0.278559059     Obama
469  0.132174535     Obama
470  0.290578073     Obama
471 -2.597672799     Obama
472  0.917192105     Obama
473  0.421864882     Obama
474 -2.166313793     Obama
475  0.860821322     Obama
476  0.355133616     Obama
477  0.311269594     Obama
478  0.502314156     Obama
479  0.330206657     Obama
480  0.338922981     Obama
481  0.319027771     Obama
482  0.520588582     Obama
483  0.302437536     Obama
484  0.228366785     Obama
485  0.146117962     Obama
486 -2.598089177     Obama
487  0.187330714     Obama
488  0.482033557     Obama
489 -0.397019712     Obama
490  0.355522316     Obama
491  0.448626016     Obama
492  0.301780708     Obama
493  0.394146904     Obama
494  0.918969160     Obama
495  0.916687489     Obama
496  0.916596003     Obama
497 -3.853677081     Obama
498  0.427908757     Obama
499  0.277829196     Obama
500  0.228103163     Obama
501  0.293643585     Obama
502  0.330790839     Obama
503  0.417361827     Obama
504  0.918286259     Obama
505  0.385474348     Obama
506  0.461273174     Obama
507  0.856101442     Obama
508  0.088019624     Obama
509  0.335677097     Obama
510 -1.390964941     Obama
511  0.254502561     Obama
512  0.442326595     Obama
513  0.008511020     Obama
514  0.283136017     Obama
515  0.310173464     Obama
516 -0.610222919     Obama
517  0.247258415     Obama
518  0.255215521     Obama
519 -0.407254542     Obama
520  0.280770115     Obama
521  0.332805077     Obama
522  0.327978498     Obama
523  0.432146976     Obama
524 -0.270262056     Obama
525  0.301384543     Obama
526  0.563783186     Obama
527  0.253943939     Obama
528  0.376550372     Obama
529 -0.031615347     Obama
530  0.582236287     Obama
531 -0.022618275     Obama
532  0.175045591     Obama
533  0.402972952     Obama
534  0.198815844     Obama
535  0.457804439     Obama
536  0.322400912     Obama
537  0.491200679     Obama
538  0.468463313     Obama
539  0.333999603     Obama
540  0.312133672     Obama
541  0.318064903     Obama
542 -0.560217739     Obama
543 -2.598089177     Obama
544  0.872780287     Obama
545  0.165428162     Obama
546  0.248822674     Obama
547  0.223309806     Obama
548  0.859357678     Obama
549  0.314281089     Obama
550  0.315745400     Obama
551 -1.893739582     Obama
552  0.250960783     Obama
553  0.828833561     Obama
554 -0.311758555     Obama
555  0.782813947     Obama
556  0.023960255     Obama
557  0.087204471     Obama
558  0.395242729     Obama
559  0.902348215     Obama
560  0.294041252     Obama
561  0.145234260     Obama
562 -0.076349127     Obama
563  0.917148015     Obama
564  0.353839194     Obama
565  0.924739530     Obama
566  0.315608598     Obama
567 -1.873812493     Trump
568  0.511717215     Trump
569  0.409894349     Trump
570 -2.465088586     Trump
571 -0.482834188     Trump
572  0.877390448     Trump
573  0.286806734     Trump
574 -0.599718164     Trump
575  0.191378761     Trump
576  0.483549590     Trump
577  0.291417939     Trump
578  0.420959978     Trump
579 -2.533806917     Trump
580 -0.104230093     Trump
581  0.165984043     Trump
582  0.450216842     Trump
583  0.287478243     Trump
584  0.187295672     Trump
585  0.705445323     Trump
586  0.875574064     Trump
587  0.496041741     Trump
588 -1.624747165     Trump
589  0.024161487     Trump
590 -1.463133941     Trump
591  0.519390247     Trump
592  0.404725174     Trump
593  0.039041091     Trump
594  0.791007987     Trump
595  0.809093584     Trump
596  0.427502961     Trump
597  0.065111399     Trump
598  0.350082075     Trump
599  0.701068242     Trump
600  0.532480531     Trump
601  0.306219649     Trump
602  0.257504542     Trump
603  0.500632896     Trump
604  0.410602832     Trump
605  0.308504104     Trump
606 -0.543333241     Trump
607  0.345058659     Trump
608  0.382949768     Trump
609  0.870396256     Trump
610  0.191588662     Trump
611  0.029955312     Trump
612  0.059356084     Trump
613  0.395199463     Trump
614  0.754990603     Trump
615  0.448804834     Trump
616  0.427275275     Trump
617 -0.608693686     Trump
618  0.449933740     Trump
619  0.279146759     Trump
620  0.423271376     Trump
621  0.618726742     Trump
622  0.076440635     Trump
623  0.427925536     Trump
624  0.264143673     Trump
625 -0.022052536     Trump
626  0.362376785     Trump
627  0.457016680     Trump
628  0.615722588     Trump
629  0.369317773     Trump
630  0.827193392     Trump
631  0.339506217     Trump
632  0.871379654     Trump
633  0.361139072     Trump
634  0.198200389     Trump
635  0.245777567     Trump
636  0.536910030     Trump
637  0.345045721     Trump
638  0.306250729     Trump
639  0.467130149     Trump
640  0.522253259     Trump
641  0.288576518     Trump
642  0.407053490     Trump
643  0.247350436     Trump
644  0.272076626     Trump
645  0.415370915     Trump
646  0.448617302     Trump
647  0.119104276     Trump
648  0.896932078     Trump
649  0.304921378     Trump
650 -0.201765786     Trump
651 -0.093073844     Trump
652  0.258347248     Trump
653  0.455355333     Trump
654  0.470510834     Trump
655  0.408475363     Trump
656  0.288640540     Trump
657 -0.419305448     Trump
658  0.524751856     Trump
659  0.435203765     Trump
660  0.137521788     Trump
661  0.341056422     Trump
662  0.164164921     Trump
663  0.868341802     Trump
664  0.544067061     Trump
665 -0.043848278     Trump
666  0.484076825     Trump
667  0.482717461     Trump
668  0.421143094     Trump
669  0.314663028     Trump
670  0.286303604     Trump
671  0.192631555     Trump
672  0.069035022     Trump
673  0.376318597     Trump
674 -3.932288721     Trump
675  0.222783795     Trump
676  0.697191420     Trump
677  0.131439000     Trump
678  0.542019439     Trump
679  0.485078476     Trump
680  0.256450973     Trump
681  0.428498264     Trump
682  0.320104257     Trump
683  0.265590065     Trump
684  0.465453081     Trump
685  0.356034901     Trump
686  0.879903380     Trump
687  0.360526301     Trump
688  0.565118383     Trump
689 -0.045993676     Trump
690  0.486410100     Trump
691  0.007308059     Trump
692  0.041161583     Trump
693  0.152047320     Trump
694  0.301246016     Trump
695 -1.782300442     Trump
696 -0.099998025     Trump
697  0.882577565     Trump
698  0.432225564     Trump
699 -1.005927320     Trump
700  0.855738126     Trump
701 -1.311549056     Trump
702  0.200533935     Trump
703  0.246344166     Trump
704  0.869448298     Trump
705  0.340685763     Trump
706  0.389705636     Trump
707  0.249349091     Trump
708  0.217186157     Trump
709  0.745704192     Trump
710 -1.855021038     Trump
711 -0.582569024     Trump
712  0.204236345     Trump
713  0.885808903     Trump
714  0.397640648     Trump
715 -1.864003718     Trump
716  0.332349405     Trump
717  0.408833446     Trump
718  0.430837880     Trump
719  0.306283866     Trump
720  0.761523474     Trump
721  0.397923744     Trump
722  0.376546519     Trump
723  0.316501965     Trump
724  0.552716561     Trump
725  0.436647466     Trump
726  0.868470804     Trump
727  0.279389204     Trump
728  0.139933827     Trump
729 -2.099598716     Trump
730  0.326707565     Trump
731  0.193587596     Trump
732  0.426014979     Trump
733  0.163603142     Trump
734  0.865419341     Trump
735  0.321417278     Trump
736 -3.814988156     Trump
737  0.246713023     Trump
738 -3.865426022     Trump
739  0.349535090     Trump
740  0.206884667     Trump
741 -3.932288721     Trump
742  0.862247743     Trump
743  0.297841204     Trump
744  0.348961003     Trump
745  0.885868535     Trump
746  0.898285967     Trump
747  0.236143208     Trump
748  0.351829730     Trump
749  0.121092418     Trump
750  0.389540816     Trump
751  0.200981523     Trump
752  0.844345545     Trump
753  0.346331307     Trump
754 -0.125665540     Trump
755  0.321770080     Trump
756  0.265018777     Trump
757  0.389643166     Trump
758  0.431846053     Trump
759  0.048266032     Trump
760  0.724147934     Trump
761 -0.436327692     Trump
762  0.391056027     Trump
763  0.318840945     Trump
764  0.391249549     Trump
765  0.256193411     Trump
766 -0.560741151     Trump
767  0.318511789     Trump
768  0.548691038     Trump
769  0.360652954     Trump
770  0.780720078     Trump
771  0.197582025     Trump
772  0.830350896     Trump
773  0.440645195     Trump
774  0.270533815     Trump
775 -0.018735252     Trump
776 -3.863817364     Trump
777  0.876596598     Trump
778  0.438742284     Trump
779  0.362941597     Trump
780  0.850807972     Trump
781 -1.506318583     Trump
782  0.713738081     Trump
783  0.392555963     Trump
784  0.223602450     Trump
785  0.442000325     Trump
786  0.454073999     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, 209,366 features (99.82% sparse) and 1 docvar.
          features
docs       purpos_health_human health_human_servic human_servic_carri
  02-14807                   1                   2                  1
  02-11166                   0                   4                  0
  01-2851                    0                   3                  0
  04-11991                   0                   1                  0
  03-12661                   0                   0                  0
  03-24217                   0                   2                  0
          features
docs       servic_carri_respons carri_respons_public respons_public_health
  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       public_health_human human_servic_develop servic_develop_coordin
  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       develop_coordin_enhanc
  02-14807                      1
  02-11166                      0
  01-2851                       0
  04-11991                      0
  03-12661                      0
  03-24217                      0
[ reached max_ndoc ... 782 more documents, reached max_nfeat ... 209,356 more features ]
quanteda::ntoken(dfmat_eo_text_trigrams)
     02-14807      02-11166       01-2851      04-11991      03-12661 
          285           375           323           307             9 
     03-24217      03-19573      03-20013      03-29644       04-1322 
          192           507           700           284           150 
     04-18575      04-20050      04-20052      03-32332      03-32328 
          128           656           688            65           188 
      04-6622      04-12745      04-13123      03-30913      03-30513 
          233           298            42            45            47 
      03-7736       03-5343       03-8108       05-7830       05-3385 
         4218          2319            48            47           183 
     04-28079      04-10024      05-13214      03-22543      03-13750 
          401           403           457           494             8 
     03-14116      03-14117        08-970        07-780       07-2027 
           86            43           710            85          1731 
      07-2570       08-1215       07-5919      E8-28912       04-4884 
          416           378           108           245           389 
      04-4436       04-4451      04-10377       04-8616      05-12284 
          188           410           516            92            16 
     05-12354      04-26684      04-26686      04-25866       08-1480 
          119            79           244           116           381 
      07-4906       07-4907       07-4023        08-797       08-1409 
          475            74           124           104          1095 
      07-4600       07-5299      E8-23235       05-5097        E9-811 
           39           195           100           169           119 
       E9-814       07-6022       07-1816      01-31671      01-31670 
          135            45           134            66           104 
      07-5816       01-4622       01-6558       02-7087       07-3656 
           60           339            97           228           500 
      07-3593      E8-27777      E8-30042       E9-1574       E9-1538 
          317           355            59           381           116 
       E9-818      01-16668       02-1594        02-917       02-4071 
          347           359            81            75           258 
      02-5069       01-8835       01-8836       02-2638        02-918 
          221           105            20           445           149 
     01-29831      E8-30700      02-14497      02-31624      02-16040 
           58           206            27           283           261 
     02-16041      01-28762      01-29219      01-27917        06-554 
          116           130            45           938            43 
      06-4652        07-293       06-9993       06-9896      05-21571 
          118           342            42           205           383 
     05-20944      02-21056        03-464      03-11969      03-12071 
         1578           286           179           202            85 
      03-7313      03-10194      01-14319      01-15958      01-24917 
           51            75            73           432           176 
     01-24983      02-17274       06-4132       06-4121       06-9020 
          155           632           259           518           443 
      06-9619       06-7220       06-3865       06-2362      01-31959 
          419           396           365           255            97 
      01-9086      01-26509      01-26339      01-30624      01-13381 
          127          1705           527            45           297 
      03-2606       03-1798       03-8832      03-19675       07-3259 
          287           295           113           129            11 
      07-3258       07-2367       06-6101      05-20156      04-17636 
           20           119           100            23           308 
     04-15787       03-5848      E8-24465       05-9892       07-2518 
           19           222           349           146           163 
     E8-20436      01-15758      01-13869       06-5592      01-21338 
           45           323           266           380           188 
      04-2773      03-20764      03-31594      04-11592      04-11271 
          781            13            43           542           451 
      04-2408       04-1941       01-3883       01-2852      04-10378 
          248           125            31           319           372 
     04-20051      03-05344       03-6445       03-8109      03-12766 
          864           652           213            61           214 
      06-7492      05-19993      05-22132      05-22133       07-3112 
          349           444           233           247           359 
     01-25788       03-2069      03-19572      04-17150      04-17205 
           15           423            52           263           462 
     04-17204      04-20049      04-19909      04-24098      03-19676 
           28           403           194           390           322 
      06-5828       06-5829       06-8769        07-374       06-5984 
          192           433           399           956            11 
     05-23412      05-24596      05-24597      05-24255       06-5351 
          357           192           142           866           211 
      06-4085       06-4552       06-9770       06-9148       03-7160 
          402           426            31            44           161 
      07-3835       01-4624      01-17041      01-13117      01-13116 
          385            34            20           172           219 
     02-16951      02-17273      02-22526       01-4621       01-4623 
          150            54           100           747            45 
     01-29948      02-07086      02-07085      01-31119      03-11713 
          385           326            85            20           100 
     02-25900      02-32518      03-10606       06-1316      01-19562 
          117            52           232           510           105 
     01-24205      01-25677      01-25344      03-16102      04-23994 
          587          1130           450           126            99 
     01-11210      01-11505      02-29580      02-29832      02-31831 
           15           282           323           293           754 
     04-15933      04-15934      03-24919      05-13098       05-1886 
          329           231           321           488           167 
     04-28404      04-22212        05-306        05-771      04-26685 
           72           162           191           276           184 
     04-27076      04-21411      05-14452        08-658       05-7831 
         1393           115            53           436            39 
      05-1170       05-5434      E8-24342      03-13694      03-13412 
           80            94            87           464           276 
       08-761       06-9561        07-419       06-9895      05-15160 
          365            27            12           332            47 
      02-9536        02-919       02-3337       02-3826      01-14862 
         1731            38            11           443            28 
        08-62        08-325        08-360      E8-29564      01-31665 
          188           327           677           118            47 
     01-31667      01-31668      01-31669      01-31672       08-1182 
           79           114            71            89            32 
     02-17640      01-23359      02-24252       04-3170      02-31832 
          312           276           352           602           282 
     01-26990        02-448       06-9632       05-6907       07-5270 
           20           188           105            44           444 
     E8-17940       08-1472      E8-26531       07-4115      E8-27771 
         3670            62           196           230            77 
     E8-23125        08-568        08-483       04-5322      E8-21651 
          251            91           305           190           207 
      07-1704       07-2462       07-1137       07-1152       08-1348 
           44           394           458            46           243 
      07-4890      04-11058       07-3552       08-1399       07-5726 
          351           690           364           252           570 
     01-31666    2015-03714    2015-07788    2015-07016    2015-05677 
           81           949           495          3259           537 
   2015-18292    2015-19183     2010-9078    2010-10172     2010-7154 
          264           759           230           233           382 
   2010-11557     2010-9796    2015-16334    2011-19156    2015-20801 
          155           356           210           429           315 
   2015-22888     2010-4884     2010-1229       2010-38    2010-12805 
           96           180            72           260           318 
    2010-3725    2011-30990    2010-24839    2011-26574    2011-12645 
          215           105           568           117           350 
   2011-29683    2011-17953    2011-17447    2014-11442    2014-06768 
          350           186           269           580           144 
   2014-08426    2012-22030    2011-32486    2014-03805    2013-05967 
          268           472            61           616           566 
   2014-22805    2013-31445    2014-18561    2014-17522    2010-29579 
         1126           184          1405           102           818 
    2012-1568      E9-11547      E9-26834      E9-23886      E9-29781 
          522          1319           170           119           708 
    2012-7636    2013-08501    2011-21704    2011-26729    2013-15942 
          742            61           445           914           550 
   2013-16387    2012-31574    2012-30060    2012-30170    2013-00002 
          457            59           430            80           190 
   2013-28581    2014-07895    2011-15181    2010-18169     2010-8878 
          108           488           483           981           495 
   2010-21016    2010-21020    2013-17478    2014-03474    2014-16360 
         1113           149           598            42           432 
   2011-18065    2010-28854       E9-1893       E9-2893       E9-1712 
          371           298           672           502           431 
     E9-28493      E9-30020       E9-2484       E9-3106    2014-18998 
          842            66           653            29           366 
   2014-30195    2014-29625    2010-22002    2014-29121    2014-30323 
          212           208           501            87           419 
   2014-30363    2014-24851    2016-30272    2016-30101    2016-31792 
          184           143           131            90           127 
   2016-31922    2016-30277    2017-01623    2017-01169    2015-29403 
          280          1130          2664           801           136 
   2016-29519    2017-01487    2017-01197     2011-5903     2011-8642 
         1234           106           324            79            86 
   2011-28728    2011-33087    2010-27004    2010-28365    2010-28360 
          417           238           872           105           468 
   2011-13173    2010-25578       E9-5441      E9-31098      E9-28022 
          441           979           181           205           428 
     E9-25268    2016-06250    2016-07703    2016-08713    2016-03141 
          717           658           165            68           449 
   2015-02379    2015-01522    2015-01255    2016-26753    2015-30191 
          705           657           539            37           482 
   2016-03038    2016-24066    2016-24847    2016-22962    2016-28203 
          712           673           206            65           704 
   2016-29165    2016-11300    2016-12579    2016-15542     2012-9473 
          345           447            65           539           318 
   2012-10715    2012-10968     2012-5366    2012-27002    2013-08626 
          905           510           350           477           204 
   2012-10034    2012-18868     2012-3097    2012-11798    2012-12889 
          562          1176           563           374           114 
   2012-19055    2012-17022    2012-18237    2012-25236    2012-15954 
         1244           963           375          1329           351 
   2016-31875    2016-27156    2016-22454    2016-27171    2017-01489 
          192           816           121          1080           134 
   2015-32582    2017-01164    2017-01168    2016-29169    2015-13055 
          184           224           103           288           100 
   2015-19209    2016-17945    2016-18872    2015-17926    2015-15828 
          757           221           148           104            30 
   2015-16122    2016-25288    2016-25290    2016-20713    2015-29498 
          645           291          1003            99           142 
   2016-02475    2015-31749    2015-00058    2016-06355    2016-09483 
          739            95           383           617           545 
   2016-09346    2016-04770    2015-23630    2015-15495    2015-25744 
          401           155           393            65           189 
   2015-22998    2015-25489    2016-01325    2015-32060    2016-12307 
          782           329          1028           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 
           61           372           404           899           742 
   2011-33335     2010-2419     2010-5837      E9-31418 C1-2009-31418 
          116           437           446          5460            24 
    2010-4593    2013-26785    2010-18988    2011-33089    2010-15851 
          510          1257             0           336           350 
   2010-16864    2014-14432    2014-14429    2013-19220    2012-24374 
          692           104            67           942           853 
   2012-22062    2011-31624    2014-04254    2013-24388    2014-01523 
         1001          1048           735           543           148 
   2014-05323    2014-06141    2014-06612    2010-32960    2014-18682 
          400           404           383           204            79 
     2010-705    2010-14613    2011-14919    2011-15443     2011-5728 
          231           560           312           386           921 
    2011-4753     2011-3257     2011-2577     2011-9739     2011-1385 
          438           436           281           200           512 
   2014-23228    2014-24218    2014-25292    2014-25439    2012-12881 
         1108            90            78           426           169 
   2012-12882    2012-12883       E9-1719       E9-3113       E9-5802 
          119           133          1001           471           461 
     E9-16034      E9-15368       E9-1885       E9-1895       E9-3112 
           21           358           739           255           238 
      E9-3108       E9-8572       E9-2483       E9-2486       E9-2485 
           46           319           227            29           710 
     E9-26408      E9-30413      E9-27441      E9-24518       E9-4068 
          148            25           681          2427           233 
      E9-4103     2012-7019      E9-28805      E9-24203      E9-23915 
           22          2145           403           407            22 
   2012-22807    2013-06712    2013-03915     2012-2557    2013-12157 
          746           278          1308            88            63 
   2012-10884     2012-6797    2012-30310    2013-15782    2013-13523 
          521           499           769           542          1773 
   2011-26141    2013-07837    2012-31225    2010-31878    2013-19520 
          168           295            87           280           297 
   2014-09343    2014-12651    2010-12070     2010-9451    2012-20259 
           13           158           169           253           627 
   2012-17264     2012-3616    2013-12650    2013-11533    2011-21505 
          479           410            70           452           397 
   2011-23891    2012-12225    2012-15183    2018-27945    2017-23630 
          578           361           688            82           673 
   2017-27034    2018-04860    2018-08883    2018-05916    2018-05113 
          165           508           763           228           615 
   2018-11101    2018-00240    2017-23270    2017-27899    2018-07874 
          578            45            64           393           793 
   2018-15202    2018-13640    2018-15955    2018-15299    2019-24288 
          636           669           825           392            81 
   2019-26178    2019-05370    2019-16383    2018-02261    2018-00630 
          453           136           557           319           240 
   2018-08272    2018-11939    2018-13696    2019-10398    2020-17364 
          373           871           308           762           431 
   2020-17699    2020-17700    2020-07530    2020-27948    2021-01094 
          370           397          1444           750           143 
   2021-01228    2020-12030    2018-04414    2020-03556    2020-27740 
          222          1122           433            87           346 
   2019-07645    2019-21630    2019-09750    2019-12802    2019-13945 
          388           250          1068           630           765 
   2019-22849    2019-20804    2019-23525    2019-22623    2019-22624 
          929          1028           441           719          1000 
   2019-00615    2019-04595    2019-01426    2020-14337    2020-12584 
          145           141           380           521          1231 
   2020-22510    2020-29235    2020-22064    2020-24793    2020-28605 
          501           572          1161           744          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           287          1258           731           286 
   2017-13458    2017-13012    2017-02762    2017-10004    2017-15860 
           61           740           148          1203           446 
   2017-08586    2017-03113    2017-03115    2017-03116    2017-03118 
          230           541           211           110           232 
   2017-02450    2017-02451    2017-09156    2017-06716    2017-20647 
         1001           329           302           326           887 
   2017-21555    2017-21559    2017-09083    2017-08905    2017-08311 
          265           103           319           205           441 
   2017-06967    2017-06971    2017-04357    2017-04107    2017-02095 
          273           111           551           380           951 
   2017-02029    2017-01799    2017-06576    2017-06382    2020-00534 
          253           183           952            52           744 
   2020-02439    2020-27065    2020-06969    2020-06985    2020-10953 
          916           978           525           146           283 
   2020-07800    2020-03337    2020-09537    2020-19032    2020-21129 
          312           554           145           220           374 
   2021-00040    2020-13449    2017-14992    2017-05399    2017-02281 
          184           726            85           186          1041 
   2017-06968    2017-14378    2017-10003    2017-08818    2017-09161 
          281           445           319           450           106 
   2017-09087    2017-09574    2017-18468    2017-18134    2017-04837 
          781           229           277          1553          2374 
   2017-04353    2017-02102    2017-08990    2017-08908    2017-18679 
          168           761           178           348            60 
   2018-27515    2018-26552    2017-22677    2017-27925    2018-10855 
          671            82           496           572           553 
   2018-10403    2018-11335    2018-11913    2018-11916    2018-11936 
          443           235          1232          1344           245 
   2018-20816    2019-07656    2019-05934    2019-15159    2019-15449 
         1001           959           642           480           360 
   2019-10538    2019-27678    2019-08797    2019-04437    2019-13793 
          713            82          1175           705           607 
   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           568           264           195           772 
   2020-08846    2020-09536    2020-21160    2020-23115    2020-23116 
          116           353           630           449           890 
   2020-23780    2019-24040    2019-19367    2019-22749    2019-22073 
          902           598           266           304           854 
   2019-19895    2019-06325    2019-06548    2019-14016    2019-28286 
          300          1289           195           700           187 
   2019-27217    2019-13175    2019-00048    2020-12953    2019-02544 
          258           312           184           650          1141 
   2019-00014    2018-24254    2018-26156    2020-14077    2020-14509 
          919           465           465          1005           794 
   2020-14328    2020-18015    2020-15338    2020-15646    2020-20887 
           55           463           599          1029           345 
   2020-09645    2020-04755    2021-01643    2021-01644    2021-01645 
           78           212          1026           291           593 
   2021-01713    2021-01714    2021-01712    2020-14872    2020-08392 
           51          1279           156           892            82 
   2020-06478    2020-16625    2020-21914    2020-21534    2020-12430 
          272           272          2137          1572           490 
   2020-02438    2020-25459    2020-21960    2018-20203    2018-19514 
          519           557           486          1008           473 
   2018-09895    2018-00553    2017-28160    2019-17052    2019-21505 
          423           346           193           486           266 
   2019-04298    2018-17068    2018-15195    2020-09695    2020-06161 
          329          2499           164           964           234 
   2020-10993    2020-10315    2020-18012 
          157          1140          1315 
dfmat_eo_text_trigrams[ntoken(dfmat_eo_text_trigrams) <= 0, ]
Document-feature matrix of: 1 document, 209,366 features (100.00% sparse) and 1 docvar.
            features
docs         purpos_health_human health_human_servic human_servic_carri
  2010-18988                   0                   0                  0
            features
docs         servic_carri_respons carri_respons_public respons_public_health
  2010-18988                    0                    0                     0
            features
docs         public_health_human human_servic_develop servic_develop_coordin
  2010-18988                   0                    0                      0
            features
docs         develop_coordin_enhanc
  2010-18988                      0
[ reached max_nfeat ... 209,356 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: 3 documents, 8,990 features (100.00% sparse) and 1 docvar.
               features
docs            health_human_servic human_servic_carri servic_carri_respons
  03-14116                        0                  0                    0
  06-9770                         0                  0                    0
  C1-2009-31418                   0                  0                    0
               features
docs            carri_respons_public respons_public_health public_health_human
  03-14116                         0                     0                   0
  06-9770                          0                     0                   0
  C1-2009-31418                    0                     0                   0
               features
docs            human_servic_develop regular_physic_activ enhanc_coordi_among
  03-14116                         0                    0                   0
  06-9770                          0                    0                   0
  C1-2009-31418                    0                    0                   0
               features
docs            privat_public_sector
  03-14116                         0
  06-9770                          0
  C1-2009-31418                    0
[ reached max_nfeat ... 8,980 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.457814 0.0122616
02-11166   -0.272884 0.0263414
01-2851    -0.397551 0.0105745
04-11991    1.677609 0.4271609
03-12661   -0.354705 0.1363615
03-24217   -0.504088 0.0100282
03-19573   -1.101064 0.0010088
03-20013   -0.978520 0.0017272
03-29644   -0.623827 0.0152368
04-1322    -0.898512 0.0038659
04-18575   -1.387134 0.0019636
04-20050    0.042710 0.0370663
04-20052    0.142847 0.0449899
03-32332   -0.399065 0.0326390
03-32328    4.347669 0.2400789
04-6622    -0.015939 0.0550465
04-12745   -0.396096 0.0104256
04-13123    1.676320 0.6722039
03-30913    2.099083 0.4020921
03-30513   -0.177272 0.0828273
03-7736    -0.087221 0.0202542
03-5343    -0.211797 0.0137229
03-8108    -0.207126 0.1085556
05-7830     0.223338 0.1541283
05-3385    -1.106323 0.0017909
04-28079   -0.007837 0.0345817
04-10024   -0.372853 0.0268718
05-13214   -1.144869 0.0010403
03-22543   -1.116377 0.0011426
03-13750   -0.306257 0.1279517
03-14117   -0.057880 0.1000347
08-970     -0.347555 0.0192160
07-780     -0.112662 0.0878563
07-2027     0.048914 0.0472942
07-2570    -0.081949 0.0372931
08-1215    -1.112681 0.0010484
07-5919    -1.435160 0.0023861
E8-28912    0.702998 0.2638996
04-4884    -0.442075 0.0189433
04-4436    -0.144228 0.0462421
04-4451    -0.301707 0.0235816
04-10377    0.094188 0.0547423
04-8616    -1.468885 0.0028277
05-12284   -0.091267 0.1098313
05-12354   -0.381721 0.0332767
04-26684   -0.562327 0.0122056
04-26686   -1.042938 0.0019413
04-25866    0.972394 0.2976112
08-1480    -1.154808 0.0010593
07-4906    -0.433625 0.0102842
07-4907     0.028048 0.0709629
07-4023    -0.557139 0.0113330
08-797     -0.542317 0.0131332
08-1409     1.331685 0.1623319
07-4600    -0.088559 0.1209388
07-5299    -0.033162 0.0633266
E8-23235   -0.655046 0.0106440
05-5097     0.007851 0.1005017
E9-811     -0.394246 0.0208946
E9-814     -0.544872 0.0122776
07-6022     2.096436 0.4101006
07-1816    -1.385227 0.0020130
01-31671   -0.516242 0.0165566
01-31670   -0.528623 0.0169269
07-5816     0.028213 0.0956111
01-4622    -0.390376 0.0233093
01-6558    -1.445951 0.0027504
02-7087    -0.614564 0.0066678
07-3656     0.371385 0.1404659
07-3593    -0.021564 0.0378940
E8-27777   -0.294699 0.0266165
E8-30042    1.917120 0.3815258
E9-1574     0.580491 0.1882362
E9-1538    -0.005951 0.0668358
E9-818     -0.121107 0.0303197
01-16668   -1.122002 0.0013299
02-1594    -0.617500 0.0189376
02-917     -0.566069 0.0120189
02-4071    -0.335705 0.0287996
02-5069    -0.634738 0.0103046
01-8835    -0.875338 0.0047439
01-8836    -0.369330 0.1305970
02-2638    -0.076821 0.0445350
02-918     -0.607051 0.0118172
01-29831   -0.293936 0.0616364
E8-30700    4.075936 0.2032132
02-14497   -0.064202 0.0985541
02-31624   -0.258468 0.0239672
02-16040   -0.067837 0.0595805
02-16041   -0.248876 0.0978222
01-28762   -0.026017 0.0705228
01-29219   -0.908993 0.0093196
01-27917   -0.039349 0.0617691
06-554      0.025790 0.0950724
06-4652    -0.219403 0.0460170
07-293      0.950905 0.3900908
06-9993     1.676320 0.6722039
06-9896     4.259985 0.2270581
05-21571    0.268093 0.0636909
05-20944    0.003572 0.0454720
02-21056   -0.268930 0.0423066
03-464      4.312210 0.2360680
03-11969   -0.011069 0.0477267
03-12071   -0.226564 0.0585754
03-7313     3.504209 0.4163656
03-10194   -0.009490 0.1192038
01-14319    0.747414 0.4359801
01-15958   -0.344987 0.0246485
01-24917   -0.531843 0.0098608
01-24983   -0.314556 0.0255536
02-17274   -0.271129 0.0222203
06-4132     0.096507 0.0794211
06-4121    -1.133599 0.0010530
06-9020    -1.129386 0.0010310
06-9619     0.054491 0.0618913
06-7220    -0.298397 0.0385599
06-3865     0.080441 0.0565034
06-2362    -0.396555 0.0119762
01-31959   -1.435796 0.0027134
01-9086    -0.684191 0.0144983
01-26509   -0.175379 0.0173010
01-26339   -0.296892 0.0229165
01-30624    2.093007 0.4145183
01-13381   -1.099448 0.0018948
03-2606    -0.139439 0.0335743
03-1798    -0.441049 0.0202278
03-8832    -0.351574 0.0409334
03-19675    0.023750 0.0716645
07-3259    -0.414798 0.0607940
07-3258    -0.041120 0.1351664
07-2367    -0.177697 0.0434596
06-6101    -1.479677 0.0026992
05-20156   -0.130045 0.1096202
04-17636   -1.065727 0.0014569
04-15787   -0.651376 0.0202051
03-5848    -1.135471 0.0013975
E8-24465    0.054222 0.0622619
05-9892     1.475827 0.5573658
07-2518     0.077374 0.0759861
E8-20436   -0.120357 0.0816243
01-15758   -0.087419 0.0545528
01-13869   -0.085792 0.0369526
06-5592    -1.137002 0.0010369
01-21338   -0.838098 0.0048967
04-2773     0.196325 0.0911131
03-20764   -0.381574 0.0540068
03-31594   -0.734881 0.0097065
04-11592    0.082037 0.0551350
04-11271   -0.270943 0.0202535
04-2408    -0.297275 0.0228928
04-1941     2.848505 0.4322104
01-3883     0.711498 0.5263899
01-2852    -0.408454 0.0189993
04-10378   -0.495084 0.0201071
04-20051    0.286426 0.0750695
03-05344   -0.452629 0.0242350
03-6445     1.791930 0.3307476
03-8109     0.798392 0.4015465
03-12766   -0.018167 0.0490625
06-7492    -0.045546 0.0342675
05-19993   -0.425701 0.0097265
05-22132   -0.001214 0.0434270
05-22133   -0.023400 0.0505553
07-3112    -0.110871 0.0583813
01-25788   -0.503378 0.1160570
03-2069    -0.142679 0.0345043
03-19572   -0.465025 0.0426934
04-17150    0.086878 0.0533703
04-17205   -1.154668 0.0010163
04-17204    0.174751 0.2017014
04-20049    0.015573 0.0397237
04-19909   -0.264991 0.0352570
04-24098   -0.025288 0.0608401
03-19676   -0.998240 0.0023894
06-5828     0.406495 0.1630966
06-5829    -0.258737 0.0296617
06-8769    -1.124496 0.0012814
07-374      1.169558 0.1629673
06-5984    -0.220916 0.1132284
05-23412   -1.147699 0.0010473
05-24596    4.261125 0.2253696
05-24597   -0.453397 0.0155651
05-24255   -0.215645 0.0342808
06-5351    -0.207971 0.0291117
06-4085    -1.152247 0.0011610
06-4552    -0.130064 0.0291504
06-9148    -0.309061 0.0986820
03-7160    -1.057252 0.0030917
07-3835    -1.157510 0.0010520
01-4624    -0.084321 0.1363163
01-17041   -0.408475 0.0580815
01-13117   -0.011797 0.0568328
01-13116   -0.057817 0.0646136
02-16951   -0.944684 0.0033582
02-17273   -0.655751 0.0256284
02-22526   -0.267726 0.1229046
01-4621    -0.533444 0.0092006
01-4623    -0.124675 0.1059224
01-29948   -0.215306 0.0253125
02-07086   -0.349444 0.0195725
02-07085   -0.375320 0.1050119
01-31119   -0.510372 0.0801305
03-11713   -0.953765 0.0031381
02-25900   -0.693100 0.0205091
02-32518    2.095030 0.4063498
03-10606    1.033618 0.4761067
06-1316    -1.137126 0.0010368
01-19562    0.066120 0.2211647
01-24205   -1.102548 0.0011397
01-25677   -0.056524 0.0298446
01-25344   -0.358458 0.0238699
03-16102   -0.319107 0.0328689
04-23994   -0.003821 0.0734009
01-11210   -0.518190 0.1095617
01-11505   -0.274149 0.0255230
02-29580   -0.590377 0.0138699
02-29832    0.768997 0.1829499
02-31831   -0.267360 0.0232139
04-15933    0.649537 0.1814714
04-15934    1.627702 0.3377856
03-24919   -0.149232 0.0490317
05-13098    0.786383 0.1564444
05-1886    -0.036880 0.0946633
04-28404    0.116445 0.1349996
04-22212    0.281290 0.1197650
05-306      4.228285 0.2209674
05-771     -0.243604 0.0280876
04-26685    1.856291 0.3561369
04-27076    0.047838 0.0523703
04-21411   -0.986873 0.0029135
05-14452    0.607217 0.3235000
08-658      0.031499 0.0422078
05-7831     0.025790 0.0950724
05-1170    -0.590538 0.0125052
05-5434     2.010922 0.5342894
E8-24342   -0.238279 0.0451167
03-13694   -1.085242 0.0012899
03-13412   -1.063892 0.0016115
08-761     -1.134792 0.0011533
06-9561    -0.509301 0.0316484
07-419     -0.209694 0.1078730
06-9895     0.141098 0.0829614
05-15160    0.082297 0.0931708
02-9536     0.033667 0.0481609
02-919      0.750637 0.4190562
02-3337    -0.347991 0.0807947
02-3826    -0.331805 0.0194832
01-14862   -0.259054 0.0892097
08-62       4.210580 0.2155716
08-325     -0.112514 0.0263128
08-360      0.225919 0.0793487
E8-29564   -0.518319 0.0110717
01-31665    0.002019 0.0991408
01-31667   -0.495738 0.0179397
01-31668   -0.492433 0.0174122
01-31669   -0.523526 0.0170589
01-31672   -0.525526 0.0167153
08-1182    -0.214109 0.0894298
02-17640   -0.028453 0.0427389
01-23359   -0.508316 0.0145539
02-24252    0.031754 0.0504344
04-3170    -0.267868 0.0225029
02-31832   -0.398392 0.0106908
01-26990   -0.455181 0.0985568
02-448      4.084815 0.2101690
06-9632    -1.476340 0.0026030
05-6907    -0.008320 0.0947507
07-5270    -1.101244 0.0009982
E8-17940    0.133262 0.0324735
08-1472     0.040095 0.0684661
E8-26531   -1.067648 0.0037086
07-4115    -0.255436 0.0510757
E8-27771   -0.127475 0.0583866
E8-23125    0.466326 0.1696714
08-568     -0.382004 0.0351109
08-483      0.298497 0.1210365
04-5322     4.293519 0.2349914
E8-21651   -0.265638 0.0301867
07-1704    -0.081900 0.0945161
07-2462     0.047838 0.0617525
07-1137    -0.087651 0.0282994
07-1152    -0.113961 0.1271281
08-1348     0.003484 0.0560299
07-4890     0.070622 0.0449001
04-11058   -1.140977 0.0010637
07-3552    -1.142655 0.0010810
08-1399    -1.150363 0.0014510
07-5726     0.216722 0.0663356
01-31666   -0.474872 0.0162842
2015-03714  0.049274 0.0364809
2015-07788 -1.146404 0.0009875
2015-07016  1.202761 0.1428911
2015-05677 -1.143327 0.0009469
2015-18292  0.861328 0.1908050
2015-19183  0.120156 0.0755932
2010-9078  -0.170529 0.0334928
2010-10172 -0.005728 0.0514274
2010-7154   0.426298 0.1631292
2010-11557  0.175378 0.0869460
2010-9796   0.129417 0.0497179
2015-16334  0.198030 0.0907898
2011-19156 -1.156339 0.0010287
2015-20801  0.209937 0.1017312
2015-22888  0.183751 0.0849015
2010-4884  -0.482442 0.0125378
2010-1229   0.459924 0.2266343
2010-38     0.193396 0.0948302
2010-12805 -0.267246 0.0213394
2010-3725  -0.278922 0.0295915
2011-30990 -0.383903 0.0191993
2010-24839 -1.140242 0.0009356
2011-26574 -1.461075 0.0025921
2011-12645 -1.158779 0.0010509
2011-29683  0.292325 0.1380160
2011-17953  0.094640 0.0688455
2011-17447 -0.219939 0.0361025
2014-11442 -1.127321 0.0008840
2014-06768 -1.416525 0.0019185
2014-08426  0.163516 0.0872820
2012-22030  0.154541 0.0999598
2011-32486  0.050329 0.0683837
2014-03805 -0.057163 0.0339982
2013-05967 -0.619669 0.0079327
2014-22805  0.185920 0.0570349
2013-31445  4.531738 0.2615004
2014-18561  0.478780 0.1252387
2014-17522  0.198632 0.1280402
2010-29579  0.025668 0.0387196
2012-1568   0.200008 0.0768408
E9-11547   -0.058277 0.0516984
E9-26834   -0.088723 0.0649595
E9-23886   -0.534330 0.0096763
E9-29781   -0.031871 0.0364707
2012-7636   0.298039 0.0872991
2013-08501 -0.016662 0.0651701
2011-21704  0.342942 0.1361108
2011-26729  0.163197 0.0568387
2013-15942 -0.127721 0.0285288
2013-16387 -0.147350 0.0318744
2012-31574 -0.007079 0.0719728
2012-30060 -0.009151 0.0543861
2012-30170  0.196523 0.1033446
2013-00002  4.527664 0.2588425
2013-28581 -1.466719 0.0024416
2014-07895 -1.136034 0.0009405
2011-15181 -0.026352 0.0630588
2010-18169  0.052397 0.0370964
2010-8878  -1.152126 0.0009937
2010-21016 -0.176693 0.0177133
2010-21020  0.134432 0.0798454
2013-17478  0.122995 0.0729964
2014-03474  0.142369 0.1201140
2014-16360 -1.091565 0.0012027
2011-18065  0.283735 0.0931932
2010-28854  0.275648 0.0974258
E9-1893     0.319280 0.0955266
E9-2893    -0.204398 0.0227777
E9-1712    -0.126493 0.0461378
E9-28493    0.187489 0.0886821
E9-30020    1.950516 0.3813362
E9-2484     0.460417 0.1117388
E9-3106    -0.174230 0.0757685
2014-18998  0.025432 0.0556748
2014-30195 -0.137586 0.0308642
2014-29625  0.246735 0.1112208
2010-22002 -1.147199 0.0010137
2014-29121  1.883452 0.3194429
2014-30323 -1.154299 0.0009823
2014-30363  4.535353 0.2600946
2014-24851 -1.417011 0.0020621
2016-30272 -0.549273 0.0117900
2016-30101 -0.282838 0.0367032
2016-31792 -0.542002 0.0122351
2016-31922 -1.096309 0.0016109
2016-30277  0.048002 0.0594230
2017-01623  1.535508 0.1341176
2017-01169  0.696994 0.2176495
2015-29403 -0.968741 0.0028711
2016-29519 -0.260855 0.0221100
2017-01487 -0.525149 0.0109411
2017-01197 -0.775558 0.0049182
2011-5903   0.174127 0.1536071
2011-8642  -0.096661 0.0656373
2011-28728  0.004564 0.0699452
2011-33087  4.125692 0.2026707
2010-27004 -0.174582 0.0194849
2010-28365 -0.525046 0.0108334
2010-28360  0.203623 0.0875639
2011-13173 -1.116853 0.0010286
2010-25578  0.148345 0.0490682
E9-5441     0.347584 0.1512868
E9-31098    4.003558 0.1939404
E9-28022   -0.114312 0.0278514
E9-25268   -0.250503 0.0164761
2016-06250  0.225223 0.0784591
2016-07703  1.432509 0.3381090
2016-08713 -0.297043 0.0366658
2016-03141 -0.170380 0.0342833
2015-02379  0.196713 0.0925722
2015-01522  0.192916 0.0682574
2015-01255  0.101213 0.0527916
2016-26753 -0.453128 0.0364081
2015-30191 -1.139240 0.0009112
2016-03038 -0.250851 0.0207785
2016-24066  1.636030 0.2122617
2016-24847 -0.912431 0.0031814
2016-22962  0.090240 0.0726908
2016-28203  0.071454 0.0457243
2016-29165  1.204216 0.3549755
2016-11300  0.101071 0.0672157
2016-12579  0.090240 0.0726908
2016-15542  0.151109 0.0799766
2012-9473   0.283429 0.1048434
2012-10715 -0.124394 0.0390113
2012-10968  0.065249 0.0559120
2012-5366   0.404177 0.1428454
2012-27002  0.085233 0.0545563
2013-08626  4.132154 0.2058621
2012-10034 -1.145955 0.0009411
2012-18868 -0.298632 0.0128130
2012-3097  -1.123473 0.0009081
2012-11798  0.153460 0.0735237
2012-12889 -0.529445 0.0125047
2012-19055 -1.053235 0.0006474
2012-17022  0.105786 0.0533519
2012-18237 -1.132330 0.0012282
2012-25236 -1.096311 0.0006185
2012-15954 -1.107928 0.0014094
2016-31875  4.390046 0.2376321
2016-27156  0.179297 0.0788657
2016-22454 -0.961776 0.0030627
2016-27171 -0.141161 0.0379319
2017-01489 -0.518202 0.0098187
2015-32582  4.535353 0.2600946
2017-01164  0.345772 0.1855320
2017-01168  0.183751 0.0849015
2016-29169  0.976681 0.3130033
2015-13055 -0.879071 0.0038212
2015-19209  0.084528 0.0567677
2016-17945  0.732830 0.2005154
2016-18872  0.094941 0.0892000
2015-17926 -1.471672 0.0025622
2015-15828 -0.359933 0.1099796
2015-16122 -0.160116 0.0374172
2016-25288  0.353059 0.1580768
2016-25290  0.116447 0.0538586
2016-20713  0.156397 0.1050000
2015-29498 -1.394062 0.0018491
2016-02475  0.126537 0.0745865
2015-31749  1.913515 0.3171541
2015-00058 -1.154433 0.0010256
2016-06355 -1.138049 0.0008889
2016-09483 -1.144582 0.0009892
2016-09346  0.332495 0.1309674
2016-04770  0.954574 0.2446582
2015-23630  0.172123 0.0943408
2015-15495  0.090240 0.0726908
2015-25744  0.274349 0.1446682
2015-22998  0.131497 0.0547426
2015-25489 -0.453363 0.0085323
2016-01325 -1.099076 0.0007320
2015-32060  0.380903 0.1316198
2016-12307 -0.137928 0.0420822
2016-12155  0.325618 0.1280518
2016-16295  0.102490 0.1002494
2016-19723 -0.531681 0.0130527
2016-19724 -0.545373 0.0121594
2016-19725 -0.519412 0.0096949
2010-22279  0.050329 0.0683837
2011-10910 -1.154662 0.0010178
2011-10732  0.002302 0.0643383
2010-33169  1.932829 0.2247137
2011-30463 -1.075960 0.0008156
2011-33335 -0.214090 0.0413833
2010-2419  -0.201787 0.0208545
2010-5837  -0.175287 0.0373241
E9-31418   -0.142707 0.0156672
2010-4593  -0.296882 0.0185291
2013-26785  0.083378 0.0364780
2011-33089  0.027124 0.0701289
2010-15851 -0.418050 0.0129280
2010-16864  0.110648 0.0611855
2014-14432 -1.462014 0.0024552
2014-14429  0.067661 0.0706259
2013-19220  0.328549 0.0964668
2012-24374 -0.007483 0.0574139
2012-22062  0.316589 0.0907665
2011-31624 -0.211878 0.0194688
2014-04254  0.235856 0.0854067
2013-24388 -0.431401 0.0085549
2014-01523  0.211956 0.0980194
2014-05323 -1.154673 0.0009713
2014-06141 -1.154539 0.0009821
2014-06612 -1.153044 0.0010058
2010-32960  4.255584 0.2217767
2014-18682  0.158304 0.1122670
2010-705    0.064303 0.0566602
2010-14613 -0.029791 0.0369043
2011-14919 -0.157103 0.0299308
2011-15443  0.037498 0.0532210
2011-5728  -0.117838 0.0455650
2011-4753  -1.153560 0.0009829
2011-3257   0.119611 0.0680595
2011-2577  -0.328720 0.0201932
2011-9739  -1.112299 0.0015212
2011-1385   0.231419 0.0880086
2014-23228  0.397449 0.1118835
2014-24218  0.751663 0.3071779
2014-25292  0.459924 0.2266343
2014-25439  0.465635 0.1666905
2012-12881 -0.493988 0.0116595
2012-12882 -0.517738 0.0127495
2012-12883 -0.522369 0.0098546
E9-1719     1.007972 0.2519863
E9-3113     0.158157 0.0743104
E9-5802    -0.139924 0.0280757
E9-16034   -0.381574 0.0540068
E9-15368   -0.092555 0.0298762
E9-1885     0.160529 0.0566861
E9-1895     0.074583 0.0541886
E9-3112    -0.336756 0.0203073
E9-3108    -0.202560 0.0728584
E9-8572    -0.169030 0.0354535
E9-2483    -0.459807 0.0209996
E9-2486    -0.165361 0.0752477
E9-2485     0.382806 0.0854653
E9-26408   -0.249122 0.0329889
E9-30413   -0.330831 0.0929036
E9-27441   -0.005150 0.0378296
E9-24518    1.043723 0.1356065
E9-4068    -0.194729 0.0330845
E9-4103    -0.184749 0.0878014
2012-7019  -0.052602 0.0257295
E9-28805   -0.225147 0.0226212
E9-24203   -0.533591 0.0133772
E9-23915   -0.475261 0.0360604
2012-22807  0.253948 0.0946962
2013-06712  0.340400 0.1507188
2013-03915  0.147601 0.0404832
2012-2557   0.100827 0.0914525
2013-12157  0.068220 0.0701569
2012-10884 -1.135680 0.0010673
2012-6797   0.023540 0.0406070
2012-30310  0.084684 0.0447083
2013-15782 -0.118072 0.0259640
2013-13523 -1.060926 0.0005441
2011-26141 -0.540422 0.0093587
2013-07837 -0.273751 0.0212161
2012-31225  1.907716 0.3209385
2010-31878 -0.269763 0.0208177
2013-19520 -1.111360 0.0016424
2014-09343 -0.343810 0.1407099
2014-12651 -1.046004 0.0023281
2010-12070 -0.495673 0.0117483
2010-9451  -0.295530 0.0203314
2012-20259  0.197272 0.0793024
2012-17264 -1.154680 0.0010162
2012-3616  -0.261219 0.0204289
2013-12650 -0.326198 0.0329971
2013-11533  0.263065 0.1162305
2011-21505 -1.151896 0.0010111
2011-23891  0.223488 0.0908920
2012-12225 -1.166575 0.0010707
2012-15183  0.067799 0.0622297
2018-27945  1.897850 0.3269148
2017-23630 -0.204500 0.0268755
2017-27034  0.133748 0.0985991
2018-04860  0.523511 0.1321842
2018-08883  1.159455 0.2486414
2018-05916 -1.129178 0.0014101
2018-05113  0.083715 0.0556049
2018-11101  1.063057 0.1855941
2018-00240  0.099829 0.1024982
2017-23270 -0.394689 0.0250946
2017-27899  0.152140 0.0837571
2018-07874 -0.224499 0.0315114
2018-15202  2.030215 0.2214703
2018-13640  0.488652 0.1064192
2018-15955 -0.106397 0.0284695
2018-15299 -0.159050 0.0257744
2019-24288 -0.067200 0.0590347
2019-26178  0.076599 0.0502513
2019-05370 -0.806356 0.0047149
2019-16383 -1.125634 0.0009539
2018-02261 -0.097828 0.0502906
2018-00630  0.092861 0.0754786
2018-08272  0.127290 0.0737175
2018-11939  0.485753 0.1433934
2018-13696 -0.101293 0.0498759
2019-10398 -0.260790 0.0167365
2020-17364  0.206213 0.1017855
2020-17699 -1.021791 0.0016198
2020-17700 -1.044170 0.0014595
2020-07530 -0.138533 0.0307937
2020-27948  0.684674 0.1898509
2021-01094 -0.541296 0.0092856
2021-01228 -0.853995 0.0035484
2020-12030 -0.081853 0.0509024
2018-04414 -0.347846 0.0169684
2020-03556  0.082185 0.0761642
2020-27740 -0.211395 0.0403947
2019-07645  0.187858 0.1023514
2019-21630 -0.481232 0.0086357
2019-09750  0.165033 0.0721733
2019-12802  0.200401 0.0899669
2019-13945  0.143256 0.0754582
2019-22849 -1.091628 0.0007305
2019-20804  0.132084 0.0621608
2019-23525 -0.034716 0.0336734
2019-22623  0.676983 0.1684109
2019-22624  0.874509 0.2044267
2019-00615 -0.909957 0.0030620
2019-04595  1.252820 0.4042345
2019-01426  0.138036 0.0817436
2020-14337  0.257327 0.1240556
2020-12584 -0.197243 0.0221867
2020-22510  0.096730 0.0687180
2020-29235  0.111421 0.0959397
2020-22064 -0.787337 0.0030405
2020-24793 -0.146422 0.0280218
2020-28605 -0.393828 0.0161605
2020-28606  0.180890 0.1136299
2020-16623  0.168035 0.1053323
2020-16624  0.141707 0.1027906
2021-01635  0.097938 0.0728872
2021-01646 -0.736013 0.0049710
2021-01013  0.053220 0.0731502
2019-16879 -1.072565 0.0015368
2019-15222 -0.019051 0.0590782
2019-09877 -1.094692 0.0008025
2017-15680 -0.357187 0.0177856
2017-13458  0.050663 0.0854774
2017-13012  0.015929 0.0411120
2017-02762  0.099829 0.1024982
2017-10004 -0.079000 0.0264459
2017-15860  0.096068 0.0690729
2017-08586  0.165026 0.0954159
2017-03113 -0.291189 0.0266916
2017-03115  0.230592 0.1103473
2017-03116 -0.539732 0.0100083
2017-03118  0.107177 0.0750136
2017-02450  0.925377 0.2332910
2017-02451 -0.136240 0.0511505
2017-09156 -0.150032 0.0489370
2017-06716 -0.032084 0.0417974
2017-20647 -1.129073 0.0007603
2017-21555 -0.474859 0.0086288
2017-21559  0.190166 0.1060099
2017-09083  0.099091 0.0686395
2017-08905  0.211742 0.1135536
2017-08311 -0.389024 0.0190027
2017-06967 -0.024428 0.0569086
2017-06971 -0.545002 0.0099434
2017-04357 -0.307540 0.0184886
2017-04107  0.549439 0.1897612
2017-02095 -0.070404 0.0362542
2017-02029  0.315524 0.1233691
2017-01799  0.284565 0.1239132
2017-06576  0.303552 0.0843734
2017-06382  0.122373 0.1008367
2020-00534 -1.090614 0.0007896
2020-02439 -0.140371 0.0373121
2020-27065  1.108040 0.2990079
2020-06969 -0.158816 0.0204066
2020-06985 -0.153293 0.0353242
2020-10953 -0.055500 0.0365391
2020-07800  0.180150 0.1107425
2020-03337  0.073140 0.0519124
2020-09537  0.202502 0.0851228
2020-19032 -0.026836 0.0703865
2020-21129  0.250437 0.1131159
2021-00040  4.535353 0.2600946
2020-13449  0.181470 0.0737214
2017-14992 -0.848307 0.0047102
2017-05399  0.140846 0.1051594
2017-02281 -0.497128 0.0097744
2017-06968 -0.015257 0.0647319
2017-14378 -0.379055 0.0165712
2017-10003 -0.278712 0.0215186
2017-08818  0.090149 0.0537765
2017-09161  0.098032 0.0919331
2017-09087 -0.125692 0.0317614
2017-09574  0.195570 0.1041216
2017-18468 -1.136897 0.0014031
2017-18134  0.404114 0.1210651
2017-04837 -0.453460 0.0096111
2017-04353  0.169154 0.0945544
2017-02102  0.353018 0.0995865
2017-08990  0.091044 0.0884031
2017-08908  0.144832 0.0782989
2017-18679  0.115224 0.1032132
2018-27515 -0.158993 0.0272763
2018-26552  1.844205 0.3483420
2017-22677  0.227660 0.0976399
2017-27925 -1.135215 0.0009447
2018-10855 -0.334854 0.0250047
2018-10403  1.000690 0.3022113
2018-11335 -1.114858 0.0015453
2018-11913  0.433766 0.1281536
2018-11916 -0.047672 0.0368034
2018-11936  0.003568 0.0639538
2018-20816 -1.084788 0.0007391
2019-07656  0.028748 0.0521405
2019-05934  0.174241 0.0820016
2019-15159  0.094365 0.0957971
2019-15449 -0.406314 0.0207118
2019-10538 -0.994745 0.0015409
2019-27678  1.881594 0.3336508
2019-08797  1.740053 0.1954096
2019-04437  0.133264 0.0579509
2019-13793 -1.112042 0.0008629
2020-27353 -0.227489 0.0312755
2020-27807  1.886860 0.3313871
2020-27739 -0.532890 0.0110775
2020-27455 -0.029830 0.0651943
2021-01469  0.139631 0.0884506
2021-01476  0.056211 0.0558953
2021-00305 -0.989778 0.0016166
2020-17363 -0.103897 0.0495663
2020-04730  0.252065 0.0875258
2020-11301  0.344896 0.0993017
2020-08846 -0.317256 0.0266728
2020-09536  0.123254 0.0639365
2020-21160 -1.110975 0.0009366
2020-23115  0.098107 0.0616064
2020-23116  0.614878 0.1493496
2020-23780  1.904494 0.2114033
2019-24040  0.007667 0.0465447
2019-19367  0.040560 0.0487326
2019-22749  0.107050 0.0999379
2019-22073  0.205882 0.0991174
2019-19895 -1.088308 0.0014189
2019-06325  0.048972 0.0369765
2019-06548  4.127451 0.2075315
2019-14016 -0.146039 0.0337034
2019-28286  4.207526 0.2180678
2019-27217  0.149301 0.1021367
2019-13175  0.023280 0.0755215
2019-00048  4.535353 0.2600946
2020-12953 -1.112551 0.0009824
2019-02544  0.189578 0.0770960
2019-00014 -0.313843 0.0229339
2018-24254 -1.132011 0.0009956
2018-26156 -1.138332 0.0009698
2020-14077 -0.030796 0.0556129
2020-14509  0.253880 0.0952741
2020-14328  0.137123 0.1070258
2020-18015  0.163607 0.0925514
2020-15338 -0.153735 0.0244046
2020-15646 -1.103176 0.0009609
2020-20887  0.192166 0.1075959
2020-09645  0.320357 0.1431330
2020-04755  0.211376 0.0873640
2021-01643  0.208731 0.1071983
2021-01644  0.195081 0.0929486
2021-01645  0.513633 0.1436354
2021-01713  0.129305 0.1065773
2021-01714 -0.962307 0.0018079
2021-01712  0.219029 0.1267733
2020-14872 -0.195047 0.0320842
2020-08392 -0.592639 0.0122551
2020-06478 -0.130399 0.0292292
2020-16625  0.128177 0.0984985
2020-21914  0.660520 0.1992877
2020-21534  0.908411 0.2195014
2020-12430 -0.240979 0.0326459
2020-02438 -0.110625 0.0384912
2020-25459 -1.052803 0.0015042
2020-21960  0.267507 0.1133461
2018-20203 -1.114879 0.0009640
2018-19514  0.169268 0.0972434
2018-09895 -0.147746 0.0355980
2018-00553  0.235987 0.1282614
2017-28160  4.333816 0.2290010
2019-17052 -1.114998 0.0009784
2019-21505 -0.122688 0.0454046
2019-04298  0.194721 0.1049483
2018-17068 -1.056503 0.0005148
2018-15195  0.572896 0.2347273
2020-09695 -0.949681 0.0016791
2020-06161  0.114830 0.0499011
2020-10993  0.181681 0.0774557
2020-10315 -0.276592 0.0182898
2020-18012 -0.230231 0.0195738

Estimated Feature Scores:
     health_human_servic human_servic_carri servic_carri_respons
beta              -0.381            -0.3795              -0.3795
psi               -0.884            -5.6052              -5.6052
     carri_respons_public respons_public_health public_health_human
beta              -0.3795               -0.3662             -0.3795
psi               -5.6052               -5.3152             -5.6052
     human_servic_develop regular_physic_activ enhanc_coordi_among
beta              -0.3818              -0.4185             -0.3472
psi               -5.0948              -4.6315             -5.0887
     privat_public_sector physic_fit_sport presid_physic_fit
beta              -0.3911          -0.5107           -0.5065
psi               -5.0965          -4.4259           -4.6482
     compos_member_appoint member_appoint_presid presid_may_deat may_deat_one
beta               -0.4269                -5.298         -0.2985      -0.3869
psi                -3.8793                -3.496         -4.2051      -5.3188
     deat_one_member one_member_chair member_chair_vice chair_vice_chair
beta         -0.4272          -0.3795           -0.3795           -0.421
psi          -4.0735          -5.6052           -5.6052           -3.277
     member_serv_term serv_term_year term_year_may year_may_continu
beta           -0.391        -0.3578       -0.3724          -0.3724
psi            -4.760        -4.2151       -5.6039          -5.6039
     may_continu_serv continu_serv_expir serv_expir_term function_advis_presid
beta          -0.4132            -0.4132         -0.4114               -0.4013
psi           -4.2250            -4.2250         -4.3117               -4.7619
     advis_presid_concern presid_concern_progress
beta              -0.3795                 -0.3795
psi               -5.6052                 -5.6052
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.457813557      Bush
2   -0.272883600      Bush
3   -0.397551165      Bush
4    1.677609134      Bush
5   -0.354705459      Bush
6   -0.504088387      Bush
7   -1.101063715      Bush
8   -0.978519740      Bush
9   -0.623826782      Bush
10  -0.898512069      Bush
11  -1.387134064      Bush
12   0.042710175      Bush
13   0.142847162      Bush
14  -0.399065142      Bush
15   4.347669012      Bush
16  -0.015939407      Bush
17  -0.396096493      Bush
18   1.676319585      Bush
19   2.099082858      Bush
20  -0.177271826      Bush
21  -0.087221393      Bush
22  -0.211796529      Bush
23  -0.207126423      Bush
24   0.223338476      Bush
25  -1.106323148      Bush
26  -0.007837254      Bush
27  -0.372853335      Bush
28  -1.144868564      Bush
29  -1.116376590      Bush
30  -0.306257130      Bush
31  -0.057879610      Bush
32  -0.347554538      Bush
33  -0.112662218      Bush
34   0.048914153      Bush
35  -0.081948768      Bush
36  -1.112681218      Bush
37  -1.435159752      Bush
38   0.702998071      Bush
39  -0.442074984      Bush
40  -0.144228321      Bush
41  -0.301706764      Bush
42   0.094187872      Bush
43  -1.468885248      Bush
44  -0.091266781      Bush
45  -0.381721012      Bush
46  -0.562327102      Bush
47  -1.042938143      Bush
48   0.972393545      Bush
49  -1.154808241      Bush
50  -0.433624884      Bush
51   0.028047746      Bush
52  -0.557139025      Bush
53  -0.542316555      Bush
54   1.331684906      Bush
55  -0.088559276      Bush
56  -0.033162297      Bush
57  -0.655045649      Bush
58   0.007850966      Bush
59  -0.394245879      Bush
60  -0.544872205      Bush
61   2.096436125      Bush
62  -1.385226963      Bush
63  -0.516242442      Bush
64  -0.528623318      Bush
65   0.028212685      Bush
66  -0.390376025      Bush
67  -1.445951254      Bush
68  -0.614563733      Bush
69   0.371384707      Bush
70  -0.021563896      Bush
71  -0.294699123      Bush
72   1.917120393      Bush
73   0.580490846      Bush
74  -0.005951068      Bush
75  -0.121107324      Bush
76  -1.122001689      Bush
77  -0.617500123      Bush
78  -0.566068775      Bush
79  -0.335704766      Bush
80  -0.634737505      Bush
81  -0.875337713      Bush
82  -0.369329965      Bush
83  -0.076821396      Bush
84  -0.607050885      Bush
85  -0.293936182      Bush
86   4.075935762      Bush
87  -0.064201839      Bush
88  -0.258467825      Bush
89  -0.067836779      Bush
90  -0.248875802      Bush
91  -0.026016556      Bush
92  -0.908993090      Bush
93  -0.039348766      Bush
94   0.025789673      Bush
95  -0.219402644      Bush
96   0.950904561      Bush
97   1.676319585      Bush
98   4.259984981      Bush
99   0.268092603      Bush
100  0.003572286      Bush
101 -0.268930339      Bush
102  4.312210031      Bush
103 -0.011069379      Bush
104 -0.226564180      Bush
105  3.504209368      Bush
106 -0.009490453      Bush
107  0.747414292      Bush
108 -0.344986843      Bush
109 -0.531843331      Bush
110 -0.314556369      Bush
111 -0.271128864      Bush
112  0.096506618      Bush
113 -1.133598629      Bush
114 -1.129385643      Bush
115  0.054490987      Bush
116 -0.298397370      Bush
117  0.080440861      Bush
118 -0.396555500      Bush
119 -1.435796329      Bush
120 -0.684191263      Bush
121 -0.175378575      Bush
122 -0.296891754      Bush
123  2.093007386      Bush
124 -1.099448193      Bush
125 -0.139438806      Bush
126 -0.441049292      Bush
127 -0.351573601      Bush
128  0.023750217      Bush
129 -0.414798415      Bush
130 -0.041119557      Bush
131 -0.177696703      Bush
132 -1.479677366      Bush
133 -0.130045411      Bush
134 -1.065727189      Bush
135 -0.651376018      Bush
136 -1.135471446      Bush
137  0.054221845      Bush
138  1.475827110      Bush
139  0.077374371      Bush
140 -0.120356853      Bush
141 -0.087418926      Bush
142 -0.085792071      Bush
143 -1.137002280      Bush
144 -0.838098034      Bush
145  0.196324868      Bush
146 -0.381574349      Bush
147 -0.734881477      Bush
148  0.082037205      Bush
149 -0.270943286      Bush
150 -0.297274783      Bush
151  2.848505088      Bush
152  0.711497905      Bush
153 -0.408453670      Bush
154 -0.495083521      Bush
155  0.286425725      Bush
156 -0.452629050      Bush
157  1.791929592      Bush
158  0.798391848      Bush
159 -0.018167063      Bush
160 -0.045546064      Bush
161 -0.425700962      Bush
162 -0.001214322      Bush
163 -0.023400430      Bush
164 -0.110871422      Bush
165 -0.503377565      Bush
166 -0.142679271      Bush
167 -0.465024664      Bush
168  0.086877919      Bush
169 -1.154667810      Bush
170  0.174750576      Bush
171  0.015572976      Bush
172 -0.264991166      Bush
173 -0.025288162      Bush
174 -0.998240004      Bush
175  0.406494718      Bush
176 -0.258736749      Bush
177 -1.124496174      Bush
178  1.169558013      Bush
179 -0.220916093      Bush
180 -1.147699453      Bush
181  4.261124897      Bush
182 -0.453396753      Bush
183 -0.215644617      Bush
184 -0.207970574      Bush
185 -1.152247319      Bush
186 -0.130063790      Bush
187 -0.309060699      Bush
188 -1.057252290      Bush
189 -1.157510024      Bush
190 -0.084320878      Bush
191 -0.408475231      Bush
192 -0.011796511      Bush
193 -0.057816511      Bush
194 -0.944684393      Bush
195 -0.655750729      Bush
196 -0.267725825      Bush
197 -0.533443668      Bush
198 -0.124675480      Bush
199 -0.215305699      Bush
200 -0.349444036      Bush
201 -0.375320153      Bush
202 -0.510371762      Bush
203 -0.953764925      Bush
204 -0.693099565      Bush
205  2.095030078      Bush
206  1.033617938      Bush
207 -1.137126028      Bush
208  0.066119721      Bush
209 -1.102548460      Bush
210 -0.056524153      Bush
211 -0.358457705      Bush
212 -0.319107062      Bush
213 -0.003821471      Bush
214 -0.518189789      Bush
215 -0.274149497      Bush
216 -0.590376955      Bush
217  0.768996602      Bush
218 -0.267359991      Bush
219  0.649536818      Bush
220  1.627702041      Bush
221 -0.149232017      Bush
222  0.786383404      Bush
223 -0.036880214      Bush
224  0.116444989      Bush
225  0.281290418      Bush
226  4.228284554      Bush
227 -0.243604285      Bush
228  1.856291280      Bush
229  0.047837982      Bush
230 -0.986872803      Bush
231  0.607217183      Bush
232  0.031499219      Bush
233  0.025789673      Bush
234 -0.590538290      Bush
235  2.010922025      Bush
236 -0.238278777      Bush
237 -1.085242032      Bush
238 -1.063891576      Bush
239 -1.134792057      Bush
240 -0.509300861      Bush
241 -0.209693515      Bush
242  0.141097942      Bush
243  0.082297184      Bush
244  0.033666532      Bush
245  0.750637375      Bush
246 -0.347991144      Bush
247 -0.331804751      Bush
248 -0.259054099      Bush
249  4.210579713      Bush
250 -0.112513578      Bush
251  0.225919015      Bush
252 -0.518319339      Bush
253  0.002018834      Bush
254 -0.495738146      Bush
255 -0.492432885      Bush
256 -0.523526170      Bush
257 -0.525526193      Bush
258 -0.214108679      Bush
259 -0.028452915      Bush
260 -0.508315742      Bush
261  0.031753666      Bush
262 -0.267868188      Bush
263 -0.398391925      Bush
264 -0.455180814      Bush
265  4.084815459      Bush
266 -1.476339551      Bush
267 -0.008319890      Bush
268 -1.101243603      Bush
269  0.133262427      Bush
270  0.040094733      Bush
271 -1.067647788      Bush
272 -0.255435730      Bush
273 -0.127475285      Bush
274  0.466325588      Bush
275 -0.382003732      Bush
276  0.298497028      Bush
277  4.293519378      Bush
278 -0.265638296      Bush
279 -0.081899559      Bush
280  0.047837761      Bush
281 -0.087651376      Bush
282 -0.113961327      Bush
283  0.003484204      Bush
284  0.070622424      Bush
285 -1.140976682      Bush
286 -1.142654650      Bush
287 -1.150362697      Bush
288  0.216722062      Bush
289 -0.474872419      Bush
290  0.049274173     Obama
291 -1.146404016     Obama
292  1.202760595     Obama
293 -1.143326649     Obama
294  0.861328284     Obama
295  0.120155569     Obama
296 -0.170528893     Obama
297 -0.005728237     Obama
298  0.426298160     Obama
299  0.175378057     Obama
300  0.129416745     Obama
301  0.198029563     Obama
302 -1.156339356     Obama
303  0.209936874     Obama
304  0.183751470     Obama
305 -0.482442495     Obama
306  0.459924443     Obama
307  0.193395754     Obama
308 -0.267245596     Obama
309 -0.278921962     Obama
310 -0.383902537     Obama
311 -1.140242479     Obama
312 -1.461074508     Obama
313 -1.158778940     Obama
314  0.292325076     Obama
315  0.094640279     Obama
316 -0.219939035     Obama
317 -1.127320769     Obama
318 -1.416524585     Obama
319  0.163516021     Obama
320  0.154541382     Obama
321  0.050328670     Obama
322 -0.057162600     Obama
323 -0.619669198     Obama
324  0.185919714     Obama
325  4.531738025     Obama
326  0.478779879     Obama
327  0.198632323     Obama
328  0.025668166     Obama
329  0.200007671     Obama
330 -0.058277247     Obama
331 -0.088722865     Obama
332 -0.534330425     Obama
333 -0.031871401     Obama
334  0.298039008     Obama
335 -0.016661844     Obama
336  0.342942024     Obama
337  0.163196526     Obama
338 -0.127720720     Obama
339 -0.147349704     Obama
340 -0.007079018     Obama
341 -0.009150557     Obama
342  0.196522621     Obama
343  4.527663507     Obama
344 -1.466719186     Obama
345 -1.136033747     Obama
346 -0.026352369     Obama
347  0.052397143     Obama
348 -1.152125545     Obama
349 -0.176693326     Obama
350  0.134432365     Obama
351  0.122994631     Obama
352  0.142368866     Obama
353 -1.091564678     Obama
354  0.283734756     Obama
355  0.275647756     Obama
356  0.319279938     Obama
357 -0.204398013     Obama
358 -0.126492545     Obama
359  0.187489069     Obama
360  1.950515650     Obama
361  0.460416670     Obama
362 -0.174230135     Obama
363  0.025432364     Obama
364 -0.137585736     Obama
365  0.246735099     Obama
366 -1.147199054     Obama
367  1.883452037     Obama
368 -1.154298945     Obama
369  4.535353325     Obama
370 -1.417010645     Obama
371 -0.549272773     Obama
372 -0.282838246     Obama
373 -0.542001596     Obama
374 -1.096309064     Obama
375  0.048002422     Obama
376  1.535507911     Obama
377  0.696993916     Obama
378 -0.968741261     Obama
379 -0.260855118     Obama
380 -0.525149048     Obama
381 -0.775558056     Obama
382  0.174127367     Obama
383 -0.096660750     Obama
384  0.004564233     Obama
385  4.125691502     Obama
386 -0.174581675     Obama
387 -0.525046390     Obama
388  0.203623077     Obama
389 -1.116853019     Obama
390  0.148345091     Obama
391  0.347583617     Obama
392  4.003558058     Obama
393 -0.114312228     Obama
394 -0.250503154     Obama
395  0.225222541     Obama
396  1.432509082     Obama
397 -0.297042763     Obama
398 -0.170379678     Obama
399  0.196712718     Obama
400  0.192915517     Obama
401  0.101213332     Obama
402 -0.453127922     Obama
403 -1.139239669     Obama
404 -0.250851255     Obama
405  1.636030168     Obama
406 -0.912431268     Obama
407  0.090240427     Obama
408  0.071453600     Obama
409  1.204215909     Obama
410  0.101070949     Obama
411  0.090240427     Obama
412  0.151109202     Obama
413  0.283428946     Obama
414 -0.124394084     Obama
415  0.065248584     Obama
416  0.404176543     Obama
417  0.085232670     Obama
418  4.132153569     Obama
419 -1.145955118     Obama
420 -0.298632359     Obama
421 -1.123473496     Obama
422  0.153459654     Obama
423 -0.529444846     Obama
424 -1.053235499     Obama
425  0.105786359     Obama
426 -1.132329512     Obama
427 -1.096310905     Obama
428 -1.107928336     Obama
429  4.390045630     Obama
430  0.179296842     Obama
431 -0.961776393     Obama
432 -0.141160937     Obama
433 -0.518201652     Obama
434  4.535353325     Obama
435  0.345772253     Obama
436  0.183751470     Obama
437  0.976680746     Obama
438 -0.879071167     Obama
439  0.084527541     Obama
440  0.732829712     Obama
441  0.094940633     Obama
442 -1.471671541     Obama
443 -0.359932922     Obama
444 -0.160115763     Obama
445  0.353058676     Obama
446  0.116447017     Obama
447  0.156396901     Obama
448 -1.394061821     Obama
449  0.126537462     Obama
450  1.913515393     Obama
451 -1.154432930     Obama
452 -1.138048743     Obama
453 -1.144582034     Obama
454  0.332494808     Obama
455  0.954573821     Obama
456  0.172122883     Obama
457  0.090240427     Obama
458  0.274349048     Obama
459  0.131497442     Obama
460 -0.453362993     Obama
461 -1.099076114     Obama
462  0.380903172     Obama
463 -0.137927519     Obama
464  0.325618399     Obama
465  0.102489943     Obama
466 -0.531680544     Obama
467 -0.545372516     Obama
468 -0.519412204     Obama
469  0.050328670     Obama
470 -1.154662113     Obama
471  0.002301911     Obama
472  1.932829122     Obama
473 -1.075959517     Obama
474 -0.214089948     Obama
475 -0.201786977     Obama
476 -0.175286670     Obama
477 -0.142706772     Obama
478 -0.296882116     Obama
479  0.083377552     Obama
480  0.027124283     Obama
481 -0.418049530     Obama
482  0.110648455     Obama
483 -1.462013672     Obama
484  0.067661498     Obama
485  0.328548798     Obama
486 -0.007483291     Obama
487  0.316588643     Obama
488 -0.211877650     Obama
489  0.235856183     Obama
490 -0.431400815     Obama
491  0.211955521     Obama
492 -1.154672556     Obama
493 -1.154539368     Obama
494 -1.153043770     Obama
495  4.255584341     Obama
496  0.158304048     Obama
497  0.064303330     Obama
498 -0.029790817     Obama
499 -0.157103178     Obama
500  0.037497555     Obama
501 -0.117838072     Obama
502 -1.153559595     Obama
503  0.119610895     Obama
504 -0.328720157     Obama
505 -1.112299405     Obama
506  0.231419407     Obama
507  0.397449322     Obama
508  0.751663005     Obama
509  0.459924443     Obama
510  0.465635305     Obama
511 -0.493987665     Obama
512 -0.517738126     Obama
513 -0.522369095     Obama
514  1.007972204     Obama
515  0.158156560     Obama
516 -0.139924123     Obama
517 -0.381574349     Obama
518 -0.092554938     Obama
519  0.160529170     Obama
520  0.074582871     Obama
521 -0.336755672     Obama
522 -0.202560219     Obama
523 -0.169030228     Obama
524 -0.459807157     Obama
525 -0.165360588     Obama
526  0.382805690     Obama
527 -0.249121687     Obama
528 -0.330831223     Obama
529 -0.005149884     Obama
530  1.043723429     Obama
531 -0.194728619     Obama
532 -0.184748727     Obama
533 -0.052601938     Obama
534 -0.225147427     Obama
535 -0.533590812     Obama
536 -0.475260522     Obama
537  0.253948123     Obama
538  0.340400157     Obama
539  0.147600819     Obama
540  0.100826816     Obama
541  0.068220164     Obama
542 -1.135679889     Obama
543  0.023539982     Obama
544  0.084684166     Obama
545 -0.118071936     Obama
546 -1.060926245     Obama
547 -0.540422482     Obama
548 -0.273750521     Obama
549  1.907715920     Obama
550 -0.269763468     Obama
551 -1.111360489     Obama
552 -0.343810455     Obama
553 -1.046004496     Obama
554 -0.495672596     Obama
555 -0.295529657     Obama
556  0.197272116     Obama
557 -1.154679735     Obama
558 -0.261218817     Obama
559 -0.326198242     Obama
560  0.263065243     Obama
561 -1.151896230     Obama
562  0.223488142     Obama
563 -1.166575334     Obama
564  0.067799438     Obama
565  1.897850074     Trump
566 -0.204500157     Trump
567  0.133747905     Trump
568  0.523510847     Trump
569  1.159454739     Trump
570 -1.129177737     Trump
571  0.083714797     Trump
572  1.063056976     Trump
573  0.099828813     Trump
574 -0.394689309     Trump
575  0.152140187     Trump
576 -0.224499156     Trump
577  2.030215405     Trump
578  0.488651914     Trump
579 -0.106397250     Trump
580 -0.159050056     Trump
581 -0.067200098     Trump
582  0.076599106     Trump
583 -0.806355770     Trump
584 -1.125634202     Trump
585 -0.097828237     Trump
586  0.092860774     Trump
587  0.127289583     Trump
588  0.485752915     Trump
589 -0.101292830     Trump
590 -0.260790085     Trump
591  0.206213252     Trump
592 -1.021790615     Trump
593 -1.044169957     Trump
594 -0.138533043     Trump
595  0.684674448     Trump
596 -0.541295671     Trump
597 -0.853995114     Trump
598 -0.081852583     Trump
599 -0.347846450     Trump
600  0.082185445     Trump
601 -0.211394693     Trump
602  0.187857795     Trump
603 -0.481231966     Trump
604  0.165033291     Trump
605  0.200401310     Trump
606  0.143256269     Trump
607 -1.091627673     Trump
608  0.132083703     Trump
609 -0.034716335     Trump
610  0.676983269     Trump
611  0.874509012     Trump
612 -0.909956802     Trump
613  1.252819552     Trump
614  0.138035861     Trump
615  0.257326568     Trump
616 -0.197242793     Trump
617  0.096730173     Trump
618  0.111420839     Trump
619 -0.787336759     Trump
620 -0.146422168     Trump
621 -0.393828291     Trump
622  0.180890347     Trump
623  0.168034515     Trump
624  0.141707096     Trump
625  0.097937975     Trump
626 -0.736013289     Trump
627  0.053220135     Trump
628 -1.072564796     Trump
629 -0.019051221     Trump
630 -1.094691699     Trump
631 -0.357187486     Trump
632  0.050663294     Trump
633  0.015928817     Trump
634  0.099828813     Trump
635 -0.078999855     Trump
636  0.096068045     Trump
637  0.165025527     Trump
638 -0.291189285     Trump
639  0.230592490     Trump
640 -0.539731877     Trump
641  0.107176699     Trump
642  0.925377423     Trump
643 -0.136240400     Trump
644 -0.150032233     Trump
645 -0.032084089     Trump
646 -1.129073453     Trump
647 -0.474859273     Trump
648  0.190166344     Trump
649  0.099090883     Trump
650  0.211741999     Trump
651 -0.389024381     Trump
652 -0.024428044     Trump
653 -0.545001849     Trump
654 -0.307539716     Trump
655  0.549438721     Trump
656 -0.070404187     Trump
657  0.315524474     Trump
658  0.284564554     Trump
659  0.303551963     Trump
660  0.122372818     Trump
661 -1.090614335     Trump
662 -0.140371133     Trump
663  1.108040358     Trump
664 -0.158815923     Trump
665 -0.153293117     Trump
666 -0.055499819     Trump
667  0.180149598     Trump
668  0.073140015     Trump
669  0.202502271     Trump
670 -0.026836117     Trump
671  0.250436621     Trump
672  4.535353325     Trump
673  0.181469543     Trump
674 -0.848307089     Trump
675  0.140845510     Trump
676 -0.497128425     Trump
677 -0.015257277     Trump
678 -0.379054518     Trump
679 -0.278712187     Trump
680  0.090149231     Trump
681  0.098031581     Trump
682 -0.125692423     Trump
683  0.195569826     Trump
684 -1.136897257     Trump
685  0.404114097     Trump
686 -0.453460029     Trump
687  0.169154173     Trump
688  0.353017620     Trump
689  0.091044130     Trump
690  0.144831931     Trump
691  0.115223945     Trump
692 -0.158993318     Trump
693  1.844205349     Trump
694  0.227659705     Trump
695 -1.135214545     Trump
696 -0.334853842     Trump
697  1.000690182     Trump
698 -1.114858005     Trump
699  0.433766127     Trump
700 -0.047671971     Trump
701  0.003568349     Trump
702 -1.084788030     Trump
703  0.028747921     Trump
704  0.174241153     Trump
705  0.094365255     Trump
706 -0.406314457     Trump
707 -0.994745261     Trump
708  1.881594120     Trump
709  1.740052662     Trump
710  0.133263803     Trump
711 -1.112042060     Trump
712 -0.227489423     Trump
713  1.886860257     Trump
714 -0.532890398     Trump
715 -0.029830238     Trump
716  0.139631337     Trump
717  0.056211184     Trump
718 -0.989778181     Trump
719 -0.103896573     Trump
720  0.252065374     Trump
721  0.344896366     Trump
722 -0.317256294     Trump
723  0.123254065     Trump
724 -1.110974885     Trump
725  0.098107059     Trump
726  0.614878023     Trump
727  1.904493967     Trump
728  0.007666933     Trump
729  0.040560196     Trump
730  0.107050444     Trump
731  0.205881702     Trump
732 -1.088307719     Trump
733  0.048972422     Trump
734  4.127451342     Trump
735 -0.146038550     Trump
736  4.207526158     Trump
737  0.149301484     Trump
738  0.023280136     Trump
739  4.535353325     Trump
740 -1.112551441     Trump
741  0.189578492     Trump
742 -0.313843161     Trump
743 -1.132011394     Trump
744 -1.138332263     Trump
745 -0.030795723     Trump
746  0.253879623     Trump
747  0.137123112     Trump
748  0.163607003     Trump
749 -0.153734739     Trump
750 -1.103175698     Trump
751  0.192165858     Trump
752  0.320356747     Trump
753  0.211376083     Trump
754  0.208731380     Trump
755  0.195081463     Trump
756  0.513632979     Trump
757  0.129304842     Trump
758 -0.962307352     Trump
759  0.219029265     Trump
760 -0.195046509     Trump
761 -0.592639464     Trump
762 -0.130398570     Trump
763  0.128177436     Trump
764  0.660520003     Trump
765  0.908410970     Trump
766 -0.240979132     Trump
767 -0.110624946     Trump
768 -1.052803340     Trump
769  0.267506988     Trump
770 -1.114879488     Trump
771  0.169267589     Trump
772 -0.147745858     Trump
773  0.235987280     Trump
774  4.333816199     Trump
775 -1.114998182     Trump
776 -0.122687530     Trump
777  0.194721029     Trump
778 -1.056502883     Trump
779  0.572895759     Trump
780 -0.949680583     Trump
781  0.114829569     Trump
782  0.181681203     Trump
783 -0.276592493     Trump
784 -0.230231418     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")