library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr 1.1.4 ✔ readr 2.1.5
## ✔ forcats 1.0.0 ✔ stringr 1.5.1
## ✔ ggplot2 3.5.1 ✔ tibble 3.2.1
## ✔ lubridate 1.9.3 ✔ tidyr 1.3.1
## ✔ purrr 1.0.2
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag() masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(correlationfunnel)
## Warning: package 'correlationfunnel' was built under R version 4.4.2
## ══ correlationfunnel Tip #1 ════════════════════════════════════════════════════
## Make sure your data is not overly imbalanced prior to using `correlate()`.
## If less than 5% imbalance, consider sampling. :)
departures <- readr::read_csv('https://raw.githubusercontent.com/rfordatascience/tidytuesday/main/data/2021/2021-04-27/departures.csv')
## Rows: 9423 Columns: 19
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (8): coname, exec_fullname, interim_coceo, still_there, notes, sources...
## dbl (10): dismissal_dataset_id, gvkey, fyear, co_per_rol, departure_code, c...
## dttm (1): leftofc
##
## ℹ 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.
skimr::skim(departures)
Name | departures |
Number of rows | 9423 |
Number of columns | 19 |
_______________________ | |
Column type frequency: | |
character | 8 |
numeric | 10 |
POSIXct | 1 |
________________________ | |
Group variables | None |
Variable type: character
skim_variable | n_missing | complete_rate | min | max | empty | n_unique | whitespace |
---|---|---|---|---|---|---|---|
coname | 0 | 1.00 | 2 | 30 | 0 | 3860 | 0 |
exec_fullname | 0 | 1.00 | 5 | 790 | 0 | 8701 | 0 |
interim_coceo | 9105 | 0.03 | 6 | 7 | 0 | 6 | 0 |
still_there | 7311 | 0.22 | 3 | 10 | 0 | 77 | 0 |
notes | 1644 | 0.83 | 5 | 3117 | 0 | 7755 | 0 |
sources | 1475 | 0.84 | 18 | 1843 | 0 | 7915 | 0 |
eight_ks | 4499 | 0.52 | 69 | 3884 | 0 | 4914 | 0 |
_merge | 0 | 1.00 | 11 | 11 | 0 | 1 | 0 |
Variable type: numeric
skim_variable | n_missing | complete_rate | mean | sd | p0 | p25 | p50 | p75 | p100 | hist |
---|---|---|---|---|---|---|---|---|---|---|
dismissal_dataset_id | 0 | 1.00 | 5684.10 | 25005.46 | 1 | 2305.5 | 4593 | 6812.5 | 559044 | ▇▁▁▁▁ |
gvkey | 0 | 1.00 | 40132.48 | 53921.34 | 1004 | 7337.0 | 14385 | 60900.5 | 328795 | ▇▁▁▁▁ |
fyear | 0 | 1.00 | 2007.74 | 8.19 | 1987 | 2000.0 | 2008 | 2016.0 | 2020 | ▁▆▅▅▇ |
co_per_rol | 0 | 1.00 | 25580.22 | 18202.38 | -1 | 8555.5 | 22980 | 39275.5 | 64602 | ▇▆▅▃▃ |
departure_code | 1667 | 0.82 | 5.20 | 1.53 | 1 | 5.0 | 5 | 7.0 | 9 | ▁▃▇▅▁ |
ceo_dismissal | 1813 | 0.81 | 0.20 | 0.40 | 0 | 0.0 | 0 | 0.0 | 1 | ▇▁▁▁▂ |
tenure_no_ceodb | 0 | 1.00 | 1.03 | 0.17 | 0 | 1.0 | 1 | 1.0 | 3 | ▁▇▁▁▁ |
max_tenure_ceodb | 0 | 1.00 | 1.05 | 0.24 | 1 | 1.0 | 1 | 1.0 | 4 | ▇▁▁▁▁ |
fyear_gone | 1802 | 0.81 | 2006.64 | 13.63 | 1980 | 2000.0 | 2007 | 2013.0 | 2997 | ▇▁▁▁▁ |
cik | 245 | 0.97 | 741469.17 | 486551.43 | 1750 | 106413.0 | 857323 | 1050375.8 | 1808065 | ▆▁▇▂▁ |
Variable type: POSIXct
skim_variable | n_missing | complete_rate | min | max | median | n_unique |
---|---|---|---|---|---|---|
leftofc | 1802 | 0.81 | 1981-01-01 | 2998-04-27 | 2006-12-31 | 3627 |
Issues with Code
factors_vec <- departures %>% select(departure_code, ceo_dismissal) %>% names()
departure_clean <- departures %>%
# Address factors imported as numeric
mutate(across(factors_vec, as.factor))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `across(factors_vec, as.factor)`.
## Caused by warning:
## ! Using an external vector in selections was deprecated in tidyselect 1.1.0.
## ℹ Please use `all_of()` or `any_of()` instead.
## # Was:
## data %>% select(factors_vec)
##
## # Now:
## data %>% select(all_of(factors_vec))
##
## See <https://tidyselect.r-lib.org/reference/faq-external-vector.html>.
departure_clean %>% count(ceo_dismissal)
## # A tibble: 3 × 2
## ceo_dismissal n
## <fct> <int>
## 1 0 6121
## 2 1 1489
## 3 <NA> 1813
departure_clean %>%
ggplot(aes(ceo_dismissal)) +
geom_bar()
ceo dismissal vs departure code
departure_clean %>%
ggplot(aes(ceo_dismissal, departure_code)) +
geom_boxplot()
correlation plot
cols.dont.want <- "leftofc"
departures_clean <- departure_clean[, ! names(departure_clean) %in% cols.dont.want, drop = F]
# step 1: binarize
departure_binarized <- departures_clean %>%
na.omit() %>%
select(-dismissal_dataset_id) %>%
binarize()
departure_binarized %>% glimpse()
## Rows: 18
## Columns: 128
## $ coname__BORLAND_SOFTWARE_CORP <dbl> …
## $ coname__DIRECTV <dbl> …
## $ coname__EL_PASO_CORP <dbl> …
## $ coname__ENESCO_GROUP_INC <dbl> …
## $ coname__EXAR_CORP <dbl> …
## $ coname__FLOWERS_FOODS_INC <dbl> …
## $ coname__FLUOR_CORP <dbl> …
## $ coname__GIBSON_GREETINGS_INC <dbl> …
## $ `coname__GREAT_ATLANTIC_&_PAC_TEA_CO` <dbl> …
## $ coname__LUBYS_INC <dbl> …
## $ coname__MAYTAG_CORP <dbl> …
## $ coname__MOTOROLA_SOLUTIONS_INC <dbl> …
## $ coname__NCR_CORP <dbl> …
## $ coname__RAINBOW_TECHNOLOGIES_INC <dbl> …
## $ `coname__TIFFANY_&_CO` <dbl> …
## $ `coname__VANGUARD_CELLULAR_SYS_-CL_A` <dbl> …
## $ `coname__WENDY'S_INTERNATIONAL_INC` <dbl> …
## $ `gvkey__-Inf_5161` <dbl> …
## $ gvkey__5161_7362 <dbl> …
## $ gvkey__7362_11996 <dbl> …
## $ gvkey__11996_Inf <dbl> …
## $ `fyear__-Inf_1998.75` <dbl> …
## $ fyear__1998.75_2004.5 <dbl> …
## $ fyear__2004.5_2008.75 <dbl> …
## $ fyear__2008.75_Inf <dbl> …
## $ `co_per_rol__-Inf_12840.5` <dbl> …
## $ co_per_rol__12840.5_22071.5 <dbl> …
## $ co_per_rol__22071.5_28000.75 <dbl> …
## $ co_per_rol__28000.75_Inf <dbl> …
## $ exec_fullname__Albert_R._Pezzillo <dbl> …
## $ exec_fullname__Allen_L._Shiver <dbl> …
## $ exec_fullname__Christian_Wilhelm_Erich_Haub <dbl> …
## $ exec_fullname__David_B._Daviss <dbl> …
## $ exec_fullname__David_Thomas_Seaton <dbl> …
## $ `exec_fullname__Frank_J._O'Connell` <dbl> …
## $ exec_fullname__Gregory_Q._Brown <dbl> …
## $ exec_fullname__Haynes_Glenn_Griffin <dbl> …
## $ exec_fullname__James_M._Ringler <dbl> …
## $ exec_fullname__John_S._McFarlane <dbl> …
## $ `exec_fullname__Kerrii_B._Anderson,_CPA,_CPA` <dbl> …
## $ exec_fullname__Larry_D._Hunter <dbl> …
## $ exec_fullname__Leonard_A._Hadley <dbl> …
## $ exec_fullname__Michael_J._Kowalski <dbl> …
## $ `exec_fullname__Ronald_L._Kuehn,_Jr.` <dbl> …
## $ exec_fullname__Thomas_F._Bradley <dbl> …
## $ exec_fullname__Walter_W._Straub <dbl> …
## $ exec_fullname__Whitney_Lynn <dbl> …
## $ departure_code__5 <dbl> …
## $ departure_code__7 <dbl> …
## $ `interim_coceo__Co-CEO` <dbl> …
## $ `interim_coceo__CO-CEO` <dbl> …
## $ interim_coceo__Interim <dbl> …
## $ tenure_no_ceodb__1 <dbl> …
## $ tenure_no_ceodb__2 <dbl> …
## $ max_tenure_ceodb__1 <dbl> …
## $ max_tenure_ceodb__2 <dbl> …
## $ `fyear_gone__-Inf_2001` <dbl> …
## $ fyear_gone__2001_2004.5 <dbl> …
## $ fyear_gone__2004.5_2009.75 <dbl> …
## $ fyear_gone__2009.75_Inf <dbl> …
## $ still_there__01apr2021 <dbl> …
## $ still_there__01jul2021 <dbl> …
## $ still_there__12apr2020 <dbl> …
## $ still_there__12aug2020 <dbl> …
## $ still_there__12feb2020 <dbl> …
## $ still_there__12jul2020 <dbl> …
## $ still_there__12jun2020 <dbl> …
## $ still_there__12mar2020 <dbl> …
## $ still_there__12oct2020 <dbl> …
## $ still_there__14dec2020 <dbl> …
## $ `notes__Announced_today,_but_effective_January_4th,_2011,_Motorola,_Inc._will_change_its_name_to_Motorola_Solutions,_Inc._and_will_change_its_ticker_symbol_on_the_New_York_Stock_Exchange_from_MOT_to_MSI._Additionally,_they’ll_switch_over_to_a_brand_new_board_of_directors_(listed_below)_which_includes_election_of_Greg_Brown_to_the_“additional_role”_of_chairman_(effective_May_2011)_plus_Dave_Dorman’s_transition_to_lead_independent_director._UPDATE:_News_coming_in_from_one_of_our_partner_sites,_SlashPhone,_informs_us_that_indeed_Motorola_will_be_changing_it’s_name,_but_instead_of_it_being_one,_it’ll_be_two!_Starting_January_4th_2011,Motorola_will_split_into_Motorola_Solutions_Inc._and_Motorola_Mobility_Holdings,_Inc.,_the_latter_being_exclusively_for_their_mobile_matters._Said_co-CEOs_Greg_Brown_and_Sanjay_Jha_statement_regarding_this_matter:_“Today’s_announcement_marks_another_important_milestone_toward_the_upcoming_separation_that_is_expected_to_benefit_Motorola,_its_stockholders,_as_well_as_each_company’s_respective_customers_and_employees,_…_We_look_forward_to_taking_advantage_of_the_opportunities_before_us_as_we_begin_the_new_year_as_two_independent,_publicly_traded_companies.”_Brown_becomes_CEO_of_Motorola_Solutions_while_Jha_will_become_CEO_of_Motorola_Mobility.` <dbl> …
## $ `notes__Bakery_foods_producer_Flowers_Foods,_Inc._has_announced_that_the_company’s_Chief_Operating_Officer,_Ryals_McMullian,_has_been_promoted_to_the_role_of_President_and_Chief_Executive_Officer,_effective_as_of_the_company’s_2019_annual_meeting_of_shareholders._The_previous_President_and_CEO,_Allen_L._Shiver,_will_be_retiring_and_stepping_down_from_the_Board,_though_he_will_continue_to_serve_in_his_current_position_and_as_a_board_member_until_the_annual_meeting,_after_which_he_will_serve_as_a_non-executive_special_advisor_to_the_company_through_the_end_of_the_year.` <dbl> …
## $ `notes__Christian_Wilhelm_Erich_Haub_or_CH_is_and_has_been_a_member_of_the_Board_of_Directors_of_the_Company_(the_“Board”)_since_December_3,_1991,_has_served_as_Chairman_of_the_Board_since_May_1,_2001_and_has_served_as_Chair_of_the_Executive_Committee_of_the_Board_since_August_15,_2005._In_addition,_CH_served_as_Interim_President_and_Chief_Executive_Officer_of_the_Company_from_October_20,_2009_through_February_8,_2010,_Chief_Executive_Officer_of_the_Company_from_May_1,_1998_through_August_15,_2005_and_President_of_the_Company_from_December_7,_1993_through_February_24,_2002,_and_from_November_4,_2002_through_November_15,_2004.` <dbl> …
## $ `notes__Cumenal,_57,_who_had_run_the_company_since_April_2015,_is_being_succeeded_on_an_interim_basis_by_chairman_and_former_CEO_Michael_Kowalski,_Tiffany_said_on_Sunday_afternoon._The_shake-up_follows_the_departure_of_the_jeweler’s_top_designer_three_weeks_ago_and_weak_holiday_sales_that_sent_the_stock_tumbling._February_6,_2017,_Tiffany_&_Co._abruptly_replaced_Chief_Executive_Officer_Frederic_Cumenal_after_disappointing_financial_results,_just_hours_before_the_jewelry_chain_introduced_a_new_campaign_with_the_first_Super_Bowl_ad_in_its_history.` <dbl> …
## $ `notes__DAYTON,_Ohio_-_NCR_Corp._announced_in_an_Aug._1_news_release_that_William_Nuti,_the_president_and_chief_executive_of_Symbol_Technologies,_has_been_hired_to_replace_former_NCR_head_Mark_Hurd,_who_left_the_company_in_March_to_lead_Hewlett-Packard_Co._The_appointment_takes_effect_Aug._8._James_M._Ringler,_60,_who_has_been_serving_as_NCR's_board_chairman_and_interim_CEO_since_Hurd's_departure,_will_continue_as_the_company's_chairman.` <dbl> …
## $ `notes__DUBLIN,_Ohio--(BUSINESS_WIRE)--April_17,_2006--Wendy's_International,_Inc._(NYSE:WEN)_today_announced_that_the_Board_of_Directors_has_elected_Kerrii_B._Anderson_as_interim_Chief_Executive_Officer_and_President_of_the_Company_and_also_elected_long-time_Board_member_James_V._Pickett_as_its_Chairman,_effective_today._These_actions_followed_the_decision_of_Jack_Schuessler,_the_Company's_former_Chairman_and_CEO,_to_retire_from_Wendy's_after_more_than_30_years_with_the_organization._Kerrii_B._Anderson_is_the_former_chief_executive_officer_and_president_of_Wendy’s_International._She_joined_the_company_in_September_2000_as_executive_vice_president_and_chief_financial_officer._She_was_promoted_to_the_CEO_position_in_April_2006_and_left_upon_the_merger_of_Wendy’s_with_Triarc_Companies,_Inc._to_form_Wendy’s/Arby’s_Group_Inc._in_September_2008._She_was_a_member_of_the_company’s_board_of_directors_from_2001._September_15,_2008,_Triarc_Companies,_Inc._(NYSE:_TRY;_TRY.B),_the_parent_company_of_Arby’s_Restaurant_Group,_Inc._which_is_the_franchisor_of_the_Arby’s®_restaurant_system,_and_Wendy's_International,_Inc._(NYSE:_WEN),_announced_today_that_their_respective_shareholders_have_approved_all_proposals_related_to_the_pending_merger._Under_the_merger_agreement,_Wendy’s_shareholders_will_receive_4.25_shares_of_Triarc’s_Class_A_common_stock_for_each_share_of_Wendy’s_common_stock_that_they_own._In_addition,_each_outstanding_share_of_Triarc_Class_B_common_stock,_Series_1,_will_be_converted_into_one_share_of_Triarc_Class_A_common_stock,_resulting_in_a_post-merger_company_with_a_single_class_of_common_stock.` <dbl> …
## $ `notes__El_Paso_Corp._dipped_into_the_energy_well_and_named_Douglas_L._Foshee,_44,_the_new_CEO_on_Wednesday._Foshee,_former_CEO_of_Nuevo_Energy_Co.,_has_been_Halliburton’s_COO_since_last_March._Foshee,_also_elected_by_the_board_of_directors_as_president_and_a_director,_takes_the_reins_on_Sept._2._Because_of_the_election,_El_Paso_said_it_would_delay_the_release_of_its_long-range_planning_process_to_allow_Foshee_to_participate_in_the_plan’s_completion._Current_El_Paso_CEO_Ronald_L._Kuehn_Jr.,_who_will_continue_as_the_company’s_chairman,_has_served_as_interim_CEO_since_last_March,_when_long-time_chief_William_Wise_was_fired_(see_Daily_GPI,_March_13_)._Kuehn’s_tenure_has_been_tumultuous,_as_he_presided_over_an_ailing_company_and_a_proxy_fight_that_threatened_to_topple_the_board._However,_the_incumbent_board_survived,_and_the_company_is_continuing_its_work_to_restructure_its_operations.` <dbl> …
## $ `notes__FRANK_J._O'CONNELL,_has_been_Chairman_of_the_Board_of_the_Company_since_April_1997_and_has_been_the_Company's_Chief_Executive_Officer_and_President_since_August_1996._On_Nov_3,_1999,_American_Greetings_to_Buy_Gibson_Greetings_for_About_$163_Million_American_Greetings_expects_the_acquisition_to_generate_revenues_of_about_$225_million_and_an_annual_cost_savings_of_at_least_$50_million._In_March_2000_American_Greetings_won_a_long-sought-after_prize,_acquiring_Gibson_Greetings_for_$163_million_in_cash.From_1996_to_2000,_Mr._O’Connell_served_as_Chairman,_President_and_Chief_Executive_Officer_of_Gibson_Greetings,_Inc.` <dbl> …
## $ `notes__Gibson_Greetings_Fires_CEO:_Gibson_Greetings_Inc._said_Benjamin_J._Sottile_will_no_longer_head_the_Cincinnati-based_company._Albert_R._Pezzillo,_chairman_of_Gibson’s_executive_committee,_was_named_interim_chairman_and_CEO_while_the_company_searches_for_a_successor._GIBSON_GREETINGS_INC.,_Cincinnati,_named_Frank_O'Connell_president_and_chief_executive._Mr._O'Connell_succeeds_Albert_R._Pezzillo,_who_will_continue_as_chairman.` <dbl> …
## $ `notes__Haynes_Glenn_Griffin_founded_and_led_Vanguard_Cellular_Systems_from_commercial_launch_to_its_IPO_and_eventual_sale_in_1999_to_AT&T._Oct._6,_1998,_AT&T_Corp.,_agreed_to_buy_one_of_the_last_independent_cellular_telephone_companies,_Vanguard_Cellular_Systems_Inc.,_for_$900_million_in_stock_and_cash._Under_the_deal,_which_also_includes_$600_million_in_debt_that_AT&T_will_assume,_Vanguard_shareholders_will_have_the_option_to_exchange_each_share_for_either_$23_in_cash_or_0.3987_share_of_AT&T,_or_a_combination_of_the_two._The_offer_represents_a_cash_premium_of_nearly_16%_from_Vanguard's_closing_stock_price_Friday.` <dbl> …
## $ `notes__In_September_1996,_the_Company_entered_into_an_agreement_with_Mr._Lynn_pursuant_to_which_the_Company_would_employ_Mr._Lynn_as_Acting_President_and_Chief_Executive_Officer._Mr._Lynn_resigned_as_Acting_President_and_Chief_Executive_Officer_and_full-_time_employee_of_the_Company,_effective_April_1,_1997._Pursuant_to_a_Confidential_Termination_of_Employment_Agreement_and_General_Release,_dated_January_22,_1997.` <dbl> …
## $ `notes__IRVING,_Texas--(BUSINESS_WIRE)--Fluor_Corporation_(NYSE:_FLR)_announced_today_that_its_board_of_directors_has_confirmed_the_appointment_of_Carlos_M._Hernandez_as_chief_executive_officer_(CEO)_and_named_him_a_member_of_the_board_of_the_company._Hernandez_was_named_as_Fluor’s_interim_chief_executive_officer_on_May_1,_2019,_in_line_with_the_company’s_established_succession_plan_following_David_T._Seaton_stepping_down._The_board_of_directors_also_named_John_R._Reynolds_as_the_new_chief_legal_officer_of_Fluor.` <dbl> …
## $ `notes__Maytag_Corp._,_in_need_of_a_turnaround,_named_Ralph_F._Hake,_a_longtime_senior_executive_at_rival_Whirlpool_Corp._,_as_its_new_chairman_and_chief_executive._Mr._Hake's_appointment_follows_the_resignation_in_November_of_Lloyd_D._Ward._After_Mr._Ward's_departure,_he_was_succeeded_on_an_interim_basis_by_his_predecessor,_Leonard_A._Hadley.` <dbl> …
## $ `notes__Mr._Schmitt_resigned_as_our_Chief_Executive_Officer_and_President_on_December_6,_2007_and_was_replaced_by_John_S._McFarlane,_one_of_our_Directors,_on_an_interim_basis_until_Pedro_(Pete)_P._Rodriguez_became_our_Chief_Executive_Officer_and_President_on_April_28,_2008.` <dbl> …
## $ `notes__On_16_August_2004,_Enesco_Group_Inc._announced_that_previous_interim_CEO_Tom_Bradley\n_resigned_and_was_replaced_by_George_Ditomassi_7_who_was_succeeded_by\n_formal_CEO_Cynthia_Passmore-McLaughlin_on_11_January_2005_8.` <dbl> …
## $ `notes__On_June_3,_2009,_The_DIRECTV_Group,_Inc._(the_“Company”)_issued_a_press_release_announcing_that_the_Board_of_Directors_of_the_Company_(the_“Board”)_accepted_the_resignation_of_Chase_Carey_as_a_member_of_the_Board_and_President_and_Chief_Executive_Officer_effective_July_1,_2009._The_Board_has_formed_a_committee_of_directors_tasked_with_searching_for_a_new_President_and_Chief_Executive_Officer._In_the_interim,_the_Board_of_Directors_has_appointed_Larry_D._Hunter_as_Chief_Executive_Officer_effective_July_1,_2009_in_addition_to_his_current_responsibilities_of_Executive_Vice_President_of_Legal,_Human_Resources_and_Administration,_General_Counsel_and_Corporate_Secretary._A_copy_of_the_press_release_relating_to_such_announcement,_dated_June_3,_2009,_is_attached_hereto_as_Exhibit_99.1_and_is_incorporated_herein_by_reference._Michael_White_served_as_Chief_Executive_Officer_and_President_of_DIRECTV_since_January_1,_2010.` <dbl> …
## $ `notes__Restaurant_operator_Luby's_Inc._has_named_Christopher_J._Pappas_president_and_CEO_and_Harris_J._Pappas_as_chief_operating_officer._The_company_said_David_Daviss_resigned_as_acting_chief_executive_and_chairman._He'll_remain_a_member_of_the_board._Board_member_Robert_T._Herres_has_been_elected_to_the_chairman_post.` <dbl> …
## $ `notes__Walter_W._Straub,_63,_is_a_co-founder_of_Rainbow_Technologies,_Inc._He_was_Chief_Executive_Officer_and_President_of_Rainbow_from_1984_until_March_2004,_when_Rainbow_merged_with_SafeNet._SafeNet's_board_named_Walter_W._Straub_chairman_and_interim_CEO._Straub_has_been_a_SafeNet_board_member_since_2004._Rainbow_Technologies_merged_with_SafeNet_in_a_$457_million_deal._March_15,_2004--SafeNet_today_announced_it_has_completed_its_merger_with_Rainbow_Technologies,_Inc.,_which_had_been_announced_on_October_22,_2003.` <dbl> …
## $ `sources__https://acfr.aut.ac.nz/__data/assets/pdf_file/0018/120708/Xiaoxiao-Interim-CEO_He-and-Zhu.pdf` <dbl> …
## $ `sources__https://sec.report/Document/0000944868-09-000017/;https://www.crunchbase.com/person/michael-white-3;` <dbl> …
## $ `sources__https://sec.report/Document/0000950152-99-006214/;\n_https://www.thestreet.com/investing/american-greetings-to-buy-gibson-greetings-for-about-163-million-811667;\n_https://www.referenceforbusiness.com/history2/71/American-Greetings-Corporation.html;https://www.treehousefoods.com/who-we-are/board-of-directors/person-details/default.aspx?ItemId=9744ebeb-c1ed-492d-87c0-30e236935722;` <dbl> …
## $ `sources__https://webcache.googleusercontent.com/search?q=cache:6Xgw9BE8wJkJ:https://www.latimes.com/archives/la-xpm-1996-02-15-fi-36199-story.html+&cd=1&hl=en&ct=clnk&gl=ph_;_https://www.nytimes.com/1996/08/28/business/executive-changes-063525.html` <dbl> …
## $ `sources__https://www.atmmarketplace.com/news/bbreaking-ncr-names-new-ceo-president/` <dbl> …
## $ `sources__https://www.bizjournals.com/baltimore/stories/2006/10/16/daily18.html;https://www.businesswire.com/news/home/20040315005984/en/SafeNet-Inc.-Announces-Close-of-Merger-with-Rainbow-Technologies-Combination-Accelerates-Vision-to-Become-Premier-Security-Provider-Across-All-Product-Categories;_\n_https://www.businesswire.com/news/home/20061018005207/en/SafeNet-Announces-New-Executive-Appointments.;` <dbl> …
## $ `sources__https://www.bizjournals.com/houston/stories/2001/03/12/daily4.html` <dbl> …
## $ `sources__https://www.bloomberg.com/news/articles/2017-02-05/tiffany-ceo-cumenal-departs-with-kowalski-returning-in-interim;` <dbl> …
## $ `sources__https://www.businesswire.com/news/home/20060417005873/en/Wendys-International-Inc.-Elects-Kerrii-Anderson-as-Interim-CEO-and-President-and-Jim-Pickett-as-Chairman-Jack-Schuessler-is-Retiring;_\n_https://www.colelifechatscollection.com/2012/06/27/kerrianderson/;_https://www.businesswire.com/news/home/20080915006212/en/Triarc-and-Wendys-Shareholders-Approve-Merger;` <dbl> …
## $ `sources__https://www.businesswire.com/news/home/20190516006123/en/` <dbl> …
## $ `sources__https://www.crunchbase.com/person/haynes-g-griffin;_\n_https://www.wsj.com/articles/SB90758979430205500'` <dbl> …
## $ `sources__https://www.delimarketnews.com/flowers-foods-elects-ryals-mcmullian-ceo-effective-may-2019-ceo-allen-l-shiver-retire/maggie-mead/tue-02192019-1056/7299#:~:text=The%20previous%20President%20and%20CEO,the%20end%20of%20the%20year.` <dbl> …
## $ `sources__https://www.naturalgasintel.com/el-pasos-new-ceo-holds-strong-financial-energy-credentials-2/` <dbl> …
## $ `sources__https://www.sec.gov/Archives/edgar/data/43300/000095015711000132/sc13da.htm` <dbl> …
## $ `sources__https://www.sec.gov/Archives/edgar/data/753568/000119312508158893/d10ka.htm` <dbl> …
## $ `sources__https://www.sec.gov/Archives/edgar/data/853273/0001012870-97-001247.txt` <dbl> …
## $ `sources__https://www.slashgear.com/motorola-changes-name-announces-new-board-of-directors-01117072/` <dbl> …
## $ `sources__https://www.wsj.com/articles/SB992956574556071755` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/105668/000095015208007096/l33163ae8vk.htm\rhttps://www.sec.gov/Archives/edgar/data/105668/000095015208007532/l33325ae8vk.htm\rhttps://www.sec.gov/Archives/edgar/data/105668/000129993308004295/htm_28929.htm\rhttps://www.sec.gov/Archives/edgar/data/105668/000129993308001722/htm_26439.htm\rhttps://www.sec.gov/Archives/edgar/data/105668/000129993308001574/htm_26292.htm\rhttps://www.sec.gov/Archives/edgar/data/105668/000095015208005644/l32607ae8vk.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/1066107/000106610703000091/ep8k513.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903003568/h07129e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000079/ep8k42403.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000070/ep8k42203a.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000105/ep8k53003.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000066/ep8k4703.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000196/ep8k1118.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903006119/h11269e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000037/ep8k313.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903002029/h04911e8vk.htm\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000076/ep8k42203.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000159/ep8k716.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610704000023/ep8k2404.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000081/ep8k424a.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610704000003/ep8k010504.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610704000016/ep8k2204.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000051/ep8k328.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903006254/h11453e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000038/ep8k31303a.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000206/ep8k1208.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000185/ep8k1020.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000113/ep8k61903.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903006081/h11252e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610704000026/ep8ka2504.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000183/ep8k1016.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903006349/h11581e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000181/ep8k1010.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095013403006068/h04976e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610704000034/ep8k21704.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000085/ep8k424a.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903005828/h10847e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012904000066/h11707e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610704000007/ep8k11604.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095013403010050/h07426e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000034/ep8k31203.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000176/epgtm8k.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000108/ep8k6503a.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903003825/h07807e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000203/ep8k12403.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903002050/h04949e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903005099/h09826e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610704000005/ep8k11404.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000178/ep8k1006.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000087/ep8k43003.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610704000038/ep8k21704a.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000042/ep8k31703.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000106610703000048/ep8k32003.txt\rhttps://www.sec.gov/Archives/edgar/data/1066107/000095012903004744/h08629e8vk.txt` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/1465112/000146511210000008/dtv8k2010comp_021010.htm\rhttps://www.sec.gov/Archives/edgar/data/1465112/000146511210000026/malone_8k.htm\rhttps://www.sec.gov/Archives/edgar/data/1465112/000110465909066019/a09-33501_18k.htm\rhttps://www.sec.gov/Archives/edgar/data/1465112/000146511210000024/dtv8k_06012010.htm\rhttps://www.sec.gov/Archives/edgar/data/1465112/000146511210000002/directv8k_01042010.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/16099/000095012901001440/h84943e8-k.txt` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/43300/000095016209000450/ap8k_101509.htm\rhttps://www.sec.gov/Archives/edgar/data/43300/000004330010000024/f8kjuly152010.htm\rhttps://www.sec.gov/Archives/edgar/data/43300/000004330010000012/f8k32010macleod.txt\rhttps://www.sec.gov/Archives/edgar/data/43300/000004330009000017/f8ksept2009richards.txt\rhttps://www.sec.gov/Archives/edgar/data/43300/000004330010000015/f8k42010wisemankramer.txt\rhttps://www.sec.gov/Archives/edgar/data/43300/000095016210000029/ap8k_012710.htm\rhttps://www.sec.gov/Archives/edgar/data/43300/000095016209000439/ap8k_102009.htm\rhttps://www.sec.gov/Archives/edgar/data/43300/000095012310067573/c03733e8vk.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/63541/000095013101503207/d8k.txt\rhttps://www.sec.gov/Archives/edgar/data/63541/000095013101502347/d8k.txt\rhttps://www.sec.gov/Archives/edgar/data/63541/000095013101000607/0000950131-01-000607-0001.txt\rhttps://www.sec.gov/Archives/edgar/data/63541/000095013101501791/d8k.txt\rhttps://www.sec.gov/Archives/edgar/data/63541/000095013101500355/d8k.txt\rhttps://www.sec.gov/Archives/edgar/data/63541/000095013101501957/d8k.txt\rhttps://www.sec.gov/Archives/edgar/data/63541/000095013101502578/d8k.txt` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/68505/000119312511017574/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/68505/000110465910040738/a10-14754_18k.htm\rhttps://www.sec.gov/Archives/edgar/data/68505/000110465910042358/a10-14754_28k.htm\rhttps://www.sec.gov/Archives/edgar/data/68505/000110465910060618/a10-22005_18k.htm\rhttps://www.sec.gov/Archives/edgar/data/68505/000110465911001040/a11-1944_18k.htm\rhttps://www.sec.gov/Archives/edgar/data/68505/000119312511018893/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/68505/000119312511070135/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/68505/000119312511128276/d8k.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/70866/000119312505154950/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/70866/000119312506015213/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/70866/000119312505151193/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/70866/000119312505066497/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/70866/000119312505092524/d8k.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/717829/0000717829-96-000002.txt` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/717829/000090978999000014/0000909789-99-000014.txt\rhttps://www.sec.gov/Archives/edgar/data/717829/000090978999000010/0000909789-99-000010.txt\rhttps://www.sec.gov/Archives/edgar/data/717829/000095015299008722/0000950152-99-008722.txt\rhttps://www.sec.gov/Archives/edgar/data/717829/000090978999000021/0000909789-99-000021.txt` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/753568/000119312508087840/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/753568/000119312507262422/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/753568/000119312508051780/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/753568/000119312508015792/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/753568/000119312508183020/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/753568/000119312508113069/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/753568/000119312508004663/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/753568/000119312507269241/d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/753568/000119312507263992/d8k.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/771178/0000905870-98-000021.txt\rhttps://www.sec.gov/Archives/edgar/data/771178/0000905870-98-000022.txt\rhttps://www.sec.gov/Archives/edgar/data/771178/0000905870-98-000019.txt\rhttps://www.sec.gov/Archives/edgar/data/771178/0000905870-98-000016.txt` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/819706/000110465903023710/a03-4377_18k.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/853273/0001012870-96-000527.txt\rhttps://www.sec.gov/Archives/edgar/data/853273/0001012870-97-001265.txt\rhttps://www.sec.gov/Archives/edgar/data/853273/0001012870-96-000748.txt\rhttps://www.sec.gov/Archives/edgar/data/853273/0000898430-97-001982.txt\rhttps://www.sec.gov/Archives/edgar/data/853273/0001012870-97-001847.txt` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/93542/000095013704006573/c87515e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/93542/000115752304007859/a4703070.txt\rhttps://www.sec.gov/Archives/edgar/data/93542/000115752305000054/a4793466.txt\rhttps://www.sec.gov/Archives/edgar/data/93542/000095013704008150/c88460e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/93542/000115752304011335/a4781562.txt\rhttps://www.sec.gov/Archives/edgar/data/93542/000115752305000166/a4796906.txt\rhttps://www.sec.gov/Archives/edgar/data/93542/000095013404013748/c88217e8vk.txt\rhttps://www.sec.gov/Archives/edgar/data/93542/000115752304009662/a4746925.txt` <dbl> …
## $ `eight_ks__https://www.sec.gov/Archives/edgar/data/98246/000009824617000039/a8-k03062017.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000009824617000054/a8-k03162017.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000090342317000040/tiffany-8k_020517.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000009824617000189/a8k7122017.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000009824616000299/a8-k0913016.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000090342317000130/tiffany8ka-0217.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000009824617000042/a8-ka2x5x2017.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000009824617000153/a8k060117.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000009824617000199/a8-k07262017.htm\rhttps://www.sec.gov/Archives/edgar/data/98246/000090342317000126/tif-8k_0221.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/ix?doc=/Archives/edgar/data/1124198/000110465919056666/tm1921004-1_8k.htm\rhttps://www.sec.gov/Archives/edgar/data/1124198/000110465919032070/a19-10666_18k.htm\rhttps://www.sec.gov/ix?doc=/Archives/edgar/data/1124198/000141057819001398/tv529788_8k.htm\rhttps://www.sec.gov/ix?doc=/Archives/edgar/data/1124198/000141057819000803/tv527713_8k.htm\rhttps://www.sec.gov/Archives/edgar/data/1124198/000110465919027192/a19-9434_18k.htm\rhttps://www.sec.gov/Archives/edgar/data/1124198/000110465919013718/a19-5988_18k.htm\rhttps://www.sec.gov/Archives/edgar/data/1124198/000110465919026205/a19-9280_18k.htm\rhttps://www.sec.gov/ix?doc=/Archives/edgar/data/1124198/000141057819001216/tv529366_8k.htm\rhttps://www.sec.gov/ix?doc=/Archives/edgar/data/1124198/000141057819001259/tv529500_8k.htm\rhttps://www.sec.gov/Archives/edgar/data/1124198/000110465919030361/a19-10191_18k.htm\rhttps://www.sec.gov/ix?doc=/Archives/edgar/data/1124198/000141057819000704/tv526973_8k.htm` <dbl> …
## $ `eight_ks__https://www.sec.gov/ix?doc=/Archives/edgar/data/1128928/000119312519224546/d658208d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/1128928/000119312519044338/d704287d8k.htm\rhttps://www.sec.gov/Archives/edgar/data/1128928/000119312519159472/d737712d8k.htm` <dbl> …
## $ `cik__-Inf_76535` <dbl> …
## $ cik__76535_717829 <dbl> …
## $ cik__717829_844881.25 <dbl> …
## $ cik__844881.25_Inf <dbl> …
# step 2: data correlation
departure_correlation <- departure_binarized %>%
correlate(departure_code__7)
## Warning: Expected 2 pieces. Additional pieces discarded in 1 rows [89].
departure_correlation
## # A tibble: 128 × 3
## feature bin correlation
## <fct> <chr> <dbl>
## 1 coname "FLOWERS_FOODS_INC" -1
## 2 exec_fullname "Allen_L._Shiver" -1
## 3 departure_code "5" -1
## 4 departure_code "7" 1
## 5 notes "Bakery_foods_producer_Flowers_Foods,_Inc._has_an… -1
## 6 sources "https://www.delimarketnews.com/flowers-foods-ele… -1
## 7 eight_ks "https://www.sec.gov/ix?doc=/Archives/edgar/data/… -1
## 8 interim_coceo "Co-CEO" -0.542
## 9 co_per_rol "22071.5_28000.75" -0.454
## 10 interim_coceo "Interim" 0.454
## # ℹ 118 more rows
# step 3: plot
departure_correlation %>%
correlationfunnel::plot_correlation_funnel()
## Warning: ggrepel: 96 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps