Executive Orders and Ideological Leaning

Author

Jingyi Yang

Packages

library(skimr)
library(readr)
library(stringr)
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(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

Import the data

EO_All_WithText <- read_csv("~/graduate2-1/EO Project/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`

Pre-processing

Clean the text

Use the sub() function to extract characters before “By 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:” and characters after the President’s signature.

for (i in 1:nrow(EO_All_WithText)) {EO_All_WithText$text[i] <- sub(EO_All_WithText$title[i],"",EO_All_WithText$text[i])}
data_eo <- EO_All_WithText %>% filter(signing_date> "2009-01-20" ) ## narrow down to the excutive order in 2024.
data_eo <- data_eo[order(data_eo$signing_date, decreasing = FALSE), ]
head(data_eo)
# A tibble: 6 × 21
   ...1 citation   document_number end_page html_url       pdf_url type  subtype
  <dbl> <chr>      <chr>              <dbl> <chr>          <chr>   <chr> <chr>  
1  4933 74 FR 4669 E9-1712             4671 https://www.f… https:… Pres… Execut…
2  5091 74 FR 4673 E9-1719             4678 https://www.f… https:… Pres… Execut…
3  4931 74 FR 4897 E9-1893             4900 https://www.f… https:… Pres… Execut…
4  5096 74 FR 4893 E9-1885             4896 https://www.f… https:… Pres… Execut…
5  5097 74 FR 4901 E9-1895             4902 https://www.f… https:… Pres… Execut…
6  4936 74 FR 6103 E9-2484             6106 https://www.f… https:… Pres… Execut…
# ℹ 13 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 <chr>, day <chr>, year <dbl>, full_text_xml_url <chr>, text <chr>,
#   full_text_html_url <chr>
glimpse(data_eo)
Rows: 659
Columns: 21
$ ...1                         <dbl> 4933, 5091, 4931, 5096, 5097, 4936, 5101,…
$ citation                     <chr> "74 FR 4669", "74 FR 4673", "74 FR 4897",…
$ document_number              <chr> "E9-1712", "E9-1719", "E9-1893", "E9-1885…
$ end_page                     <dbl> 4671, 4678, 4900, 4896, 4902, 6106, 6102,…
$ 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> 2009-01-26, 2009-01-26, 2009-01-27, 2009…
$ signing_date                 <date> 2009-01-21, 2009-01-21, 2009-01-22, 2009…
$ start_page                   <dbl> 4669, 4673, 4897, 4893, 4901, 6103, 6101,…
$ title                        <chr> "Presidential Records", "Ethics Commitmen…
$ disposition_notes            <chr> "Revokes: EO 13233, November 1, 2001", "S…
$ executive_order_number       <chr> "13489", "13490", "13492", "13491", "1349…
$ not_received_for_publication <lgl> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, N…
$ month                        <chr> "1", "1", "1", "1", "1", "2", "2", "2", "…
$ day                          <chr> "26", "26", "27", "27", "27", "4", "4", "…
$ year                         <dbl> 2009, 2009, 2009, 2009, 2009, 2009, 2009,…
$ full_text_xml_url            <chr> "https://www.federalregister.gov/document…
$ text                         <chr> "Title 3—\n                        The Pr…
$ full_text_html_url           <chr> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, N…
skimr::skim(data_eo)
Data summary
Name data_eo
Number of rows 659
Number of columns 21
_______________________
Column type frequency:
character 14
Date 2
logical 1
numeric 4
________________________
Group variables None

Variable type: character

skim_variable n_missing complete_rate min max empty n_unique whitespace
citation 0 1.00 7 12 0 659 0
document_number 0 1.00 7 13 0 659 0
html_url 0 1.00 77 164 0 659 0
pdf_url 0 1.00 65 71 0 659 0
type 0 1.00 21 21 0 1 0
subtype 0 1.00 15 15 0 1 0
title 0 1.00 10 327 0 614 0
disposition_notes 154 0.77 26 1074 0 463 0
executive_order_number 0 1.00 5 5 0 658 0
month 0 1.00 1 2 0 12 0
day 0 1.00 1 2 0 31 0
full_text_xml_url 0 1.00 78 84 0 659 0
text 1 1.00 451 138860 0 658 0
full_text_html_url 659 0.00 NA NA 0 0 0

Variable type: Date

skim_variable n_missing complete_rate min max median n_unique
publication_date 0 1 2009-01-26 2025-01-24 2017-12-26 546
signing_date 0 1 2009-01-21 2025-01-19 2017-12-20 540

Variable type: logical

skim_variable n_missing complete_rate mean count
not_received_for_publication 659 0 NaN :

Variable type: numeric

skim_variable n_missing complete_rate mean sd p0 p25 p50 p75 p100 hist
…1 0 1 4305.77 2503.85 1 4867.5 5032 6483.5 6648 ▅▁▁▇▆
end_page 0 1 35521.03 25278.13 3 12361.0 30905 55478.0 106975 ▇▅▅▃▁
start_page 0 1 35516.61 25278.12 1 12359.0 30903 55476.0 106963 ▇▅▅▃▁
year 0 1 2017.00 4.42 2009 2013.0 2017 2021.0 2025 ▆▃▆▇▃
eo_text_clean <-  data_eo$text
# Remove everything before the first "Section"

pattern <- "(?:\\.\\s*)?[^.]*?it is hereby ordered as follows:.*?:?\\s*"

# Use str_replace() to replace the matched sentence with an empty string
 eo_text_clean<- str_replace(eo_text_clean , pattern, "")
 eo_text_clean<- sub(".*?of the United States of America,", "", eo_text_clean)
# Remove the section
eo_text_clean<- str_remove_all(eo_text_clean, regex("(?i)sec(tion)?\\.?\\s*\\d+", ignore_case = TRUE))

# Remove the format
eo_text_clean<-gsub("\n", "",eo_text_clean)

# Remove the executive order
eo_text_clean<-gsub("executive order", "",eo_text_clean, ignore.case = TRUE)

# Remove the date and number at beginning 
pattern_2 <- "\\d+ of [A-Za-z]+ \\d{1,2}, \\d{4}"
eo_text_clean<- str_replace(eo_text_clean , pattern_2, "")

# Remove the president name
eo_text_clean<-gsub("Biden|Trump|Obama", "",eo_text_clean, ignore.case = TRUE)

# Remove the "Title 3- The President"
eo_text_clean <-    text <- str_remove_all(eo_text_clean, regex("Title\\s*3[^\\n]", ignore_case = TRUE))
eo_text_clean <-  gsub("The President", "", eo_text_clean, fixed = TRUE)

# Remove the footer (from BIDEN.EPS onward)
eo_text_clean <- sub(".EPS.*", "", eo_text_clean)

cat(eo_text_clean[1])
.Definitions.                         For purposes of this order:                    (a)  “Archivist” refers to the Archivist of the United States or his designee.(b)  “NARA” refers to the National Archives and Records Administration.(c)  “Presidential Records Act” refers to the Presidential Records Act, 44 U.S.C. 2201-2207.(d)  “NARA regulations” refers to the NARA regulations implementing the Presidential Records Act, 36 C.F.R. Part 1270.(e)  “Presidential records” refers to those documentary materials maintained by NARA pursuant to the Presidential Records Act, including Vice Presidential records.(f)  “Former President” refers to the former President during whose term or terms of office particular Presidential records were created.(g)  A “substantial question of executive privilege” exists if NARA's disclosure of Presidential records might impair national security (including the conduct of foreign relations), law enforcement, or the deliberative processes of the executive branch.(h)  A “final court order” is a court order from which no appeal may be taken..Notice of Intent to Disclose Presidential Records.                         (a)  When the Archivist provides notice to the incumbent and former Presidents of his intent to disclose Presidential records pursuant to .46 of the NARA regulations, the Archivist, using any guidelines provided by the incumbent and former Presidents, shall identify any specific materials, the disclosure of which he believes may raise a substantial question of executive privilege.  However, nothing in this order is intended to affect the right of the incumbent or former Presidents to invoke executive privilege with respect to materials not identified by the Archivist.  Copies of the notice for the incumbent President shall be delivered to the President (through the Counsel to the President) and the Attorney General (through the Assistant Attorney General for the Office of Legal Counsel).  The copy of the notice for the former President shall be delivered to the former President or his designated representative.                                            (b)  Upon the passage of 30 days after receipt by the incumbent and former Presidents of a notice of intent to disclose Presidential records, the Archivist may disclose the records covered by the notice, unless during that time period the Archivist has received a claim of executive privilege by the incumbent or former President or the Archivist has been instructed by the incumbent President or his designee to extend the time period for a time certain and with reason for the extension of time provided in the notice.  If a shorter period of time is required under the circumstances                                                 set forth in .44 of the NARA regulations, the Archivist shall so indicate in the notice.                    .Claim of Executive Privilege by Incumbent President.                         (a)  Upon receipt of a notice of intent to disclose Presidential records, the Attorney General (directly or through the Assistant Attorney General for the Office of Legal Counsel) and the Counsel to the President shall review as they deem appropriate the records covered by the notice and consult with each other, the Archivist, and such other executive agencies as they deem appropriate concerning whether invocation of executive privilege is justified.                    (b)  The Attorney General and the Counsel to the President, in the exercise of their discretion and after appropriate review and consultation under subsection (a) of this section, may jointly determine that invocation of executive privilege is not justified.  The Archivist shall be notified promptly of any such determination.(c)  If either the Attorney General or the Counsel to the President believes that the circumstances justify invocation of executive privilege, the issue shall be presented to the President by the Counsel to the President and the Attorney General.(d)  If the President decides to invoke executive privilege, the Counsel to the President shall notify the former President, the Archivist, and the Attorney General in writing of the claim of privilege and the specific Presidential records to which it relates.  After receiving such notice, the Archivist shall not disclose the privileged records unless directed to do so by an incumbent President or by a final court order..Claim of Executive Privilege by Former President.                         (a)  Upon receipt of a claim of executive privilege by a living former President, the Archivist shall consult with the Attorney  General (through the Assistant Attorney General for the Office of Legal Counsel), the Counsel to the President, and such other executive agencies as the Archivist deems appropriate concerning the Archivist's determination as to whether to honor the former President's claim of privilege or instead to disclose the Presidential records notwithstanding the claim of privilege.  Any determination under  of this order that executive privilege shall not be invoked by the incumbent President shall not prejudice the Archivist's determination with respect to the former President's claim of privilege.                    (b)  In making the determination referred to in subsection (a) of this section, the Archivist shall abide by any instructions given him by the incumbent President or his designee unless otherwise directed by a final court order.  The Archivist shall notify the incumbent and former Presidents of his determination at least 30 days prior to disclosure of the Presidential records, unless a shorter time period is required in the circumstances set forth in .44 of the NARA regulations.  Copies of the notice for the incumbent President shall be delivered to the President (through the Counsel to the President) and the Attorney General (through the Assistant Attorney General for the Office of Legal Counsel).  The copy of the notice for the former President shall be delivered to the former President or his designated representative..General Provisions.                         (a)  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 budget, 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.                                            .Revocation.                          , is revoked.                    OB#1
cat(eo_text_clean[2])
.Ethics Pledge.                     Every appointee in every executive agency appointed on or after January 20, 2009, shall sign, and upon signing shall be contractually committed to, the following pledge upon becoming an appointee:                “As a condition, and in consideration, of my employment in the United States Government in a position invested with the public trust, I commit myself to the following obligations, which I understand are binding on me and are enforceable under law:                    “1.                     Lobbyist Gift Ban                    .  I will not accept gifts from registered lobbyists or lobbying organizations for the duration of my service as an appointee.                                    “2.                     Revolving Door Ban—All Appointees Entering Government                    .  I will not for a period of 2 years from the date of my appointment participate in any particular matter involving specific parties that is directly and substantially related to my former employer or former clients, including regulations and contracts.                                    “3.                     Revolving Door Ban—Lobbyists Entering Government                    .  If I was a registered lobbyist within the 2 years before the date of my appointment, in addition to abiding by the limitations of paragraph 2, I will not for a period of 2 years after the date of my appointment:                (a)  participate in any particular matter on which I lobbied within the 2 years before the date of my appointment;(b)  participate in the specific issue area in which that particular matter falls; or(c)  seek or accept employment with any executive agency that I lobbied within the 2 years before the date of my appointment.                    “4.                     Revolving Door Ban—Appointees Leaving Government                    .  If, upon my departure from the Government, I am covered by the post-employment restrictions on communicating with employees of my former executive agency set forth in (c) of title 18, United States Code, I agree that I will abide by those restrictions for a period of 2 years following the end of my appointment.                                    “5.                     Revolving Door Ban—Appointees Leaving Government to Lobby                    .  In addition to abiding by the limitations of paragraph 4, I also agree, upon leaving Government service, not to lobby any covered executive branch official or non-career Senior Executive Service appointee for the remainder of the Administration.                                    “6.                     Employment Qualification Commitment                    .  I agree that any hiring or other employment decisions I make will be based on the candidate's qualifications, competence, and experience.                                    “7.                     Assent to Enforcement                    .  I acknowledge that the  entitled 'Ethics Commitments by Executive Branch Personnel,' issued by the President on January 21, 2009, which I have read before signing this document, defines certain of the terms applicable to the foregoing obligations and sets forth                                         the methods for enforcing them.  I expressly accept the provisions of that  as a part of this agreement and as binding on me.  I understand that the terms of this pledge are in addition to any statutory or other legal restrictions applicable to me by virtue of Federal Government service.”                .Definitions.                     As used herein and in the pledge set forth in  of this order:                (a)  “Executive agency” shall include each “executive agency” as defined by  of title 5, United States Code, and shall include the Executive Office of the President; provided, however, that for purposes of this order “executive agency” shall include the United States Postal Service and Postal Regulatory Commission, but shall exclude the Government Accountability Office.(b)  “Appointee” shall include every full-time, non-career Presidential or Vice-Presidential appointee, non-career appointee in the Senior Executive Service (or other SES-type system), and appointee to a position that has been excepted from the competitive service by reason of being of a confidential or policymaking character (Schedule C and other positions excepted under comparable criteria) in an executive agency.  It does not include any person appointed as a member of the Senior Foreign Service or solely as a uniformed service commissioned officer.(c)  “Gift”(1)  shall have the definition set forth in .203(b) of title 5, Code of Federal Regulations;(2)  shall include gifts that are solicited or accepted indirectly as defined at .203(f) of title 5, Code of Federal Regulations; and(3)  shall exclude those items excluded by sections 2635.204(b), (c), (e)(1) & (3) and (j)-(l) of title 5, Code of Federal Regulations.(d)  “Covered executive branch official” and “lobbyist” shall have the definitions set forth in  of title 2, United States Code.(e)  “Registered lobbyist or lobbying organization” shall mean a lobbyist or an organization filing a registration pursuant to (a) of title 2, United States Code, and in the case of an organization filing such a registration, “registered lobbyist” shall include each of the lobbyists identified therein.(f)  “Lobby” and “lobbied” shall mean to act or have acted as a registered lobbyist.(g)  “Particular matter” shall have the same meaning as set forth in  of title 18, United States Code, and .402(b)(3) of title 5, Code of Federal Regulations.(h)  “Particular matter involving specific parties” shall have the same meaning as set forth in .201(h) of title 5, Code of Federal Regulations, except that it shall also include any meeting or other communication relating to the performance of one's official duties with a former employer or former client, unless the communication applies to a particular matter of general applicability and participation in the meeting or other event is open to all interested parties.(i)  “Former employer” is any person for whom the appointee has within the 2 years prior to the date of his or her appointment served as an employee, officer, director, trustee, or general partner, except that “former employer” does not include any executive agency or other entity of the Federal Government, State or local government, the District of Columbia, Native American tribe, or any United States territory or possession.                    (j)  “Former client” is any person for whom the appointee served personally as agent, attorney, or consultant within the 2 years prior to the date of his or her appointment, but excluding instances where the service provided was limited to a speech or similar appearance.  It does not include clients                                         of the appointee's former employer to whom the appointee did not personally provide services.                (k)  “Directly and substantially related to my former employer or former clients” shall mean matters in which the appointee's former employer or a former client is a party or represents a party.(l)  “Participate” means to participate personally and substantially.(m)  “Post-employment restrictions” shall include the provisions and exceptions in (c) of title 18, United States Code, and the implementing regulations.(n)  “Government official” means any employee of the executive branch.(o)  “Administration” means all terms of office of the incumbent President serving at the time of the appointment of an appointee covered by this order.(p)  “Pledge” means the ethics pledge set forth in  of this order.(q)  All references to provisions of law and regulations shall refer to such provisions as in effect on January 20, 2009..Waiver.                     (a)  The Director of the Office of Management and Budget, or his or her designee, in consultation with the Counsel to the President or his or her designee, may grant to any current or former appointee a written waiver of any restrictions contained in the pledge signed by such appointee if, and to the extent that, the Director of the Office of Management and Budget, or his or her designee, certifies in writing (i) that the literal application of the restriction is inconsistent with the purposes of the restriction, or (ii) that it is in the public interest to grant the waiver.  A waiver shall take effect when the certification is signed by the Director of the Office of Management and Budget or his or her designee.                                    (b)  The public interest shall include, but not be limited to, exigent circumstances relating to national security or to the economy.                     De minimis                     contact with an executive agency shall be cause for a waiver of the restrictions contained in paragraph 3 of the pledge.                .Administration.                     (a)  The head of every executive agency shall, in consultation with the Director of the Office of Government Ethics, establish such rules or procedures (conforming as nearly as practicable to the agency's general ethics rules and procedures, including those relating to designated agency ethics officers) as are necessary or appropriate to ensure that every appointee in the agency signs the pledge upon assuming the appointed office or otherwise becoming an appointee; to ensure that compliance with paragraph 3 of the pledge is addressed in a written ethics agreement with each appointee to whom it applies, which agreement shall also be approved by the Counsel to the President or his or her designee prior to the appointee commencing work; to ensure that spousal employment issues and other conflicts not expressly addressed by the pledge are addressed in ethics agreements with appointees or, where no such agreements are required, through ethics counseling; and generally to ensure compliance with this order within the agency.                (b)  With respect to the Executive Office of the President, the duties set forth in (a) shall be the responsibility of the Counsel to the President or his or her designee.(c)  The Director of the Office of Government Ethics shall:(1)  ensure that the pledge and a copy of this order are made available for use by agencies in fulfilling their duties under (a) above;(2)  in consultation with the Attorney General or the Counsel to the President or their designees, when appropriate, assist designated agency ethics officers in providing advice to current or former appointees regarding the application of the pledge; and                    (3)  in consultation with the Attorney General and the Counsel to the President or their designees, adopt such rules or procedures as are necessary or appropriate:                                    (i)    to carry out the foregoing responsibilities;(ii)   to apply the lobbyist gift ban set forth in paragraph 1 of the pledge to all executive branch employees;(iii)  to authorize limited exceptions to the lobbyist gift ban for circumstances that do not implicate the purposes of the ban;(iv)   to make clear that no person shall have violated the lobbyist gift ban if the person properly disposes of a gift as provided by .205 of title 5, Code of Federal Regulations;(v)    to ensure that existing rules and procedures for Government employees engaged in negotiations for future employment with private businesses that are affected by their official actions do not affect the integrity of the Government's programs and operations;(vi)   to ensure, in consultation with the Director of the Office of Personnel Management, that the requirement set forth in paragraph 6 of the pledge is honored by every employee of the executive branch;(4)  in consultation with the Director of the Office of Management and Budget, report to the President on whether full compliance is being achieved with existing laws and regulations governing executive branch procurement lobbying disclosure and on steps the executive branch can take to expand to the fullest extent practicable disclosure of such executive branch procurement lobbying and of lobbying for presidential pardons, and to include in the report both immediate action the executive branch can take and, if necessary, recommendations for legislation; and(5)  provide an annual public report on the administration of the pledge and this order.(d)  The Director of the Office of Government Ethics shall, in consultation with the Attorney General, the Counsel to the President, and the Director of the Office of Personnel Management, or their designees, report to the President on steps the executive branch can take to expand to the fullest extent practicable the revolving door ban set forth in paragraph 5 of the pledge to all executive branch employees who are involved in the procurement process such that they may not for 2 years after leaving Government service lobby any Government official regarding a Government contract that was under their official responsibility in the last 2 years of their Government service; and to include in the report both immediate action the executive branch can take and, if necessary, recommendations for legislation.(e)  All pledges signed by appointees, and all waiver certifications with respect thereto, shall be filed with the head of the appointee's agency for permanent retention in the appointee's official personnel folder or equivalent folder..Enforcement.                     (a)  The contractual, fiduciary, and ethical commitments in the pledge provided for herein are solely enforceable by the United States pursuant to this section by any legally available means, including debarment proceedings within any affected executive agency or judicial civil proceedings for declaratory, injunctive, or monetary relief.                (b)  Any former appointee who is determined, after notice and hearing, by the duly designated authority within any agency, to have violated his or her pledge may be barred from lobbying any officer or employee of that agency for up to 5 years in addition to the time period covered by the pledge.  The head of every executive agency shall, in consultation with the Director of the Office of Government Ethics, establish procedures to implement this subsection, which procedures shall include (but not be limited to) providing for factfinding and investigation of possible violations of this order and for referrals to the Attorney General for his or her consideration pursuant to subsection (c).                    (c)  The Attorney General or his or her designee is authorized:                                    (1)  upon receiving information regarding the possible breach of any commitment in a signed pledge, to request any appropriate Federal investigative authority to conduct such investigations as may be appropriate; and(2)  upon determining that there is a reasonable basis to believe that a breach of a commitment has occurred or will occur or continue, if not enjoined, to commence a civil action against the former employee in any United States District Court with jurisdiction to consider the matter.(d)  In any such civil action, the Attorney General or his or her designee is authorized to request any and all relief authorized by law, including but not limited to:(1)  such temporary restraining orders and preliminary and permanent injunctions as may be appropriate to restrain future, recurring, or continuing conduct by the former employee in breach of the commitments in the pledge he or she signed; and(2)  establishment of a constructive trust for the benefit of the United States, requiring an accounting and payment to the United States Treasury of all money and other things of value received by, or payable to, the former employee arising out of any breach or attempted breach of the pledge signed by the former employee..General Provisions.                     (a)  No prior s are repealed by this order.  To the extent that this order is inconsistent with any provision of any prior , this order shall control.                (b)  If any provision of this order or the application of such provision is held to be invalid, the remainder of this order and other dissimilar applications of such provision shall not be affected.(c)  Nothing in this order shall be construed to impair or otherwise affect:(1)  authority granted by law to a department, agency, or the head thereof; or(2)  functions of the Director of the Office of Management and Budget relating to budget, administrative, or legislative proposals.(d)  This order shall be implemented consistent with applicable law and subject to the availability of appropriations.(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.(f)  The definitions set forth in this order are solely applicable to the terms of this order, and are not otherwise intended to impair or affect existing law.OB#1
eo_text_clean <- data.frame(eo_text_clean)
skimr::skim(eo_text_clean)
Data summary
Name eo_text_clean
Number of rows 659
Number of columns 1
_______________________
Column type frequency:
character 1
________________________
Group variables None

Variable type: character

skim_variable n_missing complete_rate min max empty n_unique whitespace
eo_text_clean 1 1 215 137261 0 658 0

Front-end Matters

Deal with punctuations, numbers, stopwords, lowercase, and stemming

eo_text_corpus <- corpus(eo_text_clean$eo_text_clean, docnames = data_eo$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 659 documents, showing 100 documents:

          Text Types Tokens Sentences
       E9-1712   287   1179        21
       E9-1719   646   3053        37
       E9-1893   461   1849        41
       E9-1885   538   2162        42
       E9-1895   229    728        15
       E9-2484   481   1984        34
       E9-2483   248    657        15
       E9-2486    82    139         4
       E9-2485   566   2390        50
       E9-2893   409   1437        31
       E9-3106    59    107         1
       E9-3108    68    189         2
       E9-3113   425   1286        24
       E9-3112   258    720        13
       E9-4068   279    771        17
       E9-4103    51     75         2
       E9-5441   205    484        13
       E9-5802   474   1432        36
       E9-8572   274    872        10
      E9-11547   748   3182        59
      E9-15368   380   1115        22
      E9-16034    47    109         1
      E9-23886   159    447         7
      E9-23915    54     79         2
      E9-24203   416   1148        21
      E9-24518  1157   6240        57
      E9-25268   526   1992        41
      E9-26834   182    465         9
      E9-26408   195    562         3
      E9-27441   476   1849        28
      E9-28022   363   1176        19
      E9-28493   524   2391        30
      E9-28805   366   1050        17
      E9-29781   565   2094        23
      E9-30020   109    217         6
      E9-30413    52     82         1
      E9-31098   188    582        17
      E9-31418  1687  15235       175
 C1-2009-31418    53     63         3
       2010-38   219    689        17
      2010-705   247    760        14
     2010-1229   119    225         2
     2010-2419   395   1314        18
     2010-3725   243    624        16
     2010-4593   494   1597        37
     2010-4884   206    688         9
     2010-5837   391   1162        28
     2010-7154   341    937        20
     2010-8878   423   1646        14
     2010-9078   218    706         8
     2010-9451   274    712        16
     2010-9796   324    987        20
    2010-10172   233    637        11
    2010-11557   203    502         9
    2010-12070   220    642         5
    2010-12805   318    850        12
    2010-14613   428   1523        14
    2010-15851   327   1032        18
    2010-16864   511   1867        17
    2010-18169   644   2618        30
    2010-18988     0      0         0
    2010-21016   682   3206        32
    2010-21020   199    480        11
    2010-22002   429   1612        16
    2010-22279    91    182         3
    2010-24839   394   1906        23
    2010-25578   640   2400        30
    2010-27004   580   2126        42
    2010-28365   131    353         6
    2010-28360   397   1382        18
    2010-28854   262    863        15
    2010-29579   555   2335        26
    2010-31878   301    777        18
    2010-32960   194    563        17
    2010-33169   636   2448        33
     2011-1385   458   1285        30
     2011-2577   288    803        16
     2011-3257   311   1328        16
     2011-4753   378   1452        22
     2011-5728   568   2560        52
     2011-5903    77    215         3
     2011-8642   138    354         6
     2011-9739   249    679        11
    2011-10732   389   1011        28
    2011-10910   345   1227        16
    2011-12645   332   1173        16
    2011-13173   347   1567        11
    2011-14919   343    983        16
    2011-15181   451   1234        22
    2011-15443   355   1089        22
    2011-17447   293    712        16
    2011-17953   255    552        10
    2011-18065   331    966        14
    2011-19156   362   1383        17
    2011-21505   346   1312        16
    2011-21704   415   1303        21
    2011-23891   430   1462        25
    2011-26141   195    681         7
    2011-26574   173    372        16
    2011-26729   562   2528        33
eo_text_tokens <- tokens(eo_text_corpus,
    remove_punct = T,
    remove_numbers = T)
eo_text_tokens <- tokens_select(eo_text_tokens, pattern = stopwords("en"), selection = "remove") 
eo_text_tokens <- tokens_tolower (eo_text_tokens)
eo_text_tokens <- tokens_wordstem (eo_text_tokens)
print(eo_text_tokens)
Tokens consisting of 659 documents.
E9-1712 :
 [1] "definit"   "purpos"    "order"     "archivist" "refer"     "archivist"
 [7] "unit"      "state"     "designe"   "b"         "nara"      "refer"    
[ ... and 545 more ]

E9-1719 :
 [1] "ethic"    "pledg"    "everi"    "appointe" "everi"    "execut"  
 [7] "agenc"    "appoint"  "januari"  "shall"    "sign"     "upon"    
[ ... and 1,346 more ]

E9-1893 :
 [1] "order"      "effect"     "appropri"   "disposit"   "individu"  
 [6] "current"    "detain"     "depart"     "defens"     "guantánamo"
[11] "bay"        "naval"     
[ ... and 839 more ]

E9-1885 :
 [1] "order"             "improv"            "effect"           
 [4] "human"             "intelligence-gath" "promot"           
 [7] "safe"              "law"               "human"            
[10] "treatment"         "individu"          "unit"             
[ ... and 978 more ]

E9-1895 :
 [1] "order"     "develop"   "polici"    "detent"    "trial"     "transfer" 
 [7] "releas"    "disposit"  "individu"  "captur"    "apprehend" "connect"  
[ ... and 347 more ]

E9-2484 :
 [1] "includ"    "feder"     "properti"  "administr" "servic"    "act"      
 [7] "u.s.c"     "et"        "seq"       "polici"    "polici"    "feder"    
[ ... and 870 more ]

[ reached max_ndoc ... 653 more documents ]
dfmat_eo_text <- dfm(eo_text_tokens)  
dfmat_eo_text
Document-feature matrix of: 659 documents, 10,007 features (97.31% sparse) and 0 docvars.
         features
docs      definit purpos order archivist refer unit state designe  b nara
  E9-1712       1      1    10        19     7    2     2       3  5    8
  E9-1719       4      3    19         0     2   14    15      11  9    0
  E9-1893       1      0    13         0     2   20    23       0  4    0
  E9-1885       1      2    16         0     2   20    21       1  4    0
  E9-1895       0      1     5         0     0    5     6       1  2    0
  E9-2484       1      2    32         0     0    5     6       0 10    0
[ reached max_ndoc ... 653 more documents, reached max_nfeat ... 9,997 more features ]
quanteda::ntoken(dfmat_eo_text) 
      E9-1712       E9-1719       E9-1893       E9-1885       E9-1895 
          557          1358           851           990           359 
      E9-2484       E9-2483       E9-2486       E9-2485       E9-2893 
          882           312            53          1051           682 
      E9-3106       E9-3108       E9-3113       E9-3112       E9-4068 
           47            80           622           326           358 
      E9-4103       E9-5441       E9-5802       E9-8572      E9-11547 
           33           238           663           447          1656 
     E9-15368      E9-16034      E9-23886      E9-23915      E9-24203 
          519            36           193            34           549 
     E9-24518      E9-25268      E9-26834      E9-26408      E9-27441 
         3207           986           219           226           927 
     E9-28022      E9-28493      E9-28805      E9-29781      E9-30020 
          579          1219           502          1010            94 
     E9-30413      E9-31098      E9-31418 C1-2009-31418       2010-38 
           34           245          7195            30           357 
     2010-705     2010-1229     2010-2419     2010-3725     2010-4593 
          335           100           620           281           779 
    2010-4884     2010-5837     2010-7154     2010-8878     2010-9078 
          274           587           480           683           328 
    2010-9451     2010-9796    2010-10172    2010-11557    2010-12070 
          336           458           307           230           268 
   2010-12805    2010-14613    2010-15851    2010-16864    2010-18169 
          400           749           489           890          1298 
   2010-18988    2010-21016    2010-21020    2010-22002    2010-22279 
            0          1494           220           679            85 
   2010-24839    2010-25578    2010-27004    2010-28365    2010-28360 
          792          1228          1067           155           684 
   2010-28854    2010-29579    2010-31878    2010-32960    2010-33169 
          431          1147           377           245          1228 
    2011-1385     2011-2577     2011-3257     2011-4753     2011-5728 
          625           382           627           621          1175 
    2011-5903     2011-8642     2011-9739    2011-10732    2011-10910 
           98           134           297           521           518 
   2011-12645    2011-13173    2011-14919    2011-15181    2011-15443 
          494           625           466           645           573 
   2011-17447    2011-17953    2011-18065    2011-19156    2011-21505 
          361           253           490           602           561 
   2011-21704    2011-23891    2011-26141    2011-26574    2011-26729 
          630           738           276           169          1232 
   2011-28728    2011-29683    2011-30463    2011-30990    2011-31624 
          462           462          1029           147          1386 
   2011-32486    2011-33087    2011-33335    2011-33089     2012-1568 
           85           281           179           507           721 
    2012-2557     2012-3097     2012-3616     2012-5366     2012-6797 
          140           769           584           481           696 
    2012-7019     2012-7636     2012-9473    2012-10034    2012-10715 
         2819           965           418           754          1102 
   2012-10968    2012-10884    2012-11798    2012-12225    2012-12889 
          678           713           480           510           203 
   2012-12881    2012-12882    2012-12883    2012-15183    2012-15954 
          267           192           229           916           505 
   2012-17022    2012-17264    2012-18237    2012-18868    2012-19055 
         1340           651           493          1491          1667 
   2012-20259    2012-22030    2012-22062    2012-22807    2012-24374 
          809           577          1200           904          1103 
   2012-25236    2012-27002    2012-30060    2012-30170    2012-30310 
         1834           672           561           108           980 
   2012-31574    2012-31225    2013-00002    2013-03915    2013-05967 
           88           136           237          1748           861 
   2013-06712    2013-07837    2013-08501    2013-08626    2013-11533 
          356           371            96           248           615 
   2013-12157    2013-12650    2013-13523    2013-15782    2013-15942 
           86            95          2387           735           786 
   2013-16387    2013-17478    2013-19220    2013-19520    2013-24388 
          648           734          1232           408           770 
   2013-26785    2013-28581    2013-31445    2014-01523    2014-03474 
         1658           154           230           223            69 
   2014-03805    2014-04254    2014-05323    2014-06141    2014-06768 
          882           939           572           567           203 
   2014-06612    2014-07895    2014-08426    2014-09343    2014-11442 
          532           657           358            20           767 
   2014-12651    2014-14429    2014-14432    2014-16360    2014-17522 
          221            91           157           552           164 
   2014-18561    2014-18682    2014-18998    2014-22805    2014-23228 
         1912           108           496          1411          1382 
   2014-24218    2014-24851    2014-25292    2014-25439    2014-29121 
          130           201           107           542           136 
   2014-29625    2014-30195    2014-30323    2014-30363    2015-00058 
          291           276           603           230           536 
   2015-01255    2015-01522    2015-02379    2015-03714    2015-05677 
          721           857           944          1260           765 
   2015-07016    2015-07788    2015-13055    2015-15495    2015-15828 
         4180           676           141            89            44 
   2015-16122    2015-16334    2015-17926    2015-18292    2015-19183 
          895           298           150           415           985 
   2015-19209    2015-20801    2015-22888    2015-22998    2015-23630 
         1009           468           131          1044           523 
   2015-25489    2015-25744    2015-29403    2015-29498    2015-30191 
          513           256           186           201           656 
   2015-31749    2015-32060    2015-32582    2016-01325    2016-02475 
          143          1346           230          1449          1016 
   2016-03141    2016-03038    2016-04770    2016-06250    2016-06355 
          688           872           249           823           853 
   2016-07703    2016-08713    2016-09346    2016-09483    2016-11300 
          211           106           513           750           639 
   2016-12307    2016-12155    2016-12579    2016-15542    2016-16295 
         1199           753            89           754           765 
   2016-17945    2016-18872    2016-19723    2016-19724    2016-19725 
          339           202           194           219           236 
   2016-20713    2016-22454    2016-22962    2016-24066    2016-24847 
          155           165            88           897           280 
   2016-25288    2016-25290    2016-26753    2016-27156    2016-27171 
          390          1260            68           995          1450 
   2016-28203    2016-29165    2016-29169    2016-29519    2016-30101 
          922           432           384          1643           143 
   2016-30272    2016-30277    2016-31792    2016-31875    2016-31922 
          214          1345           217           241           365 
   2017-01169    2017-01164    2017-01168    2017-01487    2017-01197 
         1026           314           135           156           480 
   2017-01489    2017-01623    2017-01799    2017-02029    2017-02095 
          235          3560           241           327          1329 
   2017-02102    2017-02281    2017-02450    2017-02451    2017-02762 
         1085          1509          1384           478           225 
   2017-03113    2017-03115    2017-03116    2017-03118    2017-04107 
          672           323           158           309           601 
   2017-04357    2017-04353    2017-04837    2017-05399    2017-06382 
          796           258          3238           312            91 
   2017-06576    2017-06716    2017-06967    2017-06971    2017-06968 
         1326           414           365           159           378 
   2017-08311    2017-08586    2017-08818    2017-08905    2017-08908 
          702           348           612           306           485 
   2017-08990    2017-09083    2017-09087    2017-09156    2017-09161 
          273           479           975           407           154 
   2017-09574    2017-10004    2017-10003    2017-13012    2017-13458 
          307          1710           404           949           101 
   2017-14378    2017-14992    2017-15680    2017-15860    2017-18134 
          692           126           412           581          2009 
   2017-18468    2017-18679    2017-20647    2017-21555    2017-21559 
          409           102          1204           414           162 
   2017-22677    2017-23270    2017-23630    2017-27034    2017-27899 
          611            98           920           229           509 
   2017-27925    2017-28160    2018-00240    2018-00553    2018-00630 
          802           239            76           470           312 
   2018-02261    2018-04414    2018-04860    2018-05113    2018-05916 
          425           567           615           814           335 
   2018-07874    2018-08272    2018-08883    2018-09895    2018-10403 
         1027           484           925           579           586 
   2018-10855    2018-11101    2018-11335    2018-11939    2018-11913 
          746           868           336          1181          1613 
   2018-11916    2018-11936    2018-13640    2018-13696    2018-15202 
         1812           313           887           390           804 
   2018-15195    2018-15299    2018-15955    2018-17068    2018-19514 
          224           534          1106          3285           615 
   2018-20203    2018-20816    2018-24254    2018-26156    2018-26552 
         1397          1463           643           660           132 
   2018-27515    2018-27945    2019-00014    2019-00048    2019-00615 
          902           129          1118           228           206 
   2019-01426    2019-02544    2019-04298    2019-04437    2019-04595 
          510          1671           425           888           196 
   2019-05370    2019-05934    2019-06325    2019-06548    2019-07645 
          189           823          1701           240           596 
   2019-07656    2019-08797    2019-09750    2019-09877    2019-10398 
         1306          1695          1373           953          1026 
   2019-10538    2019-12802    2019-13175    2019-13945    2019-13793 
         1000           816           447           904           806 
   2019-14016    2019-15159    2019-15222    2019-15449    2019-16383 
          875           591          1483           501           748 
   2019-16879    2019-17052    2019-19367    2019-19895    2019-20804 
          413           689           369           447          1239 
   2019-21505    2019-21630    2019-22073    2019-22623    2019-22624 
          391           389          1066          1023          1290 
   2019-22749    2019-22849    2019-23525    2019-24040    2019-24288 
          408          1287           575           731           130 
   2019-26178    2019-27217    2019-27678    2019-28286    2020-00534 
          584           340           129           230          1004 
   2020-02439    2020-02438    2020-03337    2020-03556    2020-04730 
         1172           662           733           165           277 
   2020-04755    2020-06161    2020-06478    2020-06969    2020-06985 
          290           310           364           722           200 
   2020-07530    2020-07800    2020-08392    2020-08846    2020-09537 
         1954           407           131           177           208 
   2020-09536    2020-09645    2020-09695    2020-10315    2020-10953 
          446           116          1330          1864           392 
   2020-10993    2020-11301    2020-12030    2020-12430    2020-12584 
          220           973          1324           651          1757 
   2020-12953    2020-13449    2020-14077    2020-14337    2020-14509 
          929           911          1234           650           987 
   2020-14328    2020-14872    2020-15338    2020-15646    2020-16623 
          101          1140           834          1386           327 
   2020-16624    2020-20887    2020-16625    2020-17364    2020-17363 
          229           412           332           517           371 
   2020-17699    2020-17700    2020-18012    2020-18015    2020-19032 
          505           542          1704           529           304 
   2020-21129    2020-21160    2020-21534    2020-21914    2020-21960 
          450           853          1904          2392           587 
   2020-22064    2020-22510    2020-23115    2020-23116    2020-23780 
         1508           613           646          1150          1202 
   2020-24793    2020-25459    2020-27065    2020-27353    2020-27455 
          950           781          1471           559           318 
   2020-27740    2020-27739    2020-27807    2020-27948    2020-28605 
          528           278           129           995          1499 
   2020-28606    2020-29235    2021-00040    2021-01013    2021-00305 
          418           628           228          1191           763 
   2021-01094    2021-01228    2021-01469    2021-01476    2021-01635 
          242           323           338           834           907 
   2021-01646    2021-01643    2021-01644    2021-01645    2021-01713 
          775          1178           458           775            79 
   2021-01714    2021-01712    2021-01753    2021-01759    2021-01765 
         1681           210          1101           637          1900 
   2021-01766    2021-01767    2021-01755    2021-01761    2021-01762 
          955           257           644           447          1665 
   2021-01768    2021-01859    2021-01863    2021-01864    2021-01849 
          176           964           415           765           476 
   2021-01852    2021-01854    2021-01858    2021-01865    2021-01923 
          981           734           506           795           225 
   2021-01924    2021-02034    2021-02038    2021-02070    2021-02176 
          439           638          1234           221           507 
   2021-02177    2021-02252    2021-02561    2021-02562    2021-02563 
         4509           481          1393           542           874 
   2021-02804    2021-03139    2021-03424    2021-03874    2021-04280 
         1741           800           594           122          1598 
   2021-04281    2021-05087    2021-05183    2021-05200    2021-07239 
          183          1501          1219           345           229 
   2021-07756    2021-08098    2021-09213    2021-09263    2021-10139 
          304           986           785          1016           259 
   2021-10460    2021-10691    2021-11168    2021-11792    2021-12019 
         4810           412          1152          1745           610 
   2021-12382    2021-12506    2021-14127    2021-15069    2021-17121 
          792           873          3265          3954           562 
   2021-17253    2021-18306    2021-19579    2021-19578    2021-19924 
          820           501          1296           554           849 
   2021-19927    2021-20165    2021-20164    2021-20508    2021-20629 
          408          1810            77          1256           102 
   2021-21908    2021-22588    2021-23224    2021-24183    2021-25286 
          865          1828          1841           318           373 
   2021-25287    2021-25715    2021-25548    2021-26459    2021-27114 
         1494          1070           225           684          2766 
   2021-27380    2021-27605    2021-27505    2021-28313    2022-02027 
         2971           773          1246           228            83 
   2022-02869    2022-03346    2022-04020    2022-05232    2022-05471 
          930           490           776           362          3294 
   2022-05554    2022-05949    2022-07716    2022-07757    2022-09138 
          438           191           613           331          1281 
   2022-10076    2022-11810    2022-13391    2022-15138    2022-15628 
          457          6123          2325           734           167 
   2022-15743    2022-17420    2022-18840    2022-20167    2022-20210 
         1480           480           515          3633           904 
   2022-20450    2022-21839    2022-21911    2022-22531    2022-22834 
         1727           886           495          4474           446 
   2022-23433    2022-27585    2022-28474    2023-03779    2023-05714 
          467           535           228          2591           731 
   2023-06730    2023-07760    2023-08659    2023-08955    2023-09318 
         2116           653          2604          3194           134 
   2023-09826    2023-10407    2023-12974    2023-13889    2023-15347 
         1025           318          1837           919           110 
   2023-16570    2023-16636    2023-17449    2023-17832    2023-19798 
          302          1741          1358           435           114 
   2023-21174    2023-22250    2023-24283    2023-26569    2023-27318 
         1027           759         11965           731          1461 
   2023-28661    2023-28662    2024-02354    2024-04012    2024-04573 
          228           910           841           944          3224 
   2024-04857    2024-05220    2024-06123    2024-06931    2024-08332 
          185          1374          1297           638           241 
   2024-13810    2024-16225    2024-16740    2024-20712    2024-22938 
         1075          1142           145          1393          1754 
   2024-27850    2024-31143    2024-31354    2024-31355    2024-31466 
          219           129           256           458           232 
   2024-31766    2025-00595    2025-00603    2025-00611    2025-00618 
          132           302           256           218           233 
   2025-00620    2025-00619    2025-00622    2025-01395    2025-01437 
          189           236           488          7031           181 
   2025-01467    2025-01470    2025-01759    2025-01758 
          443          5414           106           638 
dfmat_eo_text <- dfmat_eo_text[ntoken(dfmat_eo_text) > 0, ]
dfmat_eo_text <- dfm_trim(dfmat_eo_text, min_termfreq = 5, min_docfreq = 2)
wf_model_eo_text <- quanteda.textmodels::textmodel_wordfish(dfmat_eo_text, dir = c(281,589))
summary(wf_model_eo_text)

Call:
textmodel_wordfish.dfm(x = dfmat_eo_text, dir = c(281, 589))

Estimated Document Positions:
                   theta       se
E9-1712        0.6137784 0.074242
E9-1719        0.5980157 0.047371
E9-1893        0.5330780 0.059690
E9-1885        0.2780541 0.055424
E9-1895       -0.1742747 0.081660
E9-2484        0.5948078 0.058752
E9-2483        0.2070336 0.097209
E9-2486        0.2185817 0.226338
E9-2485        0.4833788 0.053560
E9-2893       -0.7361689 0.045092
E9-3106       -0.7741773 0.166436
E9-3108       -0.7403602 0.129901
E9-3113       -0.1404434 0.063160
E9-3112       -0.4328618 0.079386
E9-4068       -0.9440724 0.050497
E9-4103       -0.4465245 0.239857
E9-5441       -0.9129526 0.065082
E9-5802       -1.0745694 0.030866
E9-8572       -1.0775258 0.037113
E9-11547      -1.0243135 0.021751
E9-15368      -0.7976403 0.048820
E9-16034       1.4242022 0.249454
E9-23886      -0.9834970 0.064969
E9-23915      -0.3032374 0.246882
E9-24203      -0.2113135 0.067392
E9-24518      -0.8339801 0.019127
E9-25268      -1.2635303 0.016502
E9-26834      -0.6610413 0.083949
E9-26408       0.2387677 0.114396
E9-27441      -0.8775144 0.033794
E9-28022      -0.3505139 0.060804
E9-28493      -0.4283509 0.040659
E9-28805      -0.7230436 0.053037
E9-29781      -0.5399839 0.042120
E9-30020       0.6142666 0.176448
E9-30413       0.8712422 0.294754
E9-31098       2.1144021 0.015234
E9-31418       0.2014669 0.020077
C1-2009-31418 -0.5386926 0.273324
2010-38       -0.5750244 0.069499
2010-705      -0.1860516 0.084209
2010-1229      0.6624973 0.172843
2010-2419     -0.6559534 0.049843
2010-3725     -0.6193607 0.075952
2010-4593     -1.2064598 0.021712
2010-4884      0.2373585 0.101924
2010-5837     -0.5458120 0.055418
2010-7154     -0.6783880 0.057117
2010-8878      1.8011646 0.043464
2010-9078     -0.4608211 0.078340
2010-9451     -0.5066464 0.074109
2010-9796     -0.7829717 0.052492
2010-10172    -0.6126878 0.073439
2010-11557     0.1994422 0.114040
2010-12070    -0.0787144 0.098627
2010-12805    -0.7020000 0.059868
2010-14613    -0.9467555 0.034882
2010-15851    -0.7761679 0.051471
2010-16864    -0.3594441 0.049829
2010-18169    -0.8408246 0.029795
2010-21016    -0.1441701 0.040878
2010-21020     0.1971684 0.116980
2010-22002     1.8863063 0.035241
2010-22279     2.0862334 0.031586
2010-24839     1.8625848 0.034943
2010-25578    -1.0206117 0.024668
2010-27004    -1.4063336 0.008414
2010-28365     0.6093337 0.139142
2010-28360    -0.1289421 0.061314
2010-28854    -0.2242837 0.073478
2010-29579    -0.6214513 0.037604
2010-31878    -0.8339469 0.055738
2010-32960     2.1143727 0.015238
2010-33169    -1.0526361 0.023612
2011-1385     -0.6888821 0.048741
2011-2577     -0.6503831 0.064729
2011-3257     -0.5121325 0.054137
2011-4753      1.8492551 0.041188
2011-5728      0.2687650 0.050544
2011-5903      0.2904773 0.186350
2011-8642     -0.7423821 0.099928
2011-9739      1.8154174 0.063690
2011-10732    -0.7460256 0.050913
2011-10910     1.8794181 0.040984
2011-12645     1.8948301 0.039924
2011-13173     1.9199126 0.032442
2011-14919    -1.0383161 0.038793
2011-15181    -0.8481158 0.042265
2011-15443    -0.8054976 0.046285
2011-17447    -0.6764782 0.065180
2011-17953    -0.6140462 0.080336
2011-18065    -0.9442370 0.043237
2011-19156     1.8125114 0.045154
2011-21505     1.9045379 0.036115
2011-21704    -1.0324454 0.033650
2011-23891    -0.3888962 0.052850
2011-26141    -1.0004400 0.053219
2011-26574     0.7550176 0.132819
2011-26729    -0.4086593 0.040957
2011-28728    -0.9410302 0.045167
2011-29683    -0.5437889 0.062664
2011-30463     1.7891574 0.036188
2011-30990    -0.9422614 0.078394
2011-31624    -1.3424111 0.010352
2011-32486     2.0860515 0.031628
2011-33087     2.1021803 0.015683
2011-33335    -0.3110762 0.110337
2011-33089    -0.6718916 0.055131
2012-1568     -0.5667460 0.049198
2012-2557      0.4546102 0.147321
2012-3097      1.9072773 0.030563
2012-3616     -0.7824954 0.046588
2012-5366     -0.2610612 0.068912
2012-6797     -1.0364632 0.031979
2012-7019     -0.0291967 0.030757
2012-7636     -0.8061575 0.035521
2012-9473     -0.8466739 0.052044
2012-10034     1.7903707 0.041968
2012-10715    -1.1323426 0.021788
2012-10968    -0.3752002 0.055672
2012-10884     1.8542149 0.037690
2012-11798    -0.5898255 0.059191
2012-12225     1.8614010 0.043636
2012-12889     0.0654408 0.114940
2012-12881    -0.0372601 0.099649
2012-12882     0.3042855 0.122770
2012-12883    -0.1834251 0.101766
2012-15183    -0.8050482 0.036723
2012-15954     1.4648347 0.067995
2012-17022    -0.5653278 0.036203
2012-17264     1.8068929 0.043856
2012-18237     1.7254635 0.057047
2012-18868    -1.3436296 0.009920
2012-19055     1.8433405 0.025518
2012-20259    -0.9409747 0.033679
2012-22030    -0.9280050 0.041470
2012-22062    -1.1092848 0.021746
2012-22807    -1.0634982 0.026900
2012-24374    -0.1270914 0.048046
2012-25236     1.8871787 0.021281
2012-27002    -0.8365667 0.041537
2012-30060    -0.5152537 0.057002
2012-30170    -0.6885158 0.116322
2012-30310    -0.9341302 0.031305
2012-31574    -1.0824702 0.082717
2012-31225     0.2860891 0.145818
2013-00002     2.1185708 0.014967
2013-03915    -0.4543128 0.033324
2013-05967     0.9152634 0.058511
2013-06712     0.0713822 0.089025
2013-07837    -0.7683249 0.059376
2013-08501    -0.2543460 0.152533
2013-08626     2.1139281 0.015224
2013-11533    -0.7454947 0.047250
2013-12157     2.0852994 0.031617
2013-12650    -0.2147416 0.155335
2013-13523     1.8872338 0.018731
2013-15782    -0.8461732 0.039242
2013-15942    -1.1284786 0.025808
2013-16387    -0.5995846 0.051126
2013-17478    -1.3600836 0.013101
2013-19220    -0.7433075 0.033785
2013-19520     1.6937263 0.067149
2013-24388    -0.9055770 0.035913
2013-26785    -1.0202648 0.021295
2013-28581     0.7315405 0.138798
2013-31445     2.1197098 0.015037
2014-01523     0.1940401 0.114212
2014-03474     0.0162148 0.192751
2014-03805     0.3275009 0.057938
2014-04254    -0.5665888 0.043634
2014-05323     1.8956022 0.036962
2014-06141     1.8890475 0.038017
2014-06768     0.7022718 0.121209
2014-06612     1.8857520 0.039615
2014-07895     1.7834663 0.045547
2014-08426    -0.0065291 0.085965
2014-09343     0.8203833 0.359827
2014-11442     1.7143881 0.046077
2014-12651     1.4619203 0.101382
2014-14429     2.0781074 0.032398
2014-14432     0.7934338 0.137473
2014-16360     1.6355122 0.058293
2014-17522    -0.1885075 0.119820
2014-18561     0.0863201 0.038098
2014-18682    -0.1592299 0.153343
2014-18998    -0.7530081 0.051787
2014-22805    -1.1011387 0.020481
2014-23228    -0.9320919 0.026124
2014-24218    -0.2620715 0.131127
2014-24851     0.6103412 0.124136
2014-25292     0.5203316 0.167768
2014-25439    -0.2913275 0.064864
2014-29121     0.2860891 0.145818
2014-29625    -0.2553618 0.089499
2014-30195    -0.5958386 0.077491
2014-30323     1.8999590 0.035406
2014-30363     2.1197098 0.015037
2015-00058     1.9161800 0.035359
2015-01255    -0.4869287 0.051134
2015-01522    -1.1219582 0.025006
2015-02379    -0.5561520 0.043164
2015-03714    -0.1482181 0.044659
2015-05677     1.8420397 0.037579
2015-07016    -0.8432017 0.016668
2015-07788     1.7271634 0.048336
2015-13055     1.3034552 0.133842
2015-15495     2.0819139 0.031860
2015-15828    -0.8606418 0.157274
2015-16122    -0.1908486 0.051730
2015-16334    -0.6166669 0.075543
2015-17926     0.8528596 0.139549
2015-18292     0.1921129 0.082541
2015-19183    -0.9315422 0.031756
2015-19209    -1.2623802 0.016468
2015-20801    -0.6551933 0.057607
2015-22888     0.3722539 0.149234
2015-22998     0.2134290 0.052523
2015-23630    -0.9559386 0.041433
2015-25489    -1.0919721 0.034029
2015-25744     0.2038653 0.106374
2015-29403     1.2497847 0.121509
2015-29498     0.7206840 0.121727
2015-30191     1.8364218 0.041021
2015-31749     0.3738644 0.142452
2015-32060    -0.8154338 0.030013
2015-32582     2.1197098 0.015037
2016-01325     1.8563653 0.026359
2016-02475    -0.4309495 0.044815
2016-03141    -0.8692306 0.039605
2016-03038    -0.7733445 0.038387
2016-04770     0.4596788 0.110146
2016-06250    -0.2995782 0.052489
2016-06355     1.8799810 0.032041
2016-07703     0.6194744 0.120213
2016-08713     0.5699949 0.167954
2016-09346    -0.7996604 0.049456
2016-09483     1.7707283 0.043493
2016-11300    -0.6429081 0.049685
2016-12307    -0.6243956 0.036843
2016-12155    -0.5809129 0.048315
2016-12579     2.0819139 0.031860
2016-15542    -0.9466364 0.034840
2016-16295    -0.1577803 0.057144
2016-17945     0.5089125 0.094222
2016-18872    -0.6161333 0.089407
2016-19723     0.5462748 0.123731
2016-19724     0.2114551 0.113460
2016-19725    -0.1713750 0.100631
2016-20713     0.4963222 0.137947
2016-22454     1.2568893 0.126043
2016-22962     2.0835390 0.031662
2016-24066    -0.1513846 0.052267
2016-24847     1.4834676 0.090649
2016-25288     0.0285271 0.083634
2016-25290    -0.7776085 0.032465
2016-26753     0.4871269 0.205704
2016-27156    -0.8971042 0.032325
2016-27171    -0.6838706 0.033114
2016-28203    -1.1020165 0.025069
2016-29165    -0.2564632 0.073188
2016-29169    -0.3883986 0.074401
2016-29519    -1.0395853 0.020797
2016-30101     0.2062967 0.140800
2016-30272     0.0585805 0.111833
2016-30277    -1.0481258 0.022971
2016-31792     0.1970670 0.114790
2016-31875     2.1155782 0.015199
2016-31922     1.5670192 0.074570
2017-01169     0.2218522 0.056671
2017-01164     0.9841511 0.096313
2017-01168     0.2110367 0.145519
2017-01487     0.5825274 0.137804
2017-01197     0.6963597 0.080323
2017-01489    -0.1731356 0.100789
2017-01623     0.0066331 0.027477
2017-01799    -0.5689369 0.084782
2017-02029    -0.5434326 0.073309
2017-02095     0.2409873 0.046936
2017-02102     0.3146388 0.052130
2017-02281     0.4905649 0.045063
2017-02450     0.6944828 0.046695
2017-02451    -0.2198370 0.069812
2017-02762    -0.2668270 0.100986
2017-03113    -0.0949582 0.062221
2017-03115    -0.4831023 0.076275
2017-03116     0.6193121 0.137391
2017-03118    -0.5418120 0.075714
2017-04107    -0.3512246 0.059706
2017-04357    -1.2347891 0.019985
2017-04353    -0.0167152 0.100906
2017-04837     0.7452493 0.030821
2017-05399    -0.4233333 0.080118
2017-06382     0.1791527 0.173634
2017-06576    -0.5015114 0.037557
2017-06716    -0.7839122 0.055568
2017-06967     0.3768754 0.090986
2017-06971     0.6389821 0.136947
2017-06968    -0.2168114 0.079054
2017-08311    -0.0853795 0.060374
2017-08586     0.0004367 0.087459
2017-08818    -0.9963294 0.036324
2017-08905    -0.6938474 0.070565
2017-08908    -0.4794678 0.062582
2017-08990    -0.5194406 0.081695
2017-09083    -0.4807843 0.064296
2017-09087    -0.3707728 0.047312
2017-09156    -0.2759429 0.074636
2017-09161    -0.6502266 0.101425
2017-09574     0.0763999 0.095588
2017-10004    -0.3285671 0.035751
2017-10003    -0.4159590 0.070530
2017-13012    -1.1131160 0.024101
2017-13458     0.0661949 0.161899
2017-14378    -0.5613067 0.050100
2017-14992     1.1506569 0.148144
2017-15680    -0.6741722 0.060339
2017-15860    -0.4267717 0.058880
2017-18134    -0.7193573 0.026703
2017-18468     1.8124843 0.055025
2017-18679     0.1720496 0.164095
2017-20647     1.8813690 0.026872
2017-21555    -1.1245705 0.035516
2017-21559    -0.4040405 0.111285
2017-22677    -0.9138258 0.041191
2017-23270     0.5303185 0.172728
2017-23630     0.4738513 0.057331
2017-27034     0.0284982 0.113528
2017-27899    -0.4536093 0.062171
2017-27925     1.7464403 0.043475
2017-28160     2.1156205 0.015226
2018-00240     0.0563211 0.185483
2018-00553    -0.6992571 0.055773
2018-00630    -0.8313746 0.060749
2018-02261     0.4985803 0.084317
2018-04414    -1.0289154 0.036014
2018-04860     1.9719145 0.026321
2018-05113    -1.0215412 0.030342
2018-05916     1.8386906 0.057265
2018-07874    -0.8550167 0.033047
2018-08272    -0.5457008 0.061120
2018-08883     0.8047137 0.058074
2018-09895    -1.0477879 0.034377
2018-10403    -0.4804249 0.057479
2018-10855    -0.4607565 0.050926
2018-11101    -0.5687875 0.044550
2018-11335     1.7456317 0.067543
2018-11939    -0.0813924 0.046627
2018-11913    -0.1157236 0.040067
2018-11916     0.1234385 0.039251
2018-11936    -0.2471912 0.087627
2018-13640    -0.7120649 0.040537
2018-13696     0.1803070 0.085864
2018-15202     0.1123542 0.059910
2018-15195    -0.0800682 0.105935
2018-15299    -0.3552277 0.062914
2018-15955    -1.0961366 0.023096
2018-17068     1.8979195 0.015425
2018-19514    -0.6364064 0.051252
2018-20203     1.2573857 0.043139
2018-20816     1.7388123 0.032654
2018-24254     1.7820519 0.046146
2018-26156     1.8574709 0.038836
2018-26552     0.2654211 0.148766
2018-27515    -1.0461354 0.027577
2018-27945     0.2713483 0.148870
2019-00014    -1.0943333 0.023181
2019-00048     2.1203483 0.015033
2019-00615     1.6140617 0.096833
2019-01426    -0.2603480 0.068013
2019-02544    -0.9058411 0.024449
2019-04298    -0.1512447 0.076057
2019-04437    -1.0927815 0.025906
2019-04595     0.3075904 0.122813
2019-05370     0.8682909 0.124318
2019-05934    -1.2018078 0.021363
2019-06325    -0.5849874 0.032389
2019-06548     2.1154411 0.015278
2019-07645     0.2980475 0.070105
2019-07656    -0.5194423 0.037797
2019-08797     0.1890520 0.041308
2019-09750    -0.8607273 0.028610
2019-09877     1.8539917 0.032625
2019-10398    -1.2112339 0.018754
2019-10538     0.6832059 0.054856
2019-12802    -0.7748107 0.039929
2019-13175    -0.2421463 0.071964
2019-13945    -1.0869017 0.026143
2019-13793     1.8583420 0.035115
2019-14016    -1.1297420 0.024590
2019-15159    -1.3236997 0.017464
2019-15222    -0.4160199 0.037580
2019-15449    -0.1072095 0.070897
2019-16383     1.7190004 0.047065
2019-16879     1.4437980 0.074938
2019-17052     1.8376112 0.040003
2019-19367    -0.6915885 0.062801
2019-19895     1.7503427 0.057914
2019-20804    -1.2144078 0.017166
2019-21505    -0.0569957 0.081158
2019-21630    -1.1100409 0.037660
2019-22073    -1.1809785 0.020014
2019-22623     0.0209073 0.051277
2019-22624     0.2196235 0.047705
2019-22749    -0.3304716 0.073210
2019-22849     1.7750724 0.032992
2019-23525    -0.9293271 0.040813
2019-24040    -0.7705071 0.042175
2019-24288     0.2667338 0.147666
2019-26178    -1.0286654 0.035519
2019-27217    -0.3807596 0.081246
2019-27678     0.2713483 0.148870
2019-28286     2.1193978 0.015103
2020-00534     1.8060557 0.035434
2020-02439     0.4246492 0.050986
2020-02438    -0.8529452 0.041215
2020-03337    -0.5310174 0.051146
2020-03556    -0.3264293 0.113874
2020-04730    -0.3941833 0.085848
2020-04755    -0.1260490 0.092390
2020-06161    -0.3057208 0.083996
2020-06478    -0.2095293 0.080429
2020-06969    -0.0648374 0.059591
2020-06985     0.5823676 0.121960
2020-07530     0.0205467 0.037018
2020-07800    -0.3552511 0.073032
2020-08392    -0.0798402 0.138504
2020-08846     0.6285394 0.129529
2020-09537    -0.2993272 0.102856
2020-09536    -0.2835347 0.071567
2020-09645     0.4845414 0.160916
2020-09695     0.3130708 0.047408
2020-10315    -0.5923106 0.030542
2020-10953    -0.1554844 0.078912
2020-10993    -0.3835479 0.096724
2020-11301    -0.3632058 0.046888
2020-12030    -0.2971451 0.042451
2020-12430    -0.1071411 0.062596
2020-12584    -0.3348236 0.035137
2020-12953     1.6269317 0.045304
2020-13449    -0.7525774 0.038771
2020-14077    -1.0702240 0.023084
2020-14337    -0.8843755 0.040552
2020-14509    -0.0597665 0.053380
2020-14328    -0.3803310 0.141848
2020-14872    -0.8884796 0.031755
2020-15338    -1.3488246 0.012893
2020-15646     1.6020057 0.038025
2020-16623    -1.2520507 0.030735
2020-16624    -0.8368022 0.071429
2020-20887    -1.1331383 0.035582
2020-16625    -1.1385109 0.039833
2020-17364    -1.2110346 0.026676
2020-17363    -0.2525053 0.078742
2020-17699     1.1459762 0.074915
2020-17700     1.2516726 0.069999
2020-18012    -0.4228850 0.034396
2020-18015    -1.0757325 0.035129
2020-19032    -0.2599694 0.087095
2020-21129    -1.0920007 0.036780
2020-21160     1.8283339 0.036815
2020-21534    -0.5836942 0.030919
2020-21914    -1.2405498 0.011599
2020-21960    -0.6903287 0.051614
2020-22064    -0.2414777 0.039790
2020-22510    -1.0824703 0.032425
2020-23115    -1.0756135 0.031270
2020-23116    -1.0211566 0.025641
2020-23780     0.0309900 0.047740
2020-24793    -1.0424389 0.027689
2020-25459     1.3066399 0.057290
2020-27065    -0.6514301 0.032592
2020-27353    -0.4624805 0.059195
2020-27455    -0.7611241 0.064371
2020-27740     0.1420257 0.074193
2020-27739    -0.0025216 0.096996
2020-27807     0.2852634 0.148542
2020-27948    -0.5347927 0.042648
2020-28605    -0.8892570 0.027965
2020-28606    -0.5049851 0.068306
2020-29235    -1.3002027 0.018647
2021-00040     2.1203483 0.015033
2021-01013    -0.6605350 0.037031
2021-00305     0.7945304 0.063862
2021-01094    -0.2264696 0.097670
2021-01228     1.3265562 0.087879
2021-01469    -0.2685895 0.082543
2021-01476    -1.0052475 0.031317
2021-01635    -0.1582854 0.052395
2021-01646     0.1321298 0.061742
2021-01643    -1.0925754 0.028864
2021-01644     0.0684889 0.076935
2021-01645     0.2983379 0.062853
2021-01713     0.4706798 0.193647
2021-01714     0.6979363 0.042487
2021-01712    -0.3475321 0.101935
2021-01753    -1.0633698 0.024352
2021-01759    -0.9842585 0.035976
2021-01765    -0.7097397 0.027905
2021-01766    -0.7639993 0.037087
2021-01767    -0.4496181 0.086725
2021-01755    -0.0222488 0.065837
2021-01761    -0.6406027 0.060293
2021-01762     0.5456311 0.042832
2021-01768    -0.3738521 0.109137
2021-01859    -0.4651511 0.045202
2021-01863    -0.7213298 0.058277
2021-01864    -1.3191860 0.015351
2021-01849    -0.8091695 0.050514
2021-01852    -1.1086555 0.023883
2021-01854    -1.0579029 0.029962
2021-01858    -1.1830900 0.028398
2021-01865    -0.7338742 0.041582
2021-01923    -0.8229016 0.072382
2021-01924    -0.0725116 0.076462
2021-02034    -0.3725672 0.058212
2021-02038     0.0240678 0.046802
2021-02070    -0.6099860 0.086406
2021-02176    -0.8703843 0.045958
2021-02177    -1.0002155 0.013306
2021-02252    -1.0242644 0.039283
2021-02561    -0.3207909 0.040172
2021-02562    -0.5703336 0.056601
2021-02563    -0.5686150 0.044684
2021-02804    -0.2257001 0.037012
2021-03139     1.7867364 0.041042
2021-03424    -1.0014408 0.036622
2021-03874     0.0969843 0.148497
2021-04280    -0.4270979 0.035574
2021-04281    -0.1613980 0.114761
2021-05087    -0.8241133 0.028213
2021-05183    -1.0957651 0.021938
2021-05200    -0.9305916 0.052136
2021-07239     1.2878489 0.105188
2021-07756    -0.4524168 0.080473
2021-08098     1.6546194 0.043005
2021-09213    -0.6161318 0.045726
2021-09263     0.4123037 0.054286
2021-10139    -0.4253697 0.087882
2021-10460    -0.3865552 0.020890
2021-10691    -0.0586613 0.079123
2021-11168    -0.8008502 0.032740
2021-11792    -1.3485881 0.008987
2021-12019     1.5042707 0.059842
2021-12382     1.7606980 0.043123
2021-12506     0.4912319 0.058844
2021-14127    -1.1441376 0.012288
2021-15069    -0.7717622 0.018530
2021-17121    -0.7733770 0.048389
2021-17253     1.7267941 0.044124
2021-18306     1.6855181 0.058963
2021-19579    -1.3166821 0.011913
2021-19578     0.0773491 0.072413
2021-19924     0.2313187 0.058198
2021-19927    -0.7407256 0.058107
2021-20165    -1.4195650 0.005969
2021-20164     0.0669118 0.184693
2021-20508     1.5200385 0.042087
2021-20629    -0.1463253 0.154665
2021-21908    -0.9543306 0.032051
2021-22588    -1.3663128 0.008065
2021-23224    -1.3695855 0.007894
2021-24183    -0.0931389 0.089171
2021-25286    -0.8744297 0.053517
2021-25287    -1.1463462 0.018058
2021-25715     0.3819367 0.052772
2021-25548     1.3538136 0.104044
2021-26459    -0.5477671 0.050746
2021-27114    -0.9935290 0.017090
2021-27380    -0.8916407 0.018791
2021-27605    -0.2938003 0.054795
2021-27505     1.5829426 0.040240
2021-28313     2.1203483 0.015033
2022-02027     2.0812932 0.033141
2022-02869    -0.1700250 0.051237
2022-03346     1.5713402 0.065093
2022-04020     1.7129187 0.046058
2022-05232     1.4861259 0.078275
2022-05471    -0.3197949 0.026234
2022-05554     1.5145111 0.070287
2022-05949    -0.3199633 0.106475
2022-07716    -1.3095425 0.018003
2022-07757     1.5133360 0.080375
2022-09138    -1.1493110 0.019638
2022-10076    -0.7385512 0.055953
2022-11810    -0.7245607 0.015284
2022-13391    -1.4334851 0.004828
2022-15138    -1.0738429 0.029659
2022-15628     0.7837222 0.133003
2022-15743     1.0723429 0.043865
2022-17420    -1.1078946 0.034533
2022-18840    -0.8597109 0.046374
2022-20167    -0.8779858 0.017384
2022-20210    -1.0575491 0.027175
2022-20450     0.2673601 0.041243
2022-21839    -1.1230934 0.024660
2022-21911     0.6342975 0.078426
2022-22531     0.2096418 0.025620
2022-22834    -1.2668039 0.024370
2022-23433     1.4554041 0.069860
2022-27585    -1.0084656 0.038294
2022-28474     2.1181641 0.015306
2023-03779    -1.1531149 0.013520
2023-05714    -0.7625235 0.042997
2023-06730     0.4887544 0.038569
2023-07760    -0.5606090 0.051521
2023-08659    -1.2698391 0.010040
2023-08955    -1.0594669 0.014433
2023-09318     0.6833821 0.148345
2023-09826     1.5107902 0.046123
2023-10407    -0.8702314 0.058071
2023-12974    -1.0318409 0.020069
2023-13889    -1.2677148 0.016982
2023-15347     0.7055734 0.163963
2023-16570     2.0798179 0.017717
2023-16636    -0.4773574 0.033303
2023-17449     0.6906771 0.047215
2023-17832     0.7529150 0.083716
2023-19798     0.5064199 0.163905
2023-21174    -0.7688321 0.037515
2023-22250    -1.0601148 0.029614
2023-24283    -0.7837399 0.010441
2023-26569    -0.3190717 0.054831
2023-27318    -0.9205720 0.025872
2023-28661     2.1181641 0.015306
2023-28662     1.5013919 0.049118
2024-02354     1.5928301 0.048833
2024-04012     0.3059853 0.057976
2024-04573     0.3789701 0.030682
2024-04857     1.0975038 0.122489
2024-05220    -0.8775378 0.027773
2024-06123    -1.2184878 0.016531
2024-06931    -1.1762824 0.026197
2024-08332    -0.6458578 0.081151
2024-13810    -0.7942105 0.034122
2024-16225    -1.4089414 0.008097
2024-16740     0.5876923 0.143814
2024-20712    -0.9561278 0.025386
2024-22938    -1.1075616 0.018404
2024-27850     0.4995434 0.117725
2024-31143     0.2713483 0.148870
2024-31354     2.0821570 0.019059
2024-31355     0.0778872 0.078364
2024-31466     2.1170144 0.015300
2024-31766     0.3384663 0.149356
2025-00595    -0.2485406 0.087441
2025-00603     0.4761162 0.107859
2025-00611     0.4784146 0.117082
2025-00618     0.5331457 0.113010
2025-00620     0.2343987 0.122389
2025-00619    -0.0148398 0.104892
2025-00622     1.7431842 0.056041
2025-01395    -0.7491704 0.013993
2025-01437     1.4341481 0.112437
2025-01467    -0.1125919 0.076002
2025-01470    -0.3219152 0.020325
2025-01759     0.2327527 0.162441
2025-01758    -0.9515467 0.037676

Estimated Feature Scores:
      definit  purpos  order archivist   refer   unit  state designe     b
beta -0.03669  0.6071 0.5302    0.6819  0.1612 0.8073 0.7032 -0.4665 0.405
psi  -1.62654 -0.1964 2.1612   -3.0831 -1.5555 1.6539 1.9728 -2.0836 1.368
     nation  archiv  record administr      c presidenti    act  u.s.c      d
beta  0.234 -0.3235  0.2745   -0.4425 0.3663    -0.1157 0.5744 0.8724 0.2036
psi   1.424 -3.4184 -1.1350    0.6877 1.0291    -1.2086 0.9709 0.4636 0.4263
      regul implement   c.f.r    part       e documentari  materi maintain
beta 0.5022   -0.1164 -0.4756  0.6609  0.1094      0.5828  0.7065   0.2328
psi  0.2402    0.7312 -3.9130 -0.5880 -0.1657     -4.9601 -0.8481  -1.2182
     pursuant includ     vice       f
beta   1.0474 0.1542  0.04166  0.4719
psi    0.2969 1.4582 -1.89896 -0.3819
textplot_scale1d(wf_model_eo_text)

textplot_scale1d(wf_model_eo_text, margin = "features")

#bigrams

# 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)  
dfmat_eo_text_bigrams
Document-feature matrix of: 659 documents, 165,178 features (99.65% sparse) and 0 docvars.
         features
docs      definit_purpos purpos_order order_archivist archivist_refer
  E9-1712              1            1               2               1
  E9-1719              0            1               0               0
  E9-1893              0            0               0               0
  E9-1885              0            0               0               0
  E9-1895              0            0               0               0
  E9-2484              0            2               0               0
         features
docs      refer_archivist archivist_unit unit_state state_designe designe_b
  E9-1712               1              1          2             1         1
  E9-1719               0              0         14             0         1
  E9-1893               0              0         20             0         0
  E9-1885               0              0         20             0         0
  E9-1895               0              0          5             0         0
  E9-2484               0              0          5             0         0
         features
docs      b_nara
  E9-1712      1
  E9-1719      0
  E9-1893      0
  E9-1885      0
  E9-1895      0
  E9-2484      0
[ reached max_ndoc ... 653 more documents, reached max_nfeat ... 165,168 more features ]
quanteda::ntoken(dfmat_eo_text_bigrams) 
      E9-1712       E9-1719       E9-1893       E9-1885       E9-1895 
          556          1357           850           989           358 
      E9-2484       E9-2483       E9-2486       E9-2485       E9-2893 
          881           311            52          1050           681 
      E9-3106       E9-3108       E9-3113       E9-3112       E9-4068 
           46            79           621           325           357 
      E9-4103       E9-5441       E9-5802       E9-8572      E9-11547 
           32           237           662           446          1655 
     E9-15368      E9-16034      E9-23886      E9-23915      E9-24203 
          518            35           192            33           548 
     E9-24518      E9-25268      E9-26834      E9-26408      E9-27441 
         3206           985           218           225           926 
     E9-28022      E9-28493      E9-28805      E9-29781      E9-30020 
          578          1218           501          1009            93 
     E9-30413      E9-31098      E9-31418 C1-2009-31418       2010-38 
           33           244          7194            29           356 
     2010-705     2010-1229     2010-2419     2010-3725     2010-4593 
          334            99           619           280           778 
    2010-4884     2010-5837     2010-7154     2010-8878     2010-9078 
          273           586           479           682           327 
    2010-9451     2010-9796    2010-10172    2010-11557    2010-12070 
          335           457           306           229           267 
   2010-12805    2010-14613    2010-15851    2010-16864    2010-18169 
          399           748           488           889          1297 
   2010-18988    2010-21016    2010-21020    2010-22002    2010-22279 
            0          1493           219           678            84 
   2010-24839    2010-25578    2010-27004    2010-28365    2010-28360 
          791          1227          1066           154           683 
   2010-28854    2010-29579    2010-31878    2010-32960    2010-33169 
          430          1146           376           244          1227 
    2011-1385     2011-2577     2011-3257     2011-4753     2011-5728 
          624           381           626           620          1174 
    2011-5903     2011-8642     2011-9739    2011-10732    2011-10910 
           97           133           296           520           517 
   2011-12645    2011-13173    2011-14919    2011-15181    2011-15443 
          493           624           465           644           572 
   2011-17447    2011-17953    2011-18065    2011-19156    2011-21505 
          360           252           489           601           560 
   2011-21704    2011-23891    2011-26141    2011-26574    2011-26729 
          629           737           275           168          1231 
   2011-28728    2011-29683    2011-30463    2011-30990    2011-31624 
          461           461          1028           146          1385 
   2011-32486    2011-33087    2011-33335    2011-33089     2012-1568 
           84           280           178           506           720 
    2012-2557     2012-3097     2012-3616     2012-5366     2012-6797 
          139           768           583           480           695 
    2012-7019     2012-7636     2012-9473    2012-10034    2012-10715 
         2818           964           417           753          1101 
   2012-10968    2012-10884    2012-11798    2012-12225    2012-12889 
          677           712           479           509           202 
   2012-12881    2012-12882    2012-12883    2012-15183    2012-15954 
          266           191           228           915           504 
   2012-17022    2012-17264    2012-18237    2012-18868    2012-19055 
         1339           650           492          1490          1666 
   2012-20259    2012-22030    2012-22062    2012-22807    2012-24374 
          808           576          1199           903          1102 
   2012-25236    2012-27002    2012-30060    2012-30170    2012-30310 
         1833           671           560           107           979 
   2012-31574    2012-31225    2013-00002    2013-03915    2013-05967 
           87           135           236          1747           860 
   2013-06712    2013-07837    2013-08501    2013-08626    2013-11533 
          355           370            95           247           614 
   2013-12157    2013-12650    2013-13523    2013-15782    2013-15942 
           85            94          2386           734           785 
   2013-16387    2013-17478    2013-19220    2013-19520    2013-24388 
          647           733          1231           407           769 
   2013-26785    2013-28581    2013-31445    2014-01523    2014-03474 
         1657           153           229           222            68 
   2014-03805    2014-04254    2014-05323    2014-06141    2014-06768 
          881           938           571           566           202 
   2014-06612    2014-07895    2014-08426    2014-09343    2014-11442 
          531           656           357            19           766 
   2014-12651    2014-14429    2014-14432    2014-16360    2014-17522 
          220            90           156           551           163 
   2014-18561    2014-18682    2014-18998    2014-22805    2014-23228 
         1911           107           495          1410          1381 
   2014-24218    2014-24851    2014-25292    2014-25439    2014-29121 
          129           200           106           541           135 
   2014-29625    2014-30195    2014-30323    2014-30363    2015-00058 
          290           275           602           229           535 
   2015-01255    2015-01522    2015-02379    2015-03714    2015-05677 
          720           856           943          1259           764 
   2015-07016    2015-07788    2015-13055    2015-15495    2015-15828 
         4179           675           140            88            43 
   2015-16122    2015-16334    2015-17926    2015-18292    2015-19183 
          894           297           149           414           984 
   2015-19209    2015-20801    2015-22888    2015-22998    2015-23630 
         1008           467           130          1043           522 
   2015-25489    2015-25744    2015-29403    2015-29498    2015-30191 
          512           255           185           200           655 
   2015-31749    2015-32060    2015-32582    2016-01325    2016-02475 
          142          1345           229          1448          1015 
   2016-03141    2016-03038    2016-04770    2016-06250    2016-06355 
          687           871           248           822           852 
   2016-07703    2016-08713    2016-09346    2016-09483    2016-11300 
          210           105           512           749           638 
   2016-12307    2016-12155    2016-12579    2016-15542    2016-16295 
         1198           752            88           753           764 
   2016-17945    2016-18872    2016-19723    2016-19724    2016-19725 
          338           201           193           218           235 
   2016-20713    2016-22454    2016-22962    2016-24066    2016-24847 
          154           164            87           896           279 
   2016-25288    2016-25290    2016-26753    2016-27156    2016-27171 
          389          1259            67           994          1449 
   2016-28203    2016-29165    2016-29169    2016-29519    2016-30101 
          921           431           383          1642           142 
   2016-30272    2016-30277    2016-31792    2016-31875    2016-31922 
          213          1344           216           240           364 
   2017-01169    2017-01164    2017-01168    2017-01487    2017-01197 
         1025           313           134           155           479 
   2017-01489    2017-01623    2017-01799    2017-02029    2017-02095 
          234          3559           240           326          1328 
   2017-02102    2017-02281    2017-02450    2017-02451    2017-02762 
         1084          1508          1383           477           224 
   2017-03113    2017-03115    2017-03116    2017-03118    2017-04107 
          671           322           157           308           600 
   2017-04357    2017-04353    2017-04837    2017-05399    2017-06382 
          795           257          3237           311            90 
   2017-06576    2017-06716    2017-06967    2017-06971    2017-06968 
         1325           413           364           158           377 
   2017-08311    2017-08586    2017-08818    2017-08905    2017-08908 
          701           347           611           305           484 
   2017-08990    2017-09083    2017-09087    2017-09156    2017-09161 
          272           478           974           406           153 
   2017-09574    2017-10004    2017-10003    2017-13012    2017-13458 
          306          1709           403           948           100 
   2017-14378    2017-14992    2017-15680    2017-15860    2017-18134 
          691           125           411           580          2008 
   2017-18468    2017-18679    2017-20647    2017-21555    2017-21559 
          408           101          1203           413           161 
   2017-22677    2017-23270    2017-23630    2017-27034    2017-27899 
          610            97           919           228           508 
   2017-27925    2017-28160    2018-00240    2018-00553    2018-00630 
          801           238            75           469           311 
   2018-02261    2018-04414    2018-04860    2018-05113    2018-05916 
          424           566           614           813           334 
   2018-07874    2018-08272    2018-08883    2018-09895    2018-10403 
         1026           483           924           578           585 
   2018-10855    2018-11101    2018-11335    2018-11939    2018-11913 
          745           867           335          1180          1612 
   2018-11916    2018-11936    2018-13640    2018-13696    2018-15202 
         1811           312           886           389           803 
   2018-15195    2018-15299    2018-15955    2018-17068    2018-19514 
          223           533          1105          3284           614 
   2018-20203    2018-20816    2018-24254    2018-26156    2018-26552 
         1396          1462           642           659           131 
   2018-27515    2018-27945    2019-00014    2019-00048    2019-00615 
          901           128          1117           227           205 
   2019-01426    2019-02544    2019-04298    2019-04437    2019-04595 
          509          1670           424           887           195 
   2019-05370    2019-05934    2019-06325    2019-06548    2019-07645 
          188           822          1700           239           595 
   2019-07656    2019-08797    2019-09750    2019-09877    2019-10398 
         1305          1694          1372           952          1025 
   2019-10538    2019-12802    2019-13175    2019-13945    2019-13793 
          999           815           446           903           805 
   2019-14016    2019-15159    2019-15222    2019-15449    2019-16383 
          874           590          1482           500           747 
   2019-16879    2019-17052    2019-19367    2019-19895    2019-20804 
          412           688           368           446          1238 
   2019-21505    2019-21630    2019-22073    2019-22623    2019-22624 
          390           388          1065          1022          1289 
   2019-22749    2019-22849    2019-23525    2019-24040    2019-24288 
          407          1286           574           730           129 
   2019-26178    2019-27217    2019-27678    2019-28286    2020-00534 
          583           339           128           229          1003 
   2020-02439    2020-02438    2020-03337    2020-03556    2020-04730 
         1171           661           732           164           276 
   2020-04755    2020-06161    2020-06478    2020-06969    2020-06985 
          289           309           363           721           199 
   2020-07530    2020-07800    2020-08392    2020-08846    2020-09537 
         1953           406           130           176           207 
   2020-09536    2020-09645    2020-09695    2020-10315    2020-10953 
          445           115          1329          1863           391 
   2020-10993    2020-11301    2020-12030    2020-12430    2020-12584 
          219           972          1323           650          1756 
   2020-12953    2020-13449    2020-14077    2020-14337    2020-14509 
          928           910          1233           649           986 
   2020-14328    2020-14872    2020-15338    2020-15646    2020-16623 
          100          1139           833          1385           326 
   2020-16624    2020-20887    2020-16625    2020-17364    2020-17363 
          228           411           331           516           370 
   2020-17699    2020-17700    2020-18012    2020-18015    2020-19032 
          504           541          1703           528           303 
   2020-21129    2020-21160    2020-21534    2020-21914    2020-21960 
          449           852          1903          2391           586 
   2020-22064    2020-22510    2020-23115    2020-23116    2020-23780 
         1507           612           645          1149          1201 
   2020-24793    2020-25459    2020-27065    2020-27353    2020-27455 
          949           780          1470           558           317 
   2020-27740    2020-27739    2020-27807    2020-27948    2020-28605 
          527           277           128           994          1498 
   2020-28606    2020-29235    2021-00040    2021-01013    2021-00305 
          417           627           227          1190           762 
   2021-01094    2021-01228    2021-01469    2021-01476    2021-01635 
          241           322           337           833           906 
   2021-01646    2021-01643    2021-01644    2021-01645    2021-01713 
          774          1177           457           774            78 
   2021-01714    2021-01712    2021-01753    2021-01759    2021-01765 
         1680           209          1100           636          1899 
   2021-01766    2021-01767    2021-01755    2021-01761    2021-01762 
          954           256           643           446          1664 
   2021-01768    2021-01859    2021-01863    2021-01864    2021-01849 
          175           963           414           764           475 
   2021-01852    2021-01854    2021-01858    2021-01865    2021-01923 
          980           733           505           794           224 
   2021-01924    2021-02034    2021-02038    2021-02070    2021-02176 
          438           637          1233           220           506 
   2021-02177    2021-02252    2021-02561    2021-02562    2021-02563 
         4508           480          1392           541           873 
   2021-02804    2021-03139    2021-03424    2021-03874    2021-04280 
         1740           799           593           121          1597 
   2021-04281    2021-05087    2021-05183    2021-05200    2021-07239 
          182          1500          1218           344           228 
   2021-07756    2021-08098    2021-09213    2021-09263    2021-10139 
          303           985           784          1015           258 
   2021-10460    2021-10691    2021-11168    2021-11792    2021-12019 
         4809           411          1151          1744           609 
   2021-12382    2021-12506    2021-14127    2021-15069    2021-17121 
          791           872          3264          3953           561 
   2021-17253    2021-18306    2021-19579    2021-19578    2021-19924 
          819           500          1295           553           848 
   2021-19927    2021-20165    2021-20164    2021-20508    2021-20629 
          407          1809            76          1255           101 
   2021-21908    2021-22588    2021-23224    2021-24183    2021-25286 
          864          1827          1840           317           372 
   2021-25287    2021-25715    2021-25548    2021-26459    2021-27114 
         1493          1069           224           683          2765 
   2021-27380    2021-27605    2021-27505    2021-28313    2022-02027 
         2970           772          1245           227            82 
   2022-02869    2022-03346    2022-04020    2022-05232    2022-05471 
          929           489           775           361          3293 
   2022-05554    2022-05949    2022-07716    2022-07757    2022-09138 
          437           190           612           330          1280 
   2022-10076    2022-11810    2022-13391    2022-15138    2022-15628 
          456          6122          2324           733           166 
   2022-15743    2022-17420    2022-18840    2022-20167    2022-20210 
         1479           479           514          3632           903 
   2022-20450    2022-21839    2022-21911    2022-22531    2022-22834 
         1726           885           494          4473           445 
   2022-23433    2022-27585    2022-28474    2023-03779    2023-05714 
          466           534           227          2590           730 
   2023-06730    2023-07760    2023-08659    2023-08955    2023-09318 
         2115           652          2603          3193           133 
   2023-09826    2023-10407    2023-12974    2023-13889    2023-15347 
         1024           317          1836           918           109 
   2023-16570    2023-16636    2023-17449    2023-17832    2023-19798 
          301          1740          1357           434           113 
   2023-21174    2023-22250    2023-24283    2023-26569    2023-27318 
         1026           758         11964           730          1460 
   2023-28661    2023-28662    2024-02354    2024-04012    2024-04573 
          227           909           840           943          3223 
   2024-04857    2024-05220    2024-06123    2024-06931    2024-08332 
          184          1373          1296           637           240 
   2024-13810    2024-16225    2024-16740    2024-20712    2024-22938 
         1074          1141           144          1392          1753 
   2024-27850    2024-31143    2024-31354    2024-31355    2024-31466 
          218           128           255           457           231 
   2024-31766    2025-00595    2025-00603    2025-00611    2025-00618 
          131           301           255           217           232 
   2025-00620    2025-00619    2025-00622    2025-01395    2025-01437 
          188           235           487          7030           180 
   2025-01467    2025-01470    2025-01759    2025-01758 
          442          5413           105           637 
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_termfreq = 5, min_docfreq = 2)
wf_model_eo_text_bigrams <- quanteda.textmodels::textmodel_wordfish(dfmat_eo_text_bigrams, dir = c(281,589))
summary(wf_model_eo_text_bigrams)

Call:
textmodel_wordfish.dfm(x = dfmat_eo_text_bigrams, dir = c(281, 
    589))

Estimated Document Positions:
                   theta        se
E9-1712        0.0832578 0.0344093
E9-1719        1.1577459 0.0447533
E9-1893       -0.2573118 0.0067298
E9-1885       -0.2780918 0.0052578
E9-1895       -0.3674474 0.0035333
E9-2484        0.6623935 0.0542500
E9-2483        0.0876157 0.0437388
E9-2486        0.4379568 0.1504003
E9-2485       -0.0045241 0.0182225
E9-2893       -0.4219810 0.0017920
E9-3106       -0.4494665 0.0063801
E9-3108       -0.3833942 0.0069435
E9-3113        0.4322925 0.0539730
E9-3112       -0.3982650 0.0029479
E9-4068       -0.3447708 0.0043632
E9-4103       -0.2634340 0.0283291
E9-5441       -0.1691016 0.0219803
E9-5802       -0.4094321 0.0019772
E9-8572       -0.3101170 0.0051614
E9-11547      -0.3678969 0.0021964
E9-15368      -0.4029295 0.0022087
E9-16034       0.4417938 0.2182495
E9-23886      -0.5155435 0.0020099
E9-23915      -0.2470827 0.0298737
E9-24203       0.0200292 0.0293590
E9-24518      -0.2116168 0.0045569
E9-25268      -0.4628433 0.0012157
E9-26834      -0.2743688 0.0105165
E9-26408      -0.1581538 0.0194464
E9-27441      -0.2559984 0.0057899
E9-28022      -0.3997906 0.0022559
E9-28493      -0.2911844 0.0040914
E9-28805      -0.4166885 0.0021694
E9-29781      -0.2422215 0.0062544
E9-30020       1.0082551 0.1470908
E9-30413      -0.0349532 0.0948131
E9-31098       5.1654749 0.0222117
E9-31418       0.0080815 0.0082725
C1-2009-31418 -0.3859155 0.0344017
2010-38       -0.2315576 0.0112503
2010-705      -0.3157734 0.0056218
2010-1229      0.0218993 0.0597455
2010-2419     -0.3895609 0.0023331
2010-3725     -0.3935744 0.0037016
2010-4593     -0.4438368 0.0015160
2010-4884     -0.1418038 0.0181835
2010-5837     -0.3365389 0.0040636
2010-7154     -0.1311338 0.0191174
2010-8878     -0.5582123 0.0010176
2010-9078     -0.2546419 0.0095662
2010-9451     -0.4014867 0.0028056
2010-9796     -0.4056502 0.0023442
2010-10172    -0.4149907 0.0027939
2010-11557     0.0599624 0.0450649
2010-12070    -0.3569047 0.0043360
2010-12805    -0.4236982 0.0023236
2010-14613    -0.4106075 0.0019255
2010-15851    -0.3883807 0.0026444
2010-16864    -0.3223938 0.0038817
2010-18169    -0.2982194 0.0036957
2010-21016    -0.2781240 0.0039328
2010-21020     0.1156001 0.0538777
2010-22002    -0.5579180 0.0010190
2010-22279     1.4019757 0.0957057
2010-24839    -0.5518179 0.0009118
2010-25578    -0.4067478 0.0016129
2010-27004    -0.4729251 0.0011693
2010-28365     0.1562660 0.0548324
2010-28360    -0.0643635 0.0189350
2010-28854    -0.2787679 0.0068729
2010-29579    -0.3957436 0.0017536
2010-31878    -0.4177980 0.0024292
2010-32960     5.3183683 0.0150337
2010-33169     1.1686775 0.0502681
2011-1385     -0.0329684 0.0237908
2011-2577     -0.4043835 0.0026861
2011-3257     -0.4274244 0.0018310
2011-4753     -0.5665269 0.0010197
2011-5728     -0.2437431 0.0066256
2011-5903      0.2109241 0.1216797
2011-8642     -0.4127119 0.0041848
2011-9739     -0.5294691 0.0015658
2011-10732    -0.1002961 0.0188981
2011-10910    -0.5671820 0.0010705
2011-12645    -0.5684923 0.0011090
2011-13173    -0.5399185 0.0010376
2011-14919    -0.4252477 0.0020407
2011-15181    -0.0006059 0.0256582
2011-15443    -0.4347974 0.0018969
2011-17447    -0.3306608 0.0051127
2011-17953     0.3063179 0.0671047
2011-18065    -0.4318191 0.0021298
2011-19156    -0.5609009 0.0010275
2011-21505    -0.5643720 0.0010491
2011-21704     0.0068356 0.0239105
2011-23891    -0.2539505 0.0071011
2011-26141    -0.5085299 0.0017529
2011-26574     1.2497366 0.0979316
2011-26729    -0.2937436 0.0037982
2011-28728    -0.1121537 0.0251386
2011-29683     0.1204732 0.0429367
2011-30463    -0.5218470 0.0008396
2011-30990    -0.4997406 0.0024491
2011-31624    -0.4495063 0.0012243
2011-32486     1.4027060 0.0949752
2011-33087     5.1507744 0.0223578
2011-33335    -0.4427614 0.0030274
2011-33089    -0.3540707 0.0036376
2012-1568     -0.3535643 0.0031781
2012-2557      0.4000631 0.1072444
2012-3097     -0.5559036 0.0009156
2012-3616     -0.4103367 0.0020883
2012-5366     -0.2904994 0.0061734
2012-6797     -0.3869295 0.0022933
2012-7019     -0.2656407 0.0033439
2012-7636     -0.3762581 0.0023207
2012-9473     -0.4214364 0.0024141
2012-10034    -0.5552741 0.0009544
2012-10715    -0.0917703 0.0153873
2012-10968    -0.2512763 0.0072879
2012-10884    -0.5387842 0.0010179
2012-11798    -0.0431022 0.0246370
2012-12225    -0.5684079 0.0011115
2012-12889    -0.1119844 0.0239713
2012-12881    -0.3645740 0.0040086
2012-12882    -0.3301616 0.0058833
2012-12883    -0.3896986 0.0034732
2012-15183    -0.3627294 0.0025750
2012-15954    -0.5378741 0.0013327
2012-17022    -0.2663460 0.0048260
2012-17264    -0.5600024 0.0010366
2012-18237    -0.5480648 0.0012678
2012-18868    -0.4879102 0.0009454
2012-19055    -0.5154635 0.0006853
2012-20259    -0.3949058 0.0021452
2012-22030    -0.2888218 0.0066468
2012-22062    -0.1492379 0.0107123
2012-22807    -0.3668531 0.0027442
2012-24374    -0.0344668 0.0183360
2012-25236    -0.5389537 0.0006146
2012-27002    -0.3898419 0.0023369
2012-30060    -0.4156163 0.0022381
2012-30170    -0.1316100 0.0312876
2012-30310    -0.4169287 0.0017170
2012-31574    -0.2819856 0.0139559
2012-31225     0.9625619 0.1175798
2013-00002     5.3249402 0.0145892
2013-03915    -0.3962785 0.0013793
2013-05967    -0.3814368 0.0022388
2013-06712    -0.2852643 0.0081488
2013-07837    -0.4176196 0.0025304
2013-08501    -0.3539471 0.0067602
2013-08626     5.2242036 0.0188683
2013-11533    -0.2048818 0.0110269
2013-12157     1.4061867 0.0939241
2013-12650    -0.1579495 0.0291697
2013-13523    -0.5266507 0.0005566
2013-15782    -0.3935863 0.0022069
2013-15942    -0.4303891 0.0016283
2013-16387    -0.4243135 0.0019408
2013-17478    -0.3652890 0.0030302
2013-19220    -0.4115935 0.0016064
2013-19520    -0.5145197 0.0016233
2013-24388    -0.4850079 0.0012308
2013-26785    -0.4161331 0.0012915
2013-28581     1.2833070 0.0888564
2013-31445     5.3882901 0.0124676
2014-01523    -0.0146140 0.0364965
2014-03474    -0.1343786 0.0365183
2014-03805     0.5455834 0.0469965
2014-04254    -0.3151993 0.0042143
2014-05323    -0.5668033 0.0010279
2014-06141    -0.5641887 0.0010238
2014-06768     1.2772499 0.0826424
2014-06612    -0.5656598 0.0010545
2014-07895    -0.5590905 0.0009959
2014-08426     0.4044900 0.0690978
2014-09343     0.8239701 0.3588369
2014-11442    -0.5549635 0.0009389
2014-12651    -0.4917320 0.0024071
2014-14429     1.4067074 0.0938412
2014-14432     1.2848723 0.0902613
2014-16360    -0.5382318 0.0012332
2014-17522     0.3099269 0.0766118
2014-18561    -0.0248113 0.0136081
2014-18682     0.0469213 0.0624697
2014-18998    -0.4517943 0.0019290
2014-22805    -0.4170662 0.0015025
2014-23228    -0.4241590 0.0014221
2014-24218     0.9706283 0.1415170
2014-24851     1.2577436 0.0892400
2014-25292    -0.0546301 0.0476585
2014-25439    -0.2633279 0.0079992
2014-29121     0.9512625 0.1176985
2014-29625    -0.2355428 0.0130438
2014-30195    -0.4233926 0.0025528
2014-30323    -0.5615819 0.0010108
2014-30363     5.3882901 0.0124676
2015-00058    -0.5649484 0.0010703
2015-01255    -0.4188453 0.0018909
2015-01522    -0.4351034 0.0016113
2015-02379    -0.2530456 0.0064903
2015-03714    -0.3201631 0.0029746
2015-05677    -0.5540274 0.0009375
2015-07016    -0.1706205 0.0053624
2015-07788    -0.5532416 0.0009690
2015-13055    -0.3762230 0.0051803
2015-15495     1.4070620 0.0921856
2015-15828     0.0958776 0.1528525
2015-16122    -0.3693611 0.0024813
2015-16334    -0.3768151 0.0038397
2015-17926     1.2813088 0.0891075
2015-18292    -0.2166850 0.0102528
2015-19183    -0.3819907 0.0023914
2015-19209    -0.4226113 0.0015879
2015-20801    -0.1748740 0.0142982
2015-22888     0.2507515 0.0786388
2015-22998     0.5163653 0.0452502
2015-23630    -0.2017881 0.0125225
2015-25489    -0.5148503 0.0012949
2015-25744    -0.1346771 0.0249513
2015-29403    -0.3533400 0.0056247
2015-29498     1.2743465 0.0827296
2015-30191    -0.5589029 0.0009651
2015-31749     0.9609441 0.1175998
2015-32060     0.2406218 0.0328357
2015-32582     5.3882901 0.0124676
2016-01325    -0.5319445 0.0007283
2016-02475    -0.1155424 0.0129817
2016-03141    -0.3294031 0.0036533
2016-03038    -0.4129942 0.0018545
2016-04770    -0.1305305 0.0216413
2016-06250    -0.2761785 0.0055521
2016-06355    -0.5555363 0.0008975
2016-07703     0.1575735 0.0639682
2016-08713     0.3702260 0.1021430
2016-09346    -0.1126605 0.0190030
2016-09483    -0.5555330 0.0009920
2016-11300    -0.2598372 0.0071517
2016-12307    -0.3089844 0.0040343
2016-12155    -0.2062563 0.0092298
2016-12579     1.4070620 0.0921856
2016-15542    -0.3885057 0.0025110
2016-16295    -0.2058921 0.0108028
2016-17945    -0.3564559 0.0040274
2016-18872    -0.2976762 0.0096795
2016-19723    -0.2952143 0.0083749
2016-19724    -0.0526900 0.0301227
2016-19725    -0.3854492 0.0035069
2016-20713     0.4506688 0.0990821
2016-22454    -0.3904601 0.0043186
2016-22962     1.4067789 0.0932874
2016-24066     0.6788705 0.0528943
2016-24847    -0.3318936 0.0056644
2016-25288     0.8793991 0.1046550
2016-25290    -0.3761059 0.0021307
2016-26753     0.5540155 0.1522223
2016-27156    -0.3968181 0.0022117
2016-27171    -0.3958180 0.0017014
2016-28203    -0.4023747 0.0019620
2016-29165     1.0378414 0.0915176
2016-29169     0.7154299 0.0895417
2016-29519    -0.4160022 0.0013841
2016-30101    -0.1702761 0.0230848
2016-30272    -0.2104498 0.0156725
2016-30277    -0.3937975 0.0018991
2016-31792    -0.2708783 0.0097935
2016-31875     5.2570228 0.0174308
2016-31922    -0.5317126 0.0014394
2017-01169     0.2077560 0.0388371
2017-01164     0.4732182 0.0864756
2017-01168     0.2497488 0.0789001
2017-01487     0.1574311 0.0549639
2017-01197    -0.3978373 0.0026980
2017-01489    -0.3882405 0.0034635
2017-01623     0.5740139 0.0263531
2017-01799     0.0858549 0.0480460
2017-02029    -0.3083517 0.0067352
2017-02095    -0.1361298 0.0107643
2017-02102    -0.1535091 0.0103827
2017-02281    -0.3167281 0.0029442
2017-02450     1.1199934 0.0462162
2017-02451     0.0562124 0.0335135
2017-02762    -0.2319514 0.0142605
2017-03113    -0.3666104 0.0031647
2017-03115    -0.3753658 0.0034799
2017-03116     0.1445128 0.0536890
2017-03118    -0.3088714 0.0062884
2017-04107    -0.1650647 0.0124603
2017-04357    -0.4408443 0.0015818
2017-04353    -0.1519452 0.0195676
2017-04837    -0.2659427 0.0033770
2017-05399    -0.0302363 0.0271560
2017-06382     0.2223709 0.0858222
2017-06576    -0.2836068 0.0039424
2017-06716    -0.3965223 0.0028162
2017-06967    -0.2594198 0.0096833
2017-06971     0.1445128 0.0536890
2017-06968    -0.3019656 0.0067052
2017-08311    -0.2335620 0.0074351
2017-08586    -0.0819615 0.0238945
2017-08818    -0.4175368 0.0020844
2017-08905    -0.2252326 0.0133993
2017-08908    -0.3338340 0.0041759
2017-08990    -0.1823393 0.0174859
2017-09083    -0.1259473 0.0169827
2017-09087    -0.3370508 0.0032882
2017-09156    -0.2947805 0.0068311
2017-09161    -0.1797121 0.0208791
2017-09574    -0.0429696 0.0312081
2017-10004    -0.3280928 0.0023902
2017-10003    -0.3990305 0.0027844
2017-13012    -0.3655370 0.0025336
2017-13458    -0.1202807 0.0316961
2017-14378    -0.3295564 0.0034312
2017-14992    -0.3635436 0.0061883
2017-15680    -0.4040204 0.0025600
2017-15860    -0.3108633 0.0050143
2017-18134    -0.3697553 0.0017421
2017-18468    -0.5349770 0.0013704
2017-18679     0.0506019 0.0563518
2017-20647    -0.5539412 0.0007597
2017-21555    -0.5234625 0.0013835
2017-21559     0.0115054 0.0433208
2017-22677    -0.2319988 0.0098743
2017-23270     0.0126344 0.0502403
2017-23630    -0.3567210 0.0026779
2017-27034     0.4611481 0.1030549
2017-27899    -0.3017754 0.0058592
2017-27925    -0.5534434 0.0009219
2017-28160     5.2530677 0.0176092
2018-00240    -0.1108337 0.0372725
2018-00553    -0.1373855 0.0176119
2018-00630     0.0031594 0.0342954
2018-02261    -0.2186347 0.0110679
2018-04414    -0.3290898 0.0042490
2018-04860     1.8483049 0.0182005
2018-05113    -0.3656717 0.0026999
2018-05916    -0.5368602 0.0014380
2018-07874    -0.2792044 0.0053804
2018-08272    -0.3185791 0.0054222
2018-08883     0.1470682 0.0300366
2018-09895    -0.4340908 0.0019041
2018-10403     0.1960083 0.0397730
2018-10855     0.1974356 0.0357532
2018-11101    -0.2133224 0.0075474
2018-11335    -0.5256869 0.0015615
2018-11939     0.6901310 0.0541210
2018-11913     0.5925245 0.0439530
2018-11916     0.9654671 0.0431352
2018-11936     0.1767433 0.0547474
2018-13640    -0.3064685 0.0041027
2018-13696    -0.0777044 0.0256017
2018-15202     1.3475329 0.0478897
2018-15195     1.0790437 0.1124365
2018-15299    -0.3526427 0.0033337
2018-15955    -0.3761265 0.0020943
2018-17068    -0.5217701 0.0005063
2018-19514    -0.2397788 0.0094326
2018-20203    -0.5271202 0.0008118
2018-20816    -0.5305284 0.0006981
2018-24254    -0.5542110 0.0010070
2018-26156    -0.5572158 0.0009878
2018-26552     0.9175999 0.1215159
2018-27515    -0.4190332 0.0016537
2018-27945     0.9608744 0.1198964
2019-00014    -0.3835988 0.0022718
2019-00048     5.4284415 0.0112644
2019-00615    -0.4217843 0.0031041
2019-01426    -0.0574960 0.0222879
2019-02544    -0.3592224 0.0019674
2019-04298    -0.0004883 0.0300629
2019-04437    -0.3493958 0.0029801
2019-04595     0.2150000 0.0648564
2019-05370    -0.3919678 0.0039821
2019-05934    -0.3103162 0.0045922
2019-06325    -0.4128858 0.0013198
2019-06548     5.2575725 0.0176339
2019-07645    -0.2990478 0.0055708
2019-07656    -0.3549076 0.0024562
2019-08797     0.8873907 0.0424739
2019-09750    -0.2906302 0.0041578
2019-09877    -0.5383213 0.0008522
2019-10398    -0.4624010 0.0012680
2019-10538    -0.4625825 0.0011305
2019-12802    -0.3319759 0.0036831
2019-13175    -0.3112413 0.0057386
2019-13945    -0.2411911 0.0079561
2019-13793    -0.5492386 0.0008983
2019-14016    -0.4283147 0.0019147
2019-15159    -0.2242006 0.0125173
2019-15222    -0.2633638 0.0061876
2019-15449    -0.1208721 0.0175675
2019-16383    -0.5491697 0.0009749
2019-16879    -0.5058710 0.0014762
2019-17052    -0.5468021 0.0009877
2019-19367    -0.3757834 0.0030107
2019-19895    -0.5573215 0.0012486
2019-20804    -0.3569464 0.0027856
2019-21505    -0.3577124 0.0040766
2019-21630    -0.5202779 0.0014169
2019-22073    -0.0538295 0.0191516
2019-22623     0.4482682 0.0451281
2019-22624     0.4894287 0.0455414
2019-22749     0.0578539 0.0387227
2019-22849    -0.5378612 0.0007371
2019-23525    -0.4024094 0.0023219
2019-24040    -0.3798220 0.0025686
2019-24288     0.5353607 0.1095543
2019-26178    -0.4385791 0.0018466
2019-27217    -0.1456602 0.0204548
2019-27678     0.9608744 0.1198964
2019-28286     5.4039810 0.0121492
2020-00534    -0.5396624 0.0008201
2020-02439    -0.2578954 0.0060775
2020-02438    -0.4185057 0.0021619
2020-03337    -0.3959844 0.0022518
2020-03556    -0.3022840 0.0079051
2020-04730    -0.2646230 0.0092407
2020-04755    -0.2274379 0.0124211
2020-06161    -0.0830522 0.0226273
2020-06478    -0.0818341 0.0223896
2020-06969    -0.2646636 0.0056810
2020-06985    -0.0671420 0.0283113
2020-07530    -0.2063441 0.0058197
2020-07800    -0.3159247 0.0062910
2020-08392    -0.4109354 0.0041237
2020-08846    -0.1686892 0.0202558
2020-09537    -0.2611189 0.0107892
2020-09536    -0.2075128 0.0118616
2020-09645     0.4512188 0.1129225
2020-09695    -0.4401069 0.0011662
2020-10315    -0.3774409 0.0016344
2020-10953    -0.0724990 0.0218156
2020-10993    -0.3165974 0.0065471
2020-11301    -0.1913237 0.0099581
2020-12030    -0.2099740 0.0093196
2020-12430    -0.2847032 0.0059033
2020-12584    -0.3846258 0.0014919
2020-12953    -0.5364602 0.0009305
2020-13449    -0.3648348 0.0026497
2020-14077    -0.3201180 0.0037655
2020-14337     0.1105059 0.0373921
2020-14509    -0.1040635 0.0159200
2020-14328    -0.1654428 0.0258935
2020-14872    -0.3232526 0.0039701
2020-15338    -0.4611440 0.0013235
2020-15646    -0.5270886 0.0008649
2020-16623    -0.1078205 0.0271917
2020-16624     0.0767093 0.0533486
2020-20887    -0.0734672 0.0280269
2020-16625    -0.0852636 0.0307408
2020-17364    -0.2624080 0.0091629
2020-17363     0.1628855 0.0449424
2020-17699    -0.4865742 0.0015329
2020-17700    -0.4997496 0.0014028
2020-18012    -0.1575095 0.0077816
2020-18015    -0.3061461 0.0067848
2020-19032    -0.0506758 0.0312168
2020-21129    -0.0081112 0.0318398
2020-21160    -0.5493465 0.0009229
2020-21534     0.7428990 0.0504140
2020-21914    -0.0986185 0.0128626
2020-21960    -0.2020393 0.0123547
2020-22064    -0.3971304 0.0015955
2020-22510    -0.3613896 0.0034186
2020-23115    -0.3858975 0.0025209
2020-23116    -0.3792414 0.0020741
2020-23780     1.2594891 0.0435071
2020-24793    -0.4140194 0.0020617
2020-25459    -0.4781361 0.0012600
2020-27065    -0.1960322 0.0070915
2020-27353    -0.2559567 0.0072565
2020-27455    -0.3152324 0.0058399
2020-27740    -0.2429434 0.0087629
2020-27739    -0.1312597 0.0192396
2020-27807     0.9646672 0.1193774
2020-27948    -0.1333004 0.0127758
2020-28605    -0.3080925 0.0044753
2020-28606    -0.1453523 0.0222920
2020-29235    -0.2870315 0.0084152
2021-00040     5.4284415 0.0112644
2021-01013    -0.3459242 0.0031902
2021-00305    -0.4589856 0.0014271
2021-01094    -0.3926450 0.0033741
2021-01228    -0.3733023 0.0033971
2021-01469     0.0248480 0.0350010
2021-01476    -0.4012253 0.0022055
2021-01635    -0.3191460 0.0039608
2021-01646    -0.3148584 0.0044342
2021-01643    -0.1758566 0.0154139
2021-01644     0.3489173 0.0543083
2021-01645     0.2261349 0.0448944
2021-01713     0.4474529 0.1288358
2021-01714    -0.4512163 0.0010147
2021-01712     0.1183126 0.0562465
2021-01753    -0.3385895 0.0027597
2021-01759    -0.4066500 0.0022199
2021-01765    -0.3501820 0.0021326
2021-01766    -0.3536790 0.0025914
2021-01767    -0.0371964 0.0295620
2021-01755    -0.0589811 0.0253802
2021-01761    -0.0280884 0.0246295
2021-01762     1.0457685 0.0448781
2021-01768    -0.1695407 0.0210357
2021-01859    -0.3605671 0.0024498
2021-01863    -0.2252856 0.0113816
2021-01864    -0.4078749 0.0021608
2021-01849    -0.3707546 0.0030403
2021-01852    -0.4346398 0.0015590
2021-01854    -0.4018715 0.0021876
2021-01858    -0.3358770 0.0042895
2021-01865    -0.3813327 0.0024031
2021-01923    -0.2701291 0.0105062
2021-01924     0.3324899 0.0530966
2021-02034    -0.0063566 0.0247844
2021-02038     0.0005225 0.0163381
2021-02070    -0.0660959 0.0358469
2021-02176    -0.4100365 0.0021995
2021-02177    -0.4390137 0.0006936
2021-02252    -0.0949934 0.0190928
2021-02561    -0.3262125 0.0031717
2021-02562    -0.3570303 0.0032451
2021-02563    -0.3635591 0.0025408
2021-02804    -0.3417870 0.0023024
2021-03139    -0.5499959 0.0009127
2021-03424    -0.4278864 0.0019271
2021-03874     0.3090804 0.0803853
2021-04280    -0.3550141 0.0020241
2021-04281     0.1819563 0.0598201
2021-05087    -0.3004277 0.0034704
2021-05183    -0.4081783 0.0014905
2021-05200    -0.1597973 0.0156875
2021-07239    -0.4019441 0.0032252
2021-07756    -0.4132994 0.0027505
2021-08098    -0.5477250 0.0008347
2021-09213    -0.3098361 0.0040424
2021-09263     0.5825523 0.0449168
2021-10139    -0.1645954 0.0182328
2021-10460    -0.3349881 0.0014588
2021-10691     1.2852030 0.0599901
2021-11168    -0.3653405 0.0022986
2021-11792    -0.4716943 0.0009261
2021-12019    -0.5066755 0.0012249
2021-12382    -0.5467496 0.0009586
2021-12506    -0.4267992 0.0014860
2021-14127    -0.1662749 0.0058637
2021-15069    -0.2305953 0.0043531
2021-17121    -0.3703757 0.0031966
2021-17253    -0.5483655 0.0009232
2021-18306    -0.5480655 0.0011448
2021-19579    -0.4588305 0.0011510
2021-19578    -0.0748756 0.0215497
2021-19924     0.4651935 0.0438178
2021-19927    -0.1025016 0.0202298
2021-20165    -0.4787620 0.0008805
2021-20164    -0.1359317 0.0325546
2021-20508    -0.5256670 0.0008255
2021-20629     0.1550474 0.0754456
2021-21908    -0.4940753 0.0011101
2021-22588    -0.4786270 0.0009271
2021-23224    -0.4698414 0.0009241
2021-24183    -0.0244467 0.0309494
2021-25286    -0.3795168 0.0031836
2021-25287    -0.4030382 0.0015846
2021-25715     0.6216554 0.0474454
2021-25548    -0.4007509 0.0032335
2021-26459    -0.3419631 0.0031117
2021-27114    -0.3053328 0.0023824
2021-27380    -0.2487578 0.0039507
2021-27605    -0.3810366 0.0025585
2021-27505    -0.5234676 0.0008003
2021-28313     5.4284415 0.0112644
2022-02027     1.4059283 0.0962381
2022-02869     0.2009731 0.0316807
2022-03346    -0.5342652 0.0012901
2022-04020    -0.5469113 0.0009269
2022-05232    -0.5119460 0.0014584
2022-05471    -0.4211239 0.0010294
2022-05554    -0.5164534 0.0013072
2022-05949     0.0464261 0.0443239
2022-07716     0.3148341 0.0550773
2022-07757    -0.5186027 0.0014536
2022-09138    -0.4034550 0.0019283
2022-10076    -0.3726229 0.0030157
2022-11810    -0.3426790 0.0012688
2022-13391    -0.4509066 0.0009443
2022-15138    -0.3068093 0.0045450
2022-15628     1.2458207 0.0969237
2022-15743    -0.5143879 0.0008307
2022-17420    -0.2342883 0.0104406
2022-18840    -0.3680161 0.0030961
2022-20167    -0.3921659 0.0011001
2022-20210    -0.4069174 0.0017729
2022-20450    -0.3793792 0.0017068
2022-21839    -0.3950749 0.0020115
2022-21911    -0.0314717 0.0253806
2022-22531    -0.2785258 0.0025496
2022-22834    -0.2034509 0.0141369
2022-23433    -0.5167990 0.0013227
2022-27585    -0.4582905 0.0018266
2022-28474     5.4155377 0.0117066
2023-03779    -0.3603182 0.0015982
2023-05714    -0.2711031 0.0063859
2023-06730    -0.3520105 0.0018902
2023-07760    -0.0716647 0.0194117
2023-08659    -0.3197214 0.0024153
2023-08955    -0.4355427 0.0008650
2023-09318    -0.0492071 0.0348961
2023-09826    -0.5392982 0.0008535
2023-10407     0.0632771 0.0441853
2023-12974    -0.0552962 0.0135892
2023-13889    -0.2276884 0.0077919
2023-15347     0.0971167 0.0712622
2023-16570     1.4549298 0.0491417
2023-16636    -0.3601876 0.0019449
2023-17449    -0.4590206 0.0010467
2023-17832     0.4128556 0.0596979
2023-19798     0.5675952 0.1296890
2023-21174    -0.3005852 0.0054401
2023-22250    -0.4950743 0.0011435
2023-24283    -0.3819129 0.0006726
2023-26569    -0.2428155 0.0068100
2023-27318    -0.4259699 0.0013620
2023-28661     5.4155377 0.0117066
2023-28662    -0.5232440 0.0009529
2024-02354    -0.5393174 0.0009396
2024-04012    -0.0590480 0.0223281
2024-04573    -0.4332206 0.0008293
2024-04857    -0.3585972 0.0049185
2024-05220    -0.3421814 0.0023689
2024-06123    -0.3516334 0.0025546
2024-06931    -0.3759180 0.0030741
2024-08332    -0.2414085 0.0127431
2024-13810    -0.3895842 0.0018439
2024-16225    -0.4604809 0.0012490
2024-16740     1.2604434 0.0950968
2024-20712    -0.3377572 0.0026843
2024-22938    -0.3302267 0.0029994
2024-27850     1.2549364 0.0864799
2024-31143     0.9490624 0.1200139
2024-31354     1.4227997 0.0568381
2024-31355     0.5293455 0.0702543
2024-31466     5.4089313 0.0119389
2024-31766     0.8884344 0.1227475
2025-00595    -0.3346265 0.0047954
2025-00603    -0.1567422 0.0166811
2025-00611     0.0544743 0.0366489
2025-00618    -0.2942988 0.0073768
2025-00620    -0.1530393 0.0196374
2025-00619    -0.0720830 0.0253853
2025-00622    -0.5459365 0.0013029
2025-01395    -0.4247821 0.0006994
2025-01437    -0.5144705 0.0021039
2025-01467     0.2442620 0.0528902
2025-01470    -0.4181757 0.0007513
2025-01759     0.1743503 0.0784401
2025-01758    -0.3924223 0.0024186

Estimated Feature Scores:
     definit_purpos purpos_order archivist_unit unit_state designe_b
beta        -0.5027       -2.847        -0.4839   -0.08549   -0.2751
psi         -2.1785       -1.325        -4.9600    2.09367   -4.7390
     nation_archiv archiv_record record_administr presidenti_record record_act
beta        -1.843        -3.740           -3.687           -0.4667     -0.343
psi         -3.255        -4.046           -4.077           -3.5704     -4.597
     act_u.s.c regul_implement implement_presidenti c.f.r_part
beta  -0.30095         -0.2364              -0.7278     -1.196
psi   -0.07545         -3.1567              -4.8249     -4.763
     pursuant_presidenti act_includ vice_presidenti former_presid term_offic
beta             -0.2068    -0.5511          0.1249       -0.6644   -0.02714
psi              -4.0340    -4.2797         -4.1784       -3.5597   -4.70052
     impair_nation nation_secur secur_includ includ_conduct conduct_foreign
beta        -1.010       -2.875       -1.506        -0.4064         -0.2675
psi         -4.033       -0.106       -3.635        -4.6088         -4.5835
     foreign_relat relat_law law_enforc delib_process process_execut
beta        -0.209    -0.623     -3.327     -0.002925        -0.2788
psi         -4.322    -4.517     -1.092     -4.697760        -4.4519
     execut_branch
beta       -0.1697
psi        -0.8603
textplot_scale1d(wf_model_eo_text_bigrams)

textplot_scale1d(wf_model_eo_text_bigrams, margin = "features")

Trigrams

# 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)  
dfmat_eo_text_trigrams
Document-feature matrix of: 659 documents, 297,193 features (99.77% sparse) and 0 docvars.
         features
docs      definit_purpos_order purpos_order_archivist order_archivist_refer
  E9-1712                    1                      1                     1
  E9-1719                    0                      0                     0
  E9-1893                    0                      0                     0
  E9-1885                    0                      0                     0
  E9-1895                    0                      0                     0
  E9-2484                    0                      0                     0
         features
docs      archivist_refer_archivist refer_archivist_unit archivist_unit_state
  E9-1712                         1                    1                    1
  E9-1719                         0                    0                    0
  E9-1893                         0                    0                    0
  E9-1885                         0                    0                    0
  E9-1895                         0                    0                    0
  E9-2484                         0                    0                    0
         features
docs      unit_state_designe state_designe_b designe_b_nara b_nara_refer
  E9-1712                  1               1              1            1
  E9-1719                  0               0              0            0
  E9-1893                  0               0              0            0
  E9-1885                  0               0              0            0
  E9-1895                  0               0              0            0
  E9-2484                  0               0              0            0
[ reached max_ndoc ... 653 more documents, reached max_nfeat ... 297,183 more features ]
quanteda::ntoken(dfmat_eo_text_trigrams) 
      E9-1712       E9-1719       E9-1893       E9-1885       E9-1895 
          555          1356           849           988           357 
      E9-2484       E9-2483       E9-2486       E9-2485       E9-2893 
          880           310            51          1049           680 
      E9-3106       E9-3108       E9-3113       E9-3112       E9-4068 
           45            78           620           324           356 
      E9-4103       E9-5441       E9-5802       E9-8572      E9-11547 
           31           236           661           445          1654 
     E9-15368      E9-16034      E9-23886      E9-23915      E9-24203 
          517            34           191            32           547 
     E9-24518      E9-25268      E9-26834      E9-26408      E9-27441 
         3205           984           217           224           925 
     E9-28022      E9-28493      E9-28805      E9-29781      E9-30020 
          577          1217           500          1008            92 
     E9-30413      E9-31098      E9-31418 C1-2009-31418       2010-38 
           32           243          7193            28           355 
     2010-705     2010-1229     2010-2419     2010-3725     2010-4593 
          333            98           618           279           777 
    2010-4884     2010-5837     2010-7154     2010-8878     2010-9078 
          272           585           478           681           326 
    2010-9451     2010-9796    2010-10172    2010-11557    2010-12070 
          334           456           305           228           266 
   2010-12805    2010-14613    2010-15851    2010-16864    2010-18169 
          398           747           487           888          1296 
   2010-18988    2010-21016    2010-21020    2010-22002    2010-22279 
            0          1492           218           677            83 
   2010-24839    2010-25578    2010-27004    2010-28365    2010-28360 
          790          1226          1065           153           682 
   2010-28854    2010-29579    2010-31878    2010-32960    2010-33169 
          429          1145           375           243          1226 
    2011-1385     2011-2577     2011-3257     2011-4753     2011-5728 
          623           380           625           619          1173 
    2011-5903     2011-8642     2011-9739    2011-10732    2011-10910 
           96           132           295           519           516 
   2011-12645    2011-13173    2011-14919    2011-15181    2011-15443 
          492           623           464           643           571 
   2011-17447    2011-17953    2011-18065    2011-19156    2011-21505 
          359           251           488           600           559 
   2011-21704    2011-23891    2011-26141    2011-26574    2011-26729 
          628           736           274           167          1230 
   2011-28728    2011-29683    2011-30463    2011-30990    2011-31624 
          460           460          1027           145          1384 
   2011-32486    2011-33087    2011-33335    2011-33089     2012-1568 
           83           279           177           505           719 
    2012-2557     2012-3097     2012-3616     2012-5366     2012-6797 
          138           767           582           479           694 
    2012-7019     2012-7636     2012-9473    2012-10034    2012-10715 
         2817           963           416           752          1100 
   2012-10968    2012-10884    2012-11798    2012-12225    2012-12889 
          676           711           478           508           201 
   2012-12881    2012-12882    2012-12883    2012-15183    2012-15954 
          265           190           227           914           503 
   2012-17022    2012-17264    2012-18237    2012-18868    2012-19055 
         1338           649           491          1489          1665 
   2012-20259    2012-22030    2012-22062    2012-22807    2012-24374 
          807           575          1198           902          1101 
   2012-25236    2012-27002    2012-30060    2012-30170    2012-30310 
         1832           670           559           106           978 
   2012-31574    2012-31225    2013-00002    2013-03915    2013-05967 
           86           134           235          1746           859 
   2013-06712    2013-07837    2013-08501    2013-08626    2013-11533 
          354           369            94           246           613 
   2013-12157    2013-12650    2013-13523    2013-15782    2013-15942 
           84            93          2385           733           784 
   2013-16387    2013-17478    2013-19220    2013-19520    2013-24388 
          646           732          1230           406           768 
   2013-26785    2013-28581    2013-31445    2014-01523    2014-03474 
         1656           152           228           221            67 
   2014-03805    2014-04254    2014-05323    2014-06141    2014-06768 
          880           937           570           565           201 
   2014-06612    2014-07895    2014-08426    2014-09343    2014-11442 
          530           655           356            18           765 
   2014-12651    2014-14429    2014-14432    2014-16360    2014-17522 
          219            89           155           550           162 
   2014-18561    2014-18682    2014-18998    2014-22805    2014-23228 
         1910           106           494          1409          1380 
   2014-24218    2014-24851    2014-25292    2014-25439    2014-29121 
          128           199           105           540           134 
   2014-29625    2014-30195    2014-30323    2014-30363    2015-00058 
          289           274           601           228           534 
   2015-01255    2015-01522    2015-02379    2015-03714    2015-05677 
          719           855           942          1258           763 
   2015-07016    2015-07788    2015-13055    2015-15495    2015-15828 
         4178           674           139            87            42 
   2015-16122    2015-16334    2015-17926    2015-18292    2015-19183 
          893           296           148           413           983 
   2015-19209    2015-20801    2015-22888    2015-22998    2015-23630 
         1007           466           129          1042           521 
   2015-25489    2015-25744    2015-29403    2015-29498    2015-30191 
          511           254           184           199           654 
   2015-31749    2015-32060    2015-32582    2016-01325    2016-02475 
          141          1344           228          1447          1014 
   2016-03141    2016-03038    2016-04770    2016-06250    2016-06355 
          686           870           247           821           851 
   2016-07703    2016-08713    2016-09346    2016-09483    2016-11300 
          209           104           511           748           637 
   2016-12307    2016-12155    2016-12579    2016-15542    2016-16295 
         1197           751            87           752           763 
   2016-17945    2016-18872    2016-19723    2016-19724    2016-19725 
          337           200           192           217           234 
   2016-20713    2016-22454    2016-22962    2016-24066    2016-24847 
          153           163            86           895           278 
   2016-25288    2016-25290    2016-26753    2016-27156    2016-27171 
          388          1258            66           993          1448 
   2016-28203    2016-29165    2016-29169    2016-29519    2016-30101 
          920           430           382          1641           141 
   2016-30272    2016-30277    2016-31792    2016-31875    2016-31922 
          212          1343           215           239           363 
   2017-01169    2017-01164    2017-01168    2017-01487    2017-01197 
         1024           312           133           154           478 
   2017-01489    2017-01623    2017-01799    2017-02029    2017-02095 
          233          3558           239           325          1327 
   2017-02102    2017-02281    2017-02450    2017-02451    2017-02762 
         1083          1507          1382           476           223 
   2017-03113    2017-03115    2017-03116    2017-03118    2017-04107 
          670           321           156           307           599 
   2017-04357    2017-04353    2017-04837    2017-05399    2017-06382 
          794           256          3236           310            89 
   2017-06576    2017-06716    2017-06967    2017-06971    2017-06968 
         1324           412           363           157           376 
   2017-08311    2017-08586    2017-08818    2017-08905    2017-08908 
          700           346           610           304           483 
   2017-08990    2017-09083    2017-09087    2017-09156    2017-09161 
          271           477           973           405           152 
   2017-09574    2017-10004    2017-10003    2017-13012    2017-13458 
          305          1708           402           947            99 
   2017-14378    2017-14992    2017-15680    2017-15860    2017-18134 
          690           124           410           579          2007 
   2017-18468    2017-18679    2017-20647    2017-21555    2017-21559 
          407           100          1202           412           160 
   2017-22677    2017-23270    2017-23630    2017-27034    2017-27899 
          609            96           918           227           507 
   2017-27925    2017-28160    2018-00240    2018-00553    2018-00630 
          800           237            74           468           310 
   2018-02261    2018-04414    2018-04860    2018-05113    2018-05916 
          423           565           613           812           333 
   2018-07874    2018-08272    2018-08883    2018-09895    2018-10403 
         1025           482           923           577           584 
   2018-10855    2018-11101    2018-11335    2018-11939    2018-11913 
          744           866           334          1179          1611 
   2018-11916    2018-11936    2018-13640    2018-13696    2018-15202 
         1810           311           885           388           802 
   2018-15195    2018-15299    2018-15955    2018-17068    2018-19514 
          222           532          1104          3283           613 
   2018-20203    2018-20816    2018-24254    2018-26156    2018-26552 
         1395          1461           641           658           130 
   2018-27515    2018-27945    2019-00014    2019-00048    2019-00615 
          900           127          1116           226           204 
   2019-01426    2019-02544    2019-04298    2019-04437    2019-04595 
          508          1669           423           886           194 
   2019-05370    2019-05934    2019-06325    2019-06548    2019-07645 
          187           821          1699           238           594 
   2019-07656    2019-08797    2019-09750    2019-09877    2019-10398 
         1304          1693          1371           951          1024 
   2019-10538    2019-12802    2019-13175    2019-13945    2019-13793 
          998           814           445           902           804 
   2019-14016    2019-15159    2019-15222    2019-15449    2019-16383 
          873           589          1481           499           746 
   2019-16879    2019-17052    2019-19367    2019-19895    2019-20804 
          411           687           367           445          1237 
   2019-21505    2019-21630    2019-22073    2019-22623    2019-22624 
          389           387          1064          1021          1288 
   2019-22749    2019-22849    2019-23525    2019-24040    2019-24288 
          406          1285           573           729           128 
   2019-26178    2019-27217    2019-27678    2019-28286    2020-00534 
          582           338           127           228          1002 
   2020-02439    2020-02438    2020-03337    2020-03556    2020-04730 
         1170           660           731           163           275 
   2020-04755    2020-06161    2020-06478    2020-06969    2020-06985 
          288           308           362           720           198 
   2020-07530    2020-07800    2020-08392    2020-08846    2020-09537 
         1952           405           129           175           206 
   2020-09536    2020-09645    2020-09695    2020-10315    2020-10953 
          444           114          1328          1862           390 
   2020-10993    2020-11301    2020-12030    2020-12430    2020-12584 
          218           971          1322           649          1755 
   2020-12953    2020-13449    2020-14077    2020-14337    2020-14509 
          927           909          1232           648           985 
   2020-14328    2020-14872    2020-15338    2020-15646    2020-16623 
           99          1138           832          1384           325 
   2020-16624    2020-20887    2020-16625    2020-17364    2020-17363 
          227           410           330           515           369 
   2020-17699    2020-17700    2020-18012    2020-18015    2020-19032 
          503           540          1702           527           302 
   2020-21129    2020-21160    2020-21534    2020-21914    2020-21960 
          448           851          1902          2390           585 
   2020-22064    2020-22510    2020-23115    2020-23116    2020-23780 
         1506           611           644          1148          1200 
   2020-24793    2020-25459    2020-27065    2020-27353    2020-27455 
          948           779          1469           557           316 
   2020-27740    2020-27739    2020-27807    2020-27948    2020-28605 
          526           276           127           993          1497 
   2020-28606    2020-29235    2021-00040    2021-01013    2021-00305 
          416           626           226          1189           761 
   2021-01094    2021-01228    2021-01469    2021-01476    2021-01635 
          240           321           336           832           905 
   2021-01646    2021-01643    2021-01644    2021-01645    2021-01713 
          773          1176           456           773            77 
   2021-01714    2021-01712    2021-01753    2021-01759    2021-01765 
         1679           208          1099           635          1898 
   2021-01766    2021-01767    2021-01755    2021-01761    2021-01762 
          953           255           642           445          1663 
   2021-01768    2021-01859    2021-01863    2021-01864    2021-01849 
          174           962           413           763           474 
   2021-01852    2021-01854    2021-01858    2021-01865    2021-01923 
          979           732           504           793           223 
   2021-01924    2021-02034    2021-02038    2021-02070    2021-02176 
          437           636          1232           219           505 
   2021-02177    2021-02252    2021-02561    2021-02562    2021-02563 
         4507           479          1391           540           872 
   2021-02804    2021-03139    2021-03424    2021-03874    2021-04280 
         1739           798           592           120          1596 
   2021-04281    2021-05087    2021-05183    2021-05200    2021-07239 
          181          1499          1217           343           227 
   2021-07756    2021-08098    2021-09213    2021-09263    2021-10139 
          302           984           783          1014           257 
   2021-10460    2021-10691    2021-11168    2021-11792    2021-12019 
         4808           410          1150          1743           608 
   2021-12382    2021-12506    2021-14127    2021-15069    2021-17121 
          790           871          3263          3952           560 
   2021-17253    2021-18306    2021-19579    2021-19578    2021-19924 
          818           499          1294           552           847 
   2021-19927    2021-20165    2021-20164    2021-20508    2021-20629 
          406          1808            75          1254           100 
   2021-21908    2021-22588    2021-23224    2021-24183    2021-25286 
          863          1826          1839           316           371 
   2021-25287    2021-25715    2021-25548    2021-26459    2021-27114 
         1492          1068           223           682          2764 
   2021-27380    2021-27605    2021-27505    2021-28313    2022-02027 
         2969           771          1244           226            81 
   2022-02869    2022-03346    2022-04020    2022-05232    2022-05471 
          928           488           774           360          3292 
   2022-05554    2022-05949    2022-07716    2022-07757    2022-09138 
          436           189           611           329          1279 
   2022-10076    2022-11810    2022-13391    2022-15138    2022-15628 
          455          6121          2323           732           165 
   2022-15743    2022-17420    2022-18840    2022-20167    2022-20210 
         1478           478           513          3631           902 
   2022-20450    2022-21839    2022-21911    2022-22531    2022-22834 
         1725           884           493          4472           444 
   2022-23433    2022-27585    2022-28474    2023-03779    2023-05714 
          465           533           226          2589           729 
   2023-06730    2023-07760    2023-08659    2023-08955    2023-09318 
         2114           651          2602          3192           132 
   2023-09826    2023-10407    2023-12974    2023-13889    2023-15347 
         1023           316          1835           917           108 
   2023-16570    2023-16636    2023-17449    2023-17832    2023-19798 
          300          1739          1356           433           112 
   2023-21174    2023-22250    2023-24283    2023-26569    2023-27318 
         1025           757         11963           729          1459 
   2023-28661    2023-28662    2024-02354    2024-04012    2024-04573 
          226           908           839           942          3222 
   2024-04857    2024-05220    2024-06123    2024-06931    2024-08332 
          183          1372          1295           636           239 
   2024-13810    2024-16225    2024-16740    2024-20712    2024-22938 
         1073          1140           143          1391          1752 
   2024-27850    2024-31143    2024-31354    2024-31355    2024-31466 
          217           127           254           456           230 
   2024-31766    2025-00595    2025-00603    2025-00611    2025-00618 
          130           300           254           216           231 
   2025-00620    2025-00619    2025-00622    2025-01395    2025-01437 
          187           234           486          7029           179 
   2025-01467    2025-01470    2025-01759    2025-01758 
          441          5412           104           636 
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_termfreq = 5, min_docfreq = 2)
wf_model_eo_text_trigrams <- quanteda.textmodels::textmodel_wordfish(dfmat_eo_text_trigrams, dir = c(281,589))
summary(wf_model_eo_text_trigrams)

Call:
textmodel_wordfish.dfm(x = dfmat_eo_text_trigrams, dir = c(281, 
    589))

Estimated Document Positions:
                  theta        se
E9-1712       -0.170697 1.062e-01
E9-1719       -1.963738 1.435e-01
E9-1893        0.658991 1.532e-04
E9-1885        0.597401 2.744e-04
E9-1895        0.458554 1.273e-03
E9-2484        0.392620 1.814e-03
E9-2483        0.457594 1.668e-03
E9-2486       -0.124682 1.409e-01
E9-2485        0.447768 1.106e-03
E9-2893        0.126220 1.486e-02
E9-3106        0.168245 4.236e-02
E9-3108       -0.054660 1.278e-01
E9-3113        0.027339 3.275e-02
E9-3112        0.427383 1.653e-03
E9-4068        0.353923 3.206e-03
E9-4103        0.269548 2.172e-02
E9-5441       -0.426960 2.091e-01
E9-5802        0.326786 2.610e-03
E9-8572        0.296701 4.819e-03
E9-11547       0.354144 2.708e-03
E9-15368       0.111723 1.583e-02
E9-16034       0.271600 3.536e-02
E9-23886       0.439985 1.572e-03
E9-23915       0.535036 2.029e-03
E9-24203       0.467986 1.294e-03
E9-24518       0.316174 2.028e-03
E9-25268       0.268342 3.711e-03
E9-26834       0.089138 4.082e-02
E9-26408      -0.137613 9.658e-02
E9-27441      -0.523835 1.248e-01
E9-28022       0.391315 1.802e-03
E9-28493       0.450636 1.073e-03
E9-28805       0.158074 1.294e-02
E9-29781       0.100430 1.723e-02
E9-30020      -1.942709 3.023e-01
E9-30413       0.425375 9.046e-03
E9-31098      -3.498746 8.038e-02
E9-31418       0.482495 4.399e-04
C1-2009-31418  0.348132 3.691e-02
2010-38       -0.348726 1.471e-01
2010-705       0.005414 4.298e-02
2010-1229     -0.759537 4.073e-01
2010-2419      0.370283 2.045e-03
2010-3725      0.100325 2.842e-02
2010-4593      0.290721 3.711e-03
2010-4884      0.614852 2.732e-04
2010-5837      0.391907 2.149e-03
2010-7154     -0.998271 3.262e-01
2010-8878      0.832639 1.171e-05
2010-9078      0.179870 1.461e-02
2010-9451      0.084837 2.396e-02
2010-9796      0.049112 2.804e-02
2010-10172    -0.057802 5.878e-02
2010-11557    -0.591774 2.328e-01
2010-12070     0.630970 2.388e-04
2010-12805     0.261854 6.057e-03
2010-14613     0.209259 8.099e-03
2010-15851     0.372688 2.262e-03
2010-16864    -0.091028 5.684e-02
2010-18169     0.295284 3.267e-03
2010-21016     0.325483 2.340e-03
2010-21020    -0.457976 1.915e-01
2010-22002     0.831482 1.199e-05
2010-22279    -3.508179 4.814e-02
2010-24839     0.824299 1.136e-05
2010-25578    -0.062240 3.817e-02
2010-27004     0.294097 3.138e-03
2010-28365     0.631505 2.247e-04
2010-28360    -0.884403 2.529e-01
2010-28854     0.284215 5.260e-03
2010-29579     0.004176 3.120e-02
2010-31878     0.241233 6.828e-03
2010-32960    -3.610544 8.793e-02
2010-33169    -1.815310 2.006e-01
2011-1385     -0.541450 1.943e-01
2011-2577      0.405629 1.902e-03
2011-3257      0.286268 4.637e-03
2011-4753      0.836657 1.120e-05
2011-5728      0.557479 4.526e-04
2011-5903      0.054092 1.238e-01
2011-8642      0.252068 1.076e-02
2011-9739      0.813140 2.023e-05
2011-10732     0.183872 1.448e-02
2011-10910     0.836444 1.167e-05
2011-12645     0.838579 1.191e-05
2011-13173     0.812986 1.378e-05
2011-14919     0.107359 1.807e-02
2011-15181     0.162413 1.634e-02
2011-15443     0.319881 3.483e-03
2011-17447     0.241231 8.728e-03
2011-17953    -0.477107 1.972e-01
2011-18065    -0.183904 8.922e-02
2011-19156     0.831485 1.183e-05
2011-21505     0.835654 1.149e-05
2011-21704    -1.082140 2.722e-01
2011-23891     0.161476 1.375e-02
2011-26141     0.421627 1.584e-03
2011-26574     0.719460 8.437e-05
2011-26729     0.108057 1.642e-02
2011-28728    -0.109474 9.745e-02
2011-29683    -0.566524 2.393e-01
2011-30463     0.791669 1.320e-05
2011-30990     0.368178 3.360e-03
2011-31624     0.248875 5.145e-03
2011-32486    -3.481758 4.936e-02
2011-33087    -3.580375 8.353e-02
2011-33335     0.298016 6.319e-03
2011-33089     0.475820 1.148e-03
2012-1568      0.253048 5.861e-03
2012-2557      0.307017 7.748e-03
2012-3097      0.822844 1.138e-05
2012-3616      0.422990 1.359e-03
2012-5366      0.258999 6.706e-03
2012-6797     -0.135689 5.807e-02
2012-7019      0.476732 6.018e-04
2012-7636     -0.301470 1.087e-01
2012-9473     -0.241675 1.129e-01
2012-10034     0.827145 1.145e-05
2012-10715    -0.554500 1.792e-01
2012-10968    -0.224727 9.591e-02
2012-10884     0.816082 1.363e-05
2012-11798    -0.646635 2.235e-01
2012-12225     0.839904 1.179e-05
2012-12889     0.609143 3.216e-04
2012-12881     0.620086 2.552e-04
2012-12882     0.616262 2.803e-04
2012-12883     0.633034 2.340e-04
2012-15183    -0.130238 6.323e-02
2012-15954     0.821573 1.701e-05
2012-17022     0.082560 2.018e-02
2012-17264     0.835401 1.168e-05
2012-18237     0.829386 1.510e-05
2012-18868     0.316834 2.259e-03
2012-19055     0.788447 1.112e-05
2012-20259     0.118138 1.759e-02
2012-22030    -0.229728 1.305e-01
2012-22062    -1.607153 2.234e-01
2012-22807     0.016631 3.772e-02
2012-24374     0.547054 5.483e-04
2012-25236     0.807064 8.746e-06
2012-27002    -0.306623 9.849e-02
2012-30060     0.233204 8.340e-03
2012-30170    -0.279504 1.650e-01
2012-30310    -0.087903 4.729e-02
2012-31574     0.011681 6.409e-02
2012-31225    -1.957504 2.298e-01
2013-00002    -3.603705 8.449e-02
2013-03915     0.281163 3.190e-03
2013-05967     0.667536 1.149e-04
2013-06712    -0.370098 1.798e-01
2013-07837     0.254635 6.577e-03
2013-08501    -0.028435 6.546e-02
2013-08626    -3.567336 8.317e-02
2013-11533    -0.414389 1.561e-01
2013-12157    -3.715786 4.242e-02
2013-12650    -0.126603 1.157e-01
2013-13523     0.796260 8.660e-06
2013-15782     0.335439 2.677e-03
2013-15942     0.150806 1.183e-02
2013-16387     0.485072 8.347e-04
2013-17478    -0.254271 1.041e-01
2013-19220     0.300577 3.454e-03
2013-19520     0.817609 2.136e-05
2013-24388     0.409334 1.261e-03
2013-26785     0.152457 1.001e-02
2013-28581     0.716949 8.077e-05
2013-31445    -3.616796 8.549e-02
2014-01523    -0.335237 1.545e-01
2014-03474     0.269486 9.997e-03
2014-03805     0.509349 5.363e-04
2014-04254     0.176399 1.330e-02
2014-05323     0.836888 1.107e-05
2014-06141     0.834688 1.127e-05
2014-06768     0.718327 7.652e-05
2014-06612     0.836092 1.141e-05
2014-07895     0.829991 1.140e-05
2014-08426     0.400451 2.252e-03
2014-09343    -0.091086 3.568e-01
2014-11442     0.827962 1.104e-05
2014-12651     0.799155 3.572e-05
2014-14429    -3.717351 4.240e-02
2014-14432     0.719651 7.999e-05
2014-16360     0.818183 1.645e-05
2014-17522    -0.505965 2.134e-01
2014-18561     0.320255 3.024e-03
2014-18682    -0.322634 2.017e-01
2014-18998     0.144463 1.629e-02
2014-22805     0.094635 1.682e-02
2014-23228     0.366454 2.349e-03
2014-24218    -1.393516 3.891e-01
2014-24851     0.719876 8.143e-05
2014-25292    -0.759537 4.073e-01
2014-25439     0.166086 1.555e-02
2014-29121    -1.936967 2.335e-01
2014-29625    -0.221440 1.285e-01
2014-30195    -0.089284 6.062e-02
2014-30323     0.835129 1.113e-05
2014-30363    -3.616796 8.549e-02
2015-00058     0.836188 1.170e-05
2015-01255    -0.066994 4.742e-02
2015-01522     0.090240 2.097e-02
2015-02379     0.391286 2.034e-03
2015-03714     0.339589 2.252e-03
2015-05677     0.829151 1.114e-05
2015-07016     0.211039 4.761e-03
2015-07788     0.822480 1.182e-05
2015-13055     0.721487 9.336e-05
2015-15495    -3.831068 3.963e-02
2015-15828     0.485501 8.621e-03
2015-16122     0.607295 2.410e-04
2015-16334     0.007522 4.596e-02
2015-17926     0.717866 8.144e-05
2015-18292     0.374666 2.533e-03
2015-19183     0.349448 3.123e-03
2015-19209     0.005863 3.446e-02
2015-20801    -1.158206 3.089e-01
2015-22888    -0.248574 1.412e-01
2015-22998     0.458505 9.002e-04
2015-23630     0.357982 3.256e-03
2015-25489     0.415311 1.222e-03
2015-25744     0.442797 2.102e-03
2015-29403     0.730192 7.711e-05
2015-29498     0.717017 8.009e-05
2015-30191     0.829127 1.102e-05
2015-31749    -1.943945 2.358e-01
2015-32060    -1.506997 2.441e-01
2015-32582    -3.616796 8.549e-02
2016-01325     0.810234 1.035e-05
2016-02475     0.108434 1.907e-02
2016-03141     0.154212 1.357e-02
2016-03038     0.236573 6.685e-03
2016-04770     0.503332 1.149e-03
2016-06250     0.325184 3.360e-03
2016-06355     0.830712 1.045e-05
2016-07703    -0.516775 2.380e-01
2016-08713     0.439503 2.207e-03
2016-09346    -0.557980 2.010e-01
2016-09483     0.830337 1.165e-05
2016-11300    -0.477908 1.705e-01
2016-12307     0.517936 7.248e-04
2016-12155     0.125341 1.711e-02
2016-12579    -3.831068 3.963e-02
2016-15542     0.317894 3.806e-03
2016-16295     0.255744 8.623e-03
2016-17945     0.594369 3.804e-04
2016-18872    -0.058691 8.024e-02
2016-19723     0.607328 3.960e-04
2016-19724     0.617582 2.916e-04
2016-19725     0.632646 2.276e-04
2016-20713    -0.105658 8.831e-02
2016-22454     0.733714 7.497e-05
2016-22962    -3.739690 4.177e-02
2016-24066    -2.033828 1.621e-01
2016-24847     0.719355 8.643e-05
2016-25288    -0.480065 2.288e-01
2016-25290     0.160116 1.218e-02
2016-26753     0.188629 2.337e-02
2016-27156     0.417475 1.696e-03
2016-27171     0.569424 3.319e-04
2016-28203    -0.170281 6.521e-02
2016-29165    -1.266494 3.412e-01
2016-29169    -0.521913 2.094e-01
2016-29519     0.386881 1.669e-03
2016-30101     0.365185 3.701e-03
2016-30272     0.643038 2.769e-04
2016-30277     0.357258 2.172e-03
2016-31792     0.624587 2.687e-04
2016-31875    -3.563957 8.149e-02
2016-31922     0.794737 2.325e-05
2017-01169     0.173418 1.422e-02
2017-01164     0.447496 2.067e-03
2017-01168    -0.254678 1.442e-01
2017-01487     0.631922 2.244e-04
2017-01197     0.698626 1.038e-04
2017-01489     0.631383 2.347e-04
2017-01623    -1.928681 1.035e-01
2017-01799    -0.521012 2.240e-01
2017-02029     0.341098 4.054e-03
2017-02095     0.476433 8.016e-04
2017-02102     0.563336 3.516e-04
2017-02281     0.622295 1.422e-04
2017-02450    -1.790157 1.662e-01
2017-02451     0.397797 2.643e-03
2017-02762     0.391690 3.076e-03
2017-03113     0.538712 6.138e-04
2017-03115    -0.154067 8.199e-02
2017-03116     0.631235 2.263e-04
2017-03118    -0.137212 8.828e-02
2017-04107    -0.059498 5.217e-02
2017-04357     0.305736 3.428e-03
2017-04353     0.046947 3.810e-02
2017-04837     0.631941 1.030e-04
2017-05399    -0.248622 1.190e-01
2017-06382    -0.348646 1.867e-01
2017-06576     0.179462 8.078e-03
2017-06716     0.036409 3.424e-02
2017-06967     0.372984 2.807e-03
2017-06971     0.631235 2.263e-04
2017-06968     0.546149 6.522e-04
2017-08311     0.545008 4.261e-04
2017-08586     0.352314 3.406e-03
2017-08818    -0.169711 7.049e-02
2017-08905     0.033928 4.412e-02
2017-08908    -0.002290 3.871e-02
2017-08990    -0.497938 2.132e-01
2017-09083    -0.747632 2.402e-01
2017-09087     0.478624 8.531e-04
2017-09156     0.526468 7.816e-04
2017-09161    -0.240847 1.461e-01
2017-09574    -0.647221 2.365e-01
2017-10004     0.369870 1.349e-03
2017-10003     0.324886 3.489e-03
2017-13012     0.147573 1.297e-02
2017-13458    -0.049949 7.669e-02
2017-14378     0.299695 3.619e-03
2017-14992     0.722118 1.125e-04
2017-15680     0.340205 3.066e-03
2017-15860     0.231642 7.420e-03
2017-18134     0.097167 1.785e-02
2017-18468     0.819488 1.728e-05
2017-18679    -0.329834 1.824e-01
2017-20647     0.824233 9.421e-06
2017-21555     0.442413 1.043e-03
2017-21559    -0.292597 1.458e-01
2017-22677     0.460688 1.309e-03
2017-23270     0.515972 1.096e-03
2017-23630     0.640901 1.421e-04
2017-27034     0.129252 2.644e-02
2017-27899     0.115580 2.150e-02
2017-27925     0.826084 1.121e-05
2017-28160    -3.551188 8.065e-02
2018-00240     0.032864 5.419e-02
2018-00553     0.235202 9.733e-03
2018-00630    -0.179689 9.652e-02
2018-02261     0.574874 4.164e-04
2018-04414     0.290489 4.786e-03
2018-04860    -4.116175 2.677e-02
2018-05113    -0.199598 7.855e-02
2018-05916     0.819153 1.771e-05
2018-07874     0.489098 9.419e-04
2018-08272    -0.434188 1.590e-01
2018-08883    -0.031314 3.750e-02
2018-09895     0.044059 2.944e-02
2018-10403    -1.066623 2.633e-01
2018-10855    -0.445793 1.507e-01
2018-11101     0.377141 1.730e-03
2018-11335     0.814760 2.001e-05
2018-11939    -1.191705 2.280e-01
2018-11913    -1.843100 1.766e-01
2018-11916    -1.966277 1.310e-01
2018-11936     0.362663 3.395e-03
2018-13640     0.156411 1.218e-02
2018-13696     0.468184 1.355e-03
2018-15202    -2.045297 1.682e-01
2018-15195    -1.281412 3.707e-01
2018-15299     0.359413 2.431e-03
2018-15955     0.104642 1.559e-02
2018-17068     0.795893 8.131e-06
2018-19514     0.512871 8.450e-04
2018-20203     0.807889 1.234e-05
2018-20816     0.796065 1.085e-05
2018-24254     0.825616 1.199e-05
2018-26156     0.827202 1.154e-05
2018-26552    -1.794046 2.625e-01
2018-27515     0.061931 2.148e-02
2018-27945    -1.949163 2.339e-01
2019-00014     0.485754 9.275e-04
2019-00048    -3.628064 8.676e-02
2019-00615     0.719336 8.163e-05
2019-01426     0.134711 1.868e-02
2019-02544     0.139409 1.251e-02
2019-04298     0.259543 7.402e-03
2019-04437    -0.405533 1.217e-01
2019-04595     0.259669 8.426e-03
2019-05370     0.705128 1.050e-04
2019-05934     0.283990 4.897e-03
2019-06325     0.467412 6.963e-04
2019-06548    -3.565532 8.381e-02
2019-07645     0.577314 4.235e-04
2019-07656     0.309599 3.006e-03
2019-08797    -2.092136 1.171e-01
2019-09750     0.431898 1.173e-03
2019-09877     0.807631 1.173e-05
2019-10398     0.384324 1.478e-03
2019-10538     0.745258 2.945e-05
2019-12802     0.329342 3.414e-03
2019-13175     0.062184 3.493e-02
2019-13945     0.458852 1.150e-03
2019-13793     0.817481 1.136e-05
2019-14016     0.158443 1.349e-02
2019-15159    -0.101976 7.941e-02
2019-15222     0.373278 2.876e-03
2019-15449     0.250280 7.088e-03
2019-16383     0.822697 1.187e-05
2019-16879     0.794199 2.285e-05
2019-17052     0.818493 1.243e-05
2019-19367     0.036034 3.092e-02
2019-19895     0.817253 1.691e-05
2019-20804     0.112482 1.854e-02
2019-21505     0.564523 5.144e-04
2019-21630     0.446022 1.024e-03
2019-22073     0.004195 4.070e-02
2019-22623    -0.765526 2.043e-01
2019-22624    -1.487072 2.380e-01
2019-22749     0.150554 2.173e-02
2019-22849     0.806382 1.029e-05
2019-23525     0.023820 3.191e-02
2019-24040     0.325664 3.365e-03
2019-24288     0.302162 6.059e-03
2019-26178    -0.053719 4.500e-02
2019-27217     0.297470 5.561e-03
2019-27678    -1.949163 2.339e-01
2019-28286    -3.615195 8.830e-02
2020-00534     0.807449 1.117e-05
2020-02439     0.542297 4.581e-04
2020-02438     0.488070 8.665e-04
2020-03337     0.116886 1.715e-02
2020-03556    -0.105621 7.677e-02
2020-04730     0.385581 2.714e-03
2020-04755    -0.052692 6.600e-02
2020-06161     0.397862 2.019e-03
2020-06478     0.511033 7.825e-04
2020-06969     0.554759 3.480e-04
2020-06985     0.514017 8.565e-04
2020-07530     0.531628 4.200e-04
2020-07800     0.479763 1.290e-03
2020-08392     0.660925 2.281e-04
2020-08846     0.526324 7.934e-04
2020-09537     0.099459 2.986e-02
2020-09536     0.295544 4.939e-03
2020-09645    -0.565736 2.680e-01
2020-09695     0.734934 3.361e-05
2020-10315     0.489343 5.443e-04
2020-10953     0.470338 1.082e-03
2020-10993     0.049282 3.705e-02
2020-11301     0.207828 9.375e-03
2020-12030     0.193413 1.117e-02
2020-12430     0.594437 3.353e-04
2020-12584     0.485473 5.369e-04
2020-12953     0.812336 1.244e-05
2020-13449    -0.035579 3.947e-02
2020-14077     0.208088 9.145e-03
2020-14337     0.201998 1.317e-02
2020-14509     0.024835 3.223e-02
2020-14328    -0.315678 1.687e-01
2020-14872     0.373922 2.204e-03
2020-15338     0.170513 9.938e-03
2020-15646     0.812762 1.220e-05
2020-16623    -0.521750 2.309e-01
2020-16624    -0.282757 1.675e-01
2020-20887     0.227461 1.129e-02
2020-16625    -0.343354 1.774e-01
2020-17364    -0.215512 1.087e-01
2020-17363     0.192261 1.241e-02
2020-17699     0.780948 2.547e-05
2020-17700     0.787851 2.230e-05
2020-18012     0.454676 6.694e-04
2020-18015     0.049410 3.947e-02
2020-19032    -0.103704 9.042e-02
2020-21129    -0.617521 2.342e-01
2020-21160     0.816769 1.194e-05
2020-21534     0.231772 6.838e-03
2020-21914    -0.152416 7.168e-02
2020-21960    -0.309946 1.287e-01
2020-22064     0.666814 8.535e-05
2020-22510    -0.349371 1.315e-01
2020-23115    -0.149521 7.121e-02
2020-23116    -0.218647 7.658e-02
2020-23780    -1.948342 1.540e-01
2020-24793     0.170639 1.160e-02
2020-25459     0.778943 2.234e-05
2020-27065    -0.863822 1.787e-01
2020-27353     0.229875 8.267e-03
2020-27455     0.495187 9.641e-04
2020-27740     0.476005 1.069e-03
2020-27739     0.614108 2.808e-04
2020-27807    -1.949163 2.339e-01
2020-27948    -0.124973 5.779e-02
2020-28605     0.313695 3.590e-03
2020-28606     0.477884 1.497e-03
2020-29235    -0.271866 1.564e-01
2021-00040    -3.628064 8.676e-02
2021-01013     0.522613 6.441e-04
2021-00305     0.764051 2.792e-05
2021-01094     0.632673 2.359e-04
2021-01228     0.708586 8.049e-05
2021-01469     0.382164 2.828e-03
2021-01476     0.226953 8.212e-03
2021-01635     0.122687 1.686e-02
2021-01646     0.616414 2.306e-04
2021-01643    -0.454119 1.866e-01
2021-01644     0.306894 4.397e-03
2021-01645    -0.362531 1.511e-01
2021-01713    -0.380039 2.120e-01
2021-01714     0.727999 3.459e-05
2021-01712    -0.448055 2.045e-01
2021-01753     0.251031 5.049e-03
2021-01759     0.259401 6.170e-03
2021-01765     0.290113 2.986e-03
2021-01766    -0.319210 8.683e-02
2021-01767     0.110549 2.305e-02
2021-01755    -1.056370 3.510e-01
2021-01761     0.378575 2.204e-03
2021-01762    -1.736782 1.603e-01
2021-01768     0.471591 1.438e-03
2021-01859     0.513160 5.681e-04
2021-01863    -0.127475 8.342e-02
2021-01864    -0.032507 4.342e-02
2021-01849    -0.087516 5.837e-02
2021-01852     0.222342 6.850e-03
2021-01854    -0.019762 4.142e-02
2021-01858    -0.193565 9.244e-02
2021-01865     0.229532 6.785e-03
2021-01923    -0.275544 1.468e-01
2021-01924    -0.903332 2.415e-01
2021-02034    -0.301658 1.190e-01
2021-02038     0.322239 2.331e-03
2021-02070     0.310807 6.194e-03
2021-02176     0.027651 3.093e-02
2021-02177     0.332955 1.217e-03
2021-02252    -0.243067 9.394e-02
2021-02561     0.585980 2.624e-04
2021-02562     0.298432 4.137e-03
2021-02563     0.468754 8.573e-04
2021-02804     0.617799 1.479e-04
2021-03139     0.818984 1.146e-05
2021-03424     0.085531 2.284e-02
2021-03874     0.145421 1.971e-02
2021-04280     0.333041 2.007e-03
2021-04281     0.289964 5.770e-03
2021-05087     0.301678 3.071e-03
2021-05183     0.308042 2.693e-03
2021-05200     0.161413 1.465e-02
2021-07239     0.732471 6.094e-05
2021-07756     0.257021 6.263e-03
2021-08098     0.813768 1.117e-05
2021-09213    -0.029641 3.677e-02
2021-09263     0.523942 4.439e-04
2021-10139    -0.156855 9.157e-02
2021-10460     0.383339 8.828e-04
2021-10691    -1.762281 2.091e-01
2021-11168     0.266350 4.308e-03
2021-11792     0.204099 5.479e-03
2021-12019     0.797236 1.872e-05
2021-12382     0.816316 1.226e-05
2021-12506     0.711929 4.781e-05
2021-14127    -1.183497 1.412e-01
2021-15069     0.397121 1.133e-03
2021-17121     0.281864 5.228e-03
2021-17253     0.817946 1.173e-05
2021-18306     0.820818 1.423e-05
2021-19579     0.252415 4.215e-03
2021-19578     0.335553 3.602e-03
2021-19924     0.393794 1.476e-03
2021-19927     0.253711 7.128e-03
2021-20165     0.290708 2.505e-03
2021-20164    -0.050441 7.974e-02
2021-20508     0.800784 1.238e-05
2021-20629    -0.310419 1.821e-01
2021-21908     0.421438 1.019e-03
2021-22588     0.328768 2.113e-03
2021-23224     0.284920 2.675e-03
2021-24183     0.169582 1.600e-02
2021-25286    -0.520796 1.663e-01
2021-25287     0.046416 2.458e-02
2021-25715     0.260481 4.887e-03
2021-25548     0.730813 6.140e-05
2021-26459     0.154842 1.219e-02
2021-27114     0.237953 3.977e-03
2021-27380     0.230016 4.772e-03
2021-27605     0.498201 8.112e-04
2021-27505     0.795491 1.268e-05
2021-28313    -3.628064 8.676e-02
2022-02027    -3.847436 4.169e-02
2022-02869     0.397411 1.581e-03
2022-03346     0.807270 1.793e-05
2022-04020     0.816281 1.168e-05
2022-05232     0.794841 2.125e-05
2022-05471     0.646634 9.275e-05
2022-05554     0.790276 2.033e-05
2022-05949    -0.379827 1.738e-01
2022-07716    -0.975967 3.067e-01
2022-07757     0.798358 2.052e-05
2022-09138     0.391701 1.733e-03
2022-10076     0.302686 3.977e-03
2022-11810     0.266060 2.263e-03
2022-13391     0.324011 2.259e-03
2022-15138     0.123415 1.669e-02
2022-15628     0.719601 8.348e-05
2022-15743     0.797976 1.335e-05
2022-17420    -0.153743 8.869e-02
2022-18840    -0.243359 9.346e-02
2022-20167     0.398962 9.474e-04
2022-20210     0.227126 6.107e-03
2022-20450     0.643016 1.230e-04
2022-21839    -0.065050 4.081e-02
2022-21911    -0.007310 4.755e-02
2022-22531     0.621733 1.204e-04
2022-22834    -0.239044 1.284e-01
2022-23433     0.795603 2.052e-05
2022-27585     0.477657 1.015e-03
2022-28474    -3.623677 8.698e-02
2023-03779     0.152499 8.617e-03
2023-05714     0.335080 3.052e-03
2023-06730     0.688963 6.512e-05
2023-07760    -0.015028 4.769e-02
2023-08659    -1.013601 1.693e-01
2023-08955     0.260975 3.451e-03
2023-09318     0.536099 7.747e-04
2023-09826     0.810842 1.167e-05
2023-10407     0.513731 1.075e-03
2023-12974     0.270214 4.734e-03
2023-13889     0.060270 2.672e-02
2023-15347    -0.720377 3.992e-01
2023-16570    -5.304844 4.256e-02
2023-16636     0.377630 1.398e-03
2023-17449     0.749506 2.899e-05
2023-17832     0.392937 2.051e-03
2023-19798    -1.064917 3.777e-01
2023-21174     0.099170 2.471e-02
2023-22250     0.412028 1.107e-03
2023-24283     0.530029 1.811e-04
2023-26569    -0.313679 9.622e-02
2023-27318     0.271342 4.771e-03
2023-28661    -3.623677 8.698e-02
2023-28662     0.796419 1.530e-05
2024-02354     0.809783 1.270e-05
2024-04012     0.325327 4.641e-03
2024-04573     0.726196 2.718e-05
2024-04857     0.701698 9.644e-05
2024-05220    -0.042634 3.490e-02
2024-06123     0.087537 2.218e-02
2024-06931     0.402605 2.049e-03
2024-08332     0.117104 2.559e-02
2024-13810     0.205456 7.266e-03
2024-16225     0.281661 3.582e-03
2024-16740     0.721722 8.133e-05
2024-20712    -0.164081 5.973e-02
2024-22938     0.475870 8.594e-04
2024-27850     0.721078 8.092e-05
2024-31143    -1.927636 2.378e-01
2024-31354    -5.159944 3.916e-02
2024-31355     0.360587 3.029e-03
2024-31466    -3.620613 8.713e-02
2024-31766    -1.710346 2.815e-01
2025-00595     0.586989 3.374e-04
2025-00603     0.588489 3.298e-04
2025-00611     0.593164 2.953e-04
2025-00618     0.598140 3.130e-04
2025-00620     0.589827 3.660e-04
2025-00619     0.579088 3.922e-04
2025-00622     0.812935 1.847e-05
2025-01395     0.439443 6.120e-04
2025-01437     0.779290 3.768e-05
2025-01467     0.540087 6.973e-04
2025-01470     0.683239 3.948e-05
2025-01759    -0.247670 1.566e-01
2025-01758     0.201408 1.077e-02

Estimated Feature Scores:
     definit_purpos_order archivist_unit_state nation_archiv_record
beta               0.3007               0.3324               0.5167
psi               -2.1304              -4.9207              -3.3849
     archiv_record_administr presidenti_record_act impair_nation_secur
beta                  0.5357                0.2853               0.929
psi                  -3.4309               -4.7305              -4.076
     nation_secur_includ relat_law_enforc delib_process_execut
beta              0.6122           0.3526               0.1277
psi              -4.0958          -4.9241              -4.8902
     order_intend_affect presid_attorney_general attorney_general_assist
beta              0.4024                  0.3987                  0.3318
psi              -4.7505                 -4.4622                 -4.9206
     assist_attorney_general attorney_general_offic agenc_deem_appropri
beta                  0.4055                 0.6406              0.3644
psi                  -3.9779                -4.3888             -3.7630
     b_attorney_general attorney_general_counsel general_counsel_presid
beta             0.3218                  0.01428                0.01428
psi             -3.6380                 -4.18722               -4.18722
     shall_consult_attorney consult_attorney_general general_provis_noth
beta                 0.2025                   0.4162              0.2804
psi                 -4.2070                  -2.3252             -0.5761
     provis_noth_order noth_order_shall order_shall_constru
beta            0.2807          0.30976              0.2902
psi            -0.5735         -0.09982             -0.2223
     shall_constru_impair constru_impair_otherwis impair_otherwis_affect
beta               0.2991                  0.2992                 0.2988
psi               -0.2843                 -0.2862                -0.2901
     otherwis_affect_author affect_author_grant author_grant_law
beta                 0.2981              0.2997           0.2999
psi                 -0.3058             -0.3100          -0.3021
textplot_scale1d(wf_model_eo_text_trigrams)

textplot_scale1d(wf_model_eo_text_trigrams, margin = "features")