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. :)
library(textrecipes)
## Warning: package 'textrecipes' was built under R version 4.4.2
## Loading required package: recipes
##
## Attaching package: 'recipes'
##
## The following object is masked from 'package:stringr':
##
## fixed
##
## The following object is masked from 'package:stats':
##
## step
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 %>%
# Clean the target
filter(!is.na(ceo_dismissal)) %>%
mutate(ceo_dismissal = if_else(ceo_dismissal == 1, "dismissed", "not dis")) %>%
mutate(ceo_dismissal = as.factor(ceo_dismissal)) %>%
# Remove variables with too many missing values
select(-c(interim_coceo, still_there, eight_ks)) %>%
# Remove irrelevant variables
select(-'_merge', -sources) %>%
# Remove variables that have info that only becomes relevant after the fact
select(-departure_code) %>%
# Remove redundant variables
select(-c(gvkey, cik, co_per_rol, leftofc, fyear)) %>%
# Remove duplicate in dismissal_dataset_id, the id variable
distinct(dismissal_dataset_id, .keep_all = TRUE) %>%
# Remove 2997 in fyear_gone
filter(fyear_gone < 2025) %>%
# Convert factors that are incorrectly imported numeric variables
mutate(across(c(tenure_no_ceodb, max_tenure_ceodb, fyear_gone), as.factor)) %>%
# Convert all character variables to factor
mutate(across(where(is.character), as.factor)) %>%
mutate(notes = as.character(notes))%>%
na.omit()
departure_clean %>% count(ceo_dismissal)
## # A tibble: 2 × 2
## ceo_dismissal n
## <fct> <int>
## 1 dismissed 1482
## 2 not dis 5976
departure_clean %>%
ggplot(aes(ceo_dismissal)) +
geom_bar()
ceo dismissal vs departure code
departure_clean %>%
ggplot(aes(ceo_dismissal, fyear_gone)) +
geom_count()
correlation plot
departures_clean <- departure_clean
# step 1: binarize
departure_binarized <- departures_clean %>%
select(-dismissal_dataset_id, -notes) %>%
binarize()
departure_binarized %>% glimpse()
## Rows: 7,458
## Columns: 40
## $ coname__BARRICK_GOLD_CORP <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `coname__-OTHER` <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ exec_fullname__John_W._Rowe <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `exec_fullname__-OTHER` <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ ceo_dismissal__dismissed <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, …
## $ ceo_dismissal__not_dis <dbl> 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, …
## $ tenure_no_ceodb__1 <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ tenure_no_ceodb__2 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `tenure_no_ceodb__-OTHER` <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ max_tenure_ceodb__1 <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ max_tenure_ceodb__2 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `max_tenure_ceodb__-OTHER` <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__1993 <dbl> 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, …
## $ fyear_gone__1994 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__1995 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, …
## $ fyear_gone__1996 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__1997 <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__1998 <dbl> 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__1999 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2000 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2001 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 1, …
## $ fyear_gone__2002 <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2003 <dbl> 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2004 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2005 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2006 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2007 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, …
## $ fyear_gone__2008 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2009 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2010 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2011 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2012 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2013 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2014 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2015 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2016 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2017 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2018 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2019 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `fyear_gone__-OTHER` <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
# step 2: data correlation
departure_correlation <- departure_binarized %>%
correlate(ceo_dismissal__dismissed)
departure_correlation
## # A tibble: 40 × 3
## feature bin correlation
## <fct> <chr> <dbl>
## 1 ceo_dismissal dismissed 1
## 2 ceo_dismissal not_dis -1
## 3 max_tenure_ceodb 1 0.0577
## 4 max_tenure_ceodb 2 -0.0533
## 5 fyear_gone 1999 -0.0390
## 6 fyear_gone 2002 0.0378
## 7 fyear_gone 2003 0.0303
## 8 fyear_gone 2009 0.0292
## 9 fyear_gone 2008 0.0261
## 10 fyear_gone 1997 -0.0255
## # ℹ 30 more rows
# step 3: plot
departure_correlation %>%
correlationfunnel::plot_correlation_funnel()
## Warning: ggrepel: 28 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps
library(tidymodels)
## Warning: package 'tidymodels' was built under R version 4.4.2
## ── Attaching packages ────────────────────────────────────── tidymodels 1.2.0 ──
## ✔ broom 1.0.6 ✔ rsample 1.2.1
## ✔ dials 1.3.0 ✔ tune 1.2.1
## ✔ infer 1.0.7 ✔ workflows 1.1.4
## ✔ modeldata 1.4.0 ✔ workflowsets 1.1.0
## ✔ parsnip 1.2.1 ✔ yardstick 1.3.2
## Warning: package 'dials' was built under R version 4.4.2
## Warning: package 'infer' was built under R version 4.4.2
## Warning: package 'modeldata' was built under R version 4.4.2
## Warning: package 'parsnip' was built under R version 4.4.2
## Warning: package 'tune' was built under R version 4.4.2
## Warning: package 'workflows' was built under R version 4.4.2
## Warning: package 'workflowsets' was built under R version 4.4.2
## Warning: package 'yardstick' was built under R version 4.4.2
## ── Conflicts ───────────────────────────────────────── tidymodels_conflicts() ──
## ✖ scales::discard() masks purrr::discard()
## ✖ dplyr::filter() masks stats::filter()
## ✖ recipes::fixed() masks stringr::fixed()
## ✖ dplyr::lag() masks stats::lag()
## ✖ yardstick::spec() masks readr::spec()
## ✖ recipes::step() masks stats::step()
## • Dig deeper into tidy modeling with R at https://www.tmwr.org
set.seed(1234)
departure_clean <- departure_clean %>% sample_n(100)
departure_split <- initial_split(departure_clean, strata = ceo_dismissal)
departure_train <- training(departure_split)
departure_test <- testing (departure_split)
departure_cv <- rsample::vfold_cv(departure_train, strata = ceo_dismissal)
departure_cv
## # 10-fold cross-validation using stratification
## # A tibble: 10 × 2
## splits id
## <list> <chr>
## 1 <split [66/8]> Fold01
## 2 <split [66/8]> Fold02
## 3 <split [66/8]> Fold03
## 4 <split [66/8]> Fold04
## 5 <split [67/7]> Fold05
## 6 <split [67/7]> Fold06
## 7 <split [67/7]> Fold07
## 8 <split [67/7]> Fold08
## 9 <split [67/7]> Fold09
## 10 <split [67/7]> Fold10
library(themis)
## Warning: package 'themis' was built under R version 4.4.3
xgboost_rec <- recipes::recipe(ceo_dismissal ~ ., data = departure_train) %>%
update_role(dismissal_dataset_id, new_role = "ID") %>%
step_other(coname, threshold = 3) %>%
step_tokenize(exec_fullname) %>%
step_tokenfilter(exec_fullname, max_tokens = 100) %>%
step_tf(exec_fullname) %>%
step_dummy(all_nominal_predictors()) %>%
step_smote(ceo_dismissal)
xgboost_rec %>% prep() %>% juice() %>% glimpse()
## Rows: 128
## Columns: 214
## $ dismissal_dataset_id <dbl> …
## $ ceo_dismissal <fct> …
## $ tf_exec_fullname_a <dbl> …
## $ tf_exec_fullname_adams <dbl> …
## $ tf_exec_fullname_allen <dbl> …
## $ tf_exec_fullname_aubrey <dbl> …
## $ tf_exec_fullname_ayalon <dbl> …
## $ tf_exec_fullname_b <dbl> …
## $ tf_exec_fullname_bernard <dbl> …
## $ tf_exec_fullname_bottoms <dbl> …
## $ tf_exec_fullname_bracken <dbl> …
## $ tf_exec_fullname_breen <dbl> …
## $ tf_exec_fullname_brock <dbl> …
## $ tf_exec_fullname_c <dbl> …
## $ tf_exec_fullname_cadwell <dbl> …
## $ tf_exec_fullname_cantwell <dbl> …
## $ tf_exec_fullname_cherkasky <dbl> …
## $ tf_exec_fullname_christopher <dbl> …
## $ tf_exec_fullname_cook <dbl> …
## $ tf_exec_fullname_crowe <dbl> …
## $ tf_exec_fullname_d <dbl> …
## $ tf_exec_fullname_daniel <dbl> …
## $ tf_exec_fullname_david <dbl> …
## $ tf_exec_fullname_dennis <dbl> …
## $ tf_exec_fullname_derrill <dbl> …
## $ tf_exec_fullname_dimicco <dbl> …
## $ tf_exec_fullname_dion <dbl> …
## $ tf_exec_fullname_donahue <dbl> …
## $ tf_exec_fullname_drue <dbl> …
## $ tf_exec_fullname_e <dbl> …
## $ tf_exec_fullname_edward <dbl> …
## $ tf_exec_fullname_eliyahu <dbl> …
## $ tf_exec_fullname_ershel <dbl> …
## $ tf_exec_fullname_evans <dbl> …
## $ tf_exec_fullname_f <dbl> …
## $ tf_exec_fullname_ferguson <dbl> …
## $ tf_exec_fullname_fong <dbl> …
## $ tf_exec_fullname_franklin <dbl> …
## $ tf_exec_fullname_fricks <dbl> …
## $ tf_exec_fullname_furlong <dbl> …
## $ tf_exec_fullname_g <dbl> …
## $ tf_exec_fullname_george <dbl> …
## $ tf_exec_fullname_gerlach <dbl> …
## $ tf_exec_fullname_glatfelter <dbl> …
## $ tf_exec_fullname_gordon <dbl> …
## $ tf_exec_fullname_grass <dbl> …
## $ tf_exec_fullname_griffin <dbl> …
## $ tf_exec_fullname_h <dbl> …
## $ tf_exec_fullname_hackett <dbl> …
## $ tf_exec_fullname_harding <dbl> …
## $ tf_exec_fullname_henry <dbl> …
## $ tf_exec_fullname_herbert <dbl> …
## $ tf_exec_fullname_hernandez <dbl> …
## $ tf_exec_fullname_herzer <dbl> …
## $ tf_exec_fullname_hill <dbl> …
## $ tf_exec_fullname_ii <dbl> …
## $ tf_exec_fullname_j <dbl> …
## $ tf_exec_fullname_james <dbl> …
## $ tf_exec_fullname_jeffrey <dbl> …
## $ tf_exec_fullname_jeffries <dbl> …
## $ tf_exec_fullname_jennings <dbl> …
## $ tf_exec_fullname_john <dbl> …
## $ tf_exec_fullname_joseph <dbl> …
## $ tf_exec_fullname_jr <dbl> …
## $ tf_exec_fullname_k <dbl> …
## $ tf_exec_fullname_kelleher <dbl> …
## $ tf_exec_fullname_kempton <dbl> …
## $ tf_exec_fullname_kight <dbl> …
## $ tf_exec_fullname_knowles <dbl> …
## $ tf_exec_fullname_kornelis <dbl> …
## $ tf_exec_fullname_krasny <dbl> …
## $ tf_exec_fullname_l <dbl> …
## $ tf_exec_fullname_lanciano <dbl> …
## $ tf_exec_fullname_latiolais <dbl> …
## $ tf_exec_fullname_lavelle <dbl> …
## $ tf_exec_fullname_lester <dbl> …
## $ tf_exec_fullname_lilienthal <dbl> …
## $ tf_exec_fullname_loeb <dbl> …
## $ tf_exec_fullname_louis <dbl> …
## $ tf_exec_fullname_m <dbl> …
## $ tf_exec_fullname_m.d <dbl> …
## $ tf_exec_fullname_mark <dbl> …
## $ tf_exec_fullname_martin <dbl> …
## $ tf_exec_fullname_marvin <dbl> …
## $ tf_exec_fullname_mccord <dbl> …
## $ tf_exec_fullname_mccracken <dbl> …
## $ tf_exec_fullname_mcmillan <dbl> …
## $ tf_exec_fullname_michael <dbl> …
## $ tf_exec_fullname_p <dbl> …
## $ tf_exec_fullname_patrick <dbl> …
## $ tf_exec_fullname_peter <dbl> …
## $ tf_exec_fullname_philip <dbl> …
## $ tf_exec_fullname_r <dbl> …
## $ tf_exec_fullname_richard <dbl> …
## $ tf_exec_fullname_robert <dbl> …
## $ tf_exec_fullname_ronald <dbl> …
## $ tf_exec_fullname_s <dbl> …
## $ tf_exec_fullname_stephen <dbl> …
## $ tf_exec_fullname_thomas <dbl> …
## $ tf_exec_fullname_w <dbl> …
## $ tf_exec_fullname_william <dbl> …
## $ tf_exec_fullname_wright <dbl> …
## $ coname_other <dbl> …
## $ tenure_no_ceodb_X2 <dbl> …
## $ tenure_no_ceodb_X3 <dbl> …
## $ max_tenure_ceodb_X2 <dbl> …
## $ max_tenure_ceodb_X3 <dbl> …
## $ max_tenure_ceodb_X4 <dbl> …
## $ fyear_gone_X1988 <dbl> …
## $ fyear_gone_X1990 <dbl> …
## $ fyear_gone_X1991 <dbl> …
## $ fyear_gone_X1992 <dbl> …
## $ fyear_gone_X1993 <dbl> …
## $ fyear_gone_X1994 <dbl> …
## $ fyear_gone_X1995 <dbl> …
## $ fyear_gone_X1996 <dbl> …
## $ fyear_gone_X1997 <dbl> …
## $ fyear_gone_X1998 <dbl> …
## $ fyear_gone_X1999 <dbl> …
## $ fyear_gone_X2000 <dbl> …
## $ fyear_gone_X2001 <dbl> …
## $ fyear_gone_X2002 <dbl> …
## $ fyear_gone_X2003 <dbl> …
## $ fyear_gone_X2004 <dbl> …
## $ fyear_gone_X2005 <dbl> …
## $ fyear_gone_X2006 <dbl> …
## $ fyear_gone_X2007 <dbl> …
## $ fyear_gone_X2008 <dbl> …
## $ fyear_gone_X2009 <dbl> …
## $ fyear_gone_X2010 <dbl> …
## $ fyear_gone_X2011 <dbl> …
## $ fyear_gone_X2012 <dbl> …
## $ fyear_gone_X2013 <dbl> …
## $ fyear_gone_X2014 <dbl> …
## $ fyear_gone_X2015 <dbl> …
## $ fyear_gone_X2016 <dbl> …
## $ fyear_gone_X2017 <dbl> …
## $ fyear_gone_X2018 <dbl> …
## $ fyear_gone_X2019 <dbl> …
## $ fyear_gone_X2020 <dbl> …
## $ fyear_gone_X2021 <dbl> …
## $ notes_After.serving.as.the.Chairman.and.Chief.Executive.Officer.from.1983.until.May.2002..Richard.Herzer.retired.as.CEO..The.Company.went.public.in.1991..and.since.then.the.chain.has.grown.from.less.than.500.to.over.1.100.restaurants.and.annual.system.wide.sales.have.more.than.tripled.from..413.million.to.over..1.4.billion.in.2002..After.retred.as.CEO..he.remained.as.Chairman.of.the.Board.until.2003.before.retiring.from.that.position.as.well..He.was.71. <dbl> …
## $ notes_Apollo.Global.Management.announced.on.Monday.it.will.acquire.Shutterfly.and.Snapfish..creating.a.more.formidable.player.in.online.photo.services..The.private.equity.firm.has.agreed.to.buy.Shutterfly.for..2.7bn..including..900m.in.debt..Apollo.will.pay..51.a.share.in.cash..representing.a.31.per.cent.premium.over.the.company.s.share.price.on.April.23..when.it.was.first.reported.that.Apollo.was.considering.a.bid..The.transaction.is.expected.to.close.by.early.fourth.quarter.of.2019......Shutterfly.also.said.Monday.it.appointed.Ryan.O.Hara.as.president.and.chief.executive..replacing.Christopher.North..who.previously.announced.plans.to.leave.the.company.in.August.to.return.to.the.UK.with.his.family..Mr.O.Hara.will.join.Shutterfly.from.Move.Inc..a.property.website.company.owned.by.News.Corp..where.he.has.been.chief.executive.since.2015. <dbl> …
## $ notes_April.23..1996..Cisco.Systems.Inc..said.today.that.it.had.agreed.to.acquire.Stratacom.Inc..in.a.stock.swap.valued.at.about..4.billion..The.deal.will.create.a.networking.giant.whose.technologies.and.customer.base.will.spread.across.many.diverse.market.segments. <dbl> …
## $ notes_Bernard.M..Gordon.is.the.founder..past.chairman.and.CEO.of.Analogic.Corporation.and.Chairman.Emeritus.of.the.Board.of.Analogic..He.holds.more.than.200.patents.worldwide...This.person.is.the.founder.and.stayed.on.the.board.for.a.long.time.after.he.stepped.down.at.about.70..There.was.not.a.lot.of.coverage.around.the.time..Bernard.M..Gordon.has.been.the.Chairman.of.the.Board.of.Directors.of.the.Company.since.1969..was.President.from.1980.to.1995.and.Chief.Executive.Officer.from.1995.to.February.2001.and.was.designated.Executive.Chairman.of.the.Operating.Committee.in.October.2001. <dbl> …
## $ notes_Boothby.succeeds.David.A..Trice..who.retired.as.CEO.at.the.company.s.annual.meeting..Trice.was.re.elected.as.a.director.and.will.serve.a.one.year.term.as.non.executive.chairman. <dbl> …
## $ notes_BRENCO..INCORPORATED..July.29..1996..Dear.Shareholder...You.are.cordially.invited.to.attend.a.Special.Meeting.of.Shareholders.of.Brenco..Incorporated..the..Company...to.be.held.on.August.23..1996.as.set.forth.in.the.attached.Notice.of.Special.Meeting.of.Shareholders..At.this.meeting.you.will.be.asked.to.consider.and.vote.upon.the.approval.and.adoption.of.a.Plan.of.Merger.dated.as.of.July.26..1996..pursuant.to.which.BAS..Inc....Purchaser....a.Virginia.corporation.and.a.whollyowned.subsidiary.of.Varlen.Corporation..a.Delaware.corporation...Varlen....will.be.merged.with.and.into.the.Company.with.the.Company.as.the.surviving.corporation..This.action.is.proposed.in.accordance.with.the.terms.of.the.Acquisition.Agreement.dated.June.15..1996..among.Purchaser..Varlen.and.the.Company..the..Merger.Agreement....Details.of.the.proposed.merger.and.other.important.information.are.contained..in.the.accompanying.Proxy.Statement..The.merger.is.the.second.and.final.step.in.the.acquisition.of.the.Company.by.Varlen.and.Purchaser.pursuant.to.the.terms.of.the.Merger..Agreement..The.first.step.provided.for.in.the.Merger.Agreement.was.a.tender.offer.by.Purchaser.for.all.the.outstanding.shares.of.the.Common.Stock..par.value..1.00.per.share.of.the.Company..the..Shares....Upon.expiration.of.the.tender.offer.on.July.18..1996..Purchaser.purchased.9.339.986.Shares..approximately.91.5..of.the.outstanding.Shares..for..16.125.in.cash.per.Share...In.the.merger..the.Company.s.remaining.shareholders..other.than.Varlen..Purchaser.or.any.direct.or.indirect.subsidiary.of.Varlen.or.Purchaser..will.receive.the.same.consideration.paid.in.the.tender.offer...16.125.in.cash..without.any.interest..for.each.Share.owned..and.thereafter.they.will.have.no.equity.interest.in.the.Company. <dbl> …
## $ notes_C..THOMAS.THOMPSON.has.served.as.a.director.of.the.Company.since..November.1996.and.served.as.Vice.Chairman.of.the.Board.of.Directors.from.December.1996.to.September.1999..He.also.served.as.Chief.Executive.Officer.of.the.Company.from.December.1996.to.November.1997...Thompson.is.a.rep.from.a.buyout.company.that.took.control.of.management...He.stayed.in.California.and.was.gone.soon.after..He.left.when.Rally.s.burgers.bought.a.huge.stake.that.was.controlled.by.CKE..This.is.more.like.a.completed.plan <dbl> …
## $ notes_CAMP.HILL..PA...October.18..1999....Rite.Aid.Corporation..NYSE.RAD..PSE..today.announced.that.Martin.L..Grass..45..has.resigned.as.Chairman..CEO.and.as.a.director..Timothy.J..Noonan..57..the.Company.s.current.president.and.COO..has.been.appointed.interim.CEO....hanged.to.3..Interim.came.in.and.the.outgoing.CEO.moved.immediately <dbl> …
## $ notes_Chairman.stepped.in.to.run.company.for.a.little.bit <dbl> …
## $ notes_Cincinnati.Gas...Electric.Co..shareholders.Tuesday.overwhelmingly.approved.a.plan.to.merge.the.company.with.PSI.Resources.Inc..to.form.the.CINergy.Corp..CG.E.said.final.results.showed.97.percent..or.75.million..of.shares.voted.favored.the.merger. <dbl> …
## $ notes_CNA.Financial.Corporationannounced.a.senior.leadership.succession.plan..Upon.Stephen.W..Lilienthal.s.retirement..effective.June.8..2009..Thomas.F..Motamed.will.succeed.Mr..Lilienthal.as.chairman.and.chief.executive.officer.of.CNA.Financial.Corporation. <dbl> …
## $ notes_Cracker.Barrel.Old.Country.Store.Inc...said.Sandra.Cochran..president.and.chief.operating.officer..will.take.over.as.CEO.effective.Sept..12..Michael.Woodhouse..currently.chairman.and.chief.executive..will.become.executive.chairman....Woodhouse.steps.down.as.CEO.after.a.tenure.with.a.decline.in.performance.where.customer.traffic.declined.15...It.was.noted.that.Mr..Woodhouse.whilst.CEO.spent.over..600.million.in.capital.over.the.past.7.years.as.CEO.and.there.still.was.a.profit.decline. <dbl> …
## $ notes_Crowe.stepped.down.voluntarily.resulting.from.a.family.tragedy..where.he.stated.his.reasons.to.spending.more.time.with.his.family. <dbl> …
## $ notes_Director..President..and.Chief.Executive.Officer.since.August.1995..Prior.to.this..Mr..Cadwell.served.as.Director..President..and.Chief.Operating.Officer..May.1995...August.1995.President.and.Chief.Operating.Officer..March.1995...May.1995..Executive.Vice.President.and.Chief.Operating.Officer.of.SMS.Europe..October.1993...March.1995..Mr..Cadwell.originally.joined.the.Company.in.1975. <dbl> …
## $ notes_Donahue.L..Wildman.founded.Health...Tennis.Corporation.of.America..By.1993..he.retired.from.running.Bally.s..the.company.that.had.bought.him.out.a.decade.before..In.1994..Don.sold.his.company.to.Bally..He.retired.at.the.age.of.61... <dbl> …
## $ notes_Dr..Wilmer.R..Bottoms.has.served.as.Chief.Executive.Officer.since.June.1996.and.as.Chairman.of.the.Board.of.Directors.since.July..1991.and.as.a.member.of.the.Board.of.Directors.of.the.Company.since.1985..His.employment.with.Credence.Systems.Corpwas.terminated.on.December.8..1998. <dbl> …
## $ notes_Edward.Breen.got.a.nifty.golden.parachute.when.he.stepped.down.as.CEO.of.industrial.conglomerate.Tyco.in.September..with.compensation..retirement.pay..stock.and.other.exit.goodies.valued.at.more.than..150.million..The.company.said.that.Mr..Breen.would.stay.on.as.Tyco.chairman. <dbl> …
## $ notes_Edward.R..McCracken.announced.today.that.he.will.resign.as.chief.executive.but.will.continue.in.the.CEO.role.until.his.successor.is.named..He.intends.to.remain.the.company.s.board.chairman.even.after.his.replacement.is.selected..Coverage.was.pretty.complimentary <dbl> …
## $ notes_Effective.May.23..2001..Mr..Krasny.resigned..thereby.terminating.his.employment.with.the.Company..and.presently.serves.the.Company.solely.in.the.capacity.of.a.director <dbl> …
## $ notes_Glatfelter..NYSE..GLT..today.announced.that.Chairman.of.the.Board.George.H..Glatfelter.II.has.informed.the.Board.of.Directors.of.his.intent.to.resign.as.Chairman..effective.at.the.company.s.2011.Annual.Meeting.of.Shareholders.on.May.4..2011.and.that.he.will.not.stand.for.re.election.to.the.Board.in.May..This.action.is.part.of.the.company.s.previously.announced.leadership.succession.plan.......Mr..Glatfelter..who.has.been.Chairman.since.2000.and.CEO.since.1998..remained.on.the.company.s.Board.of.Directors.as.its.Non.Executive.Chairman.for.a.brief.transitional.period..after.which.time.a.new.Chairman.was.elected..Dante.C..Parrini..the.company.s.Executive.Vice.President.and.COO..was.promoted.to.President.and.CEO.concurrent.with.Mr..Glatfelter.s.retirement. <dbl> …
## $ notes_Gordon.R..Parker..was.Chairman.of.Newmont.Mining.Corporation.from.1986.until.his.retirement.in.1994..He.was.Chief.Executive.Officer.from.1985.until.1993. <dbl> …
## $ notes_Hackett.served.as.President.and.Chief.Operating.Officer.of.Devon.Energy.Corporation..following.its.merger.with.Ocean.Energy..where.he.had.served.as.Chairman..President..and.Chief.Executive.Officer..Mr..Hackett.has.also.held.senior.positions.at.Seagull..Duke.Energy..and.Pan.Energy....February.24..2003..Devon.Energy.Corporation.and.Ocean.Energy..Inc..announced.today.that.the.two.companies.have.agreed.to.merge....The.merged.company.will.be.named.Devon.Energy.Corporation.and.will.be.headquartered.in.Oklahoma.City..Devon.will.become.the.largest.U.S..based.independent.oil.and.natural.gas.producer.with.production.of.approximately.650.000.equivalent.barrels.of.oil.per.day..and.upon.completion.of.the.merger..will.have.an.enterprise.value.of.approximately..20.billion. <dbl> …
## $ notes_Hanneman.s.promotion.is.part.of.the.company.s.planned.management.transition..anticipating.chairman.and.chief.executive.officer.Phil.Dion.s.retirement.in.November.1999..Dion.will.retain.his.position.as.chairman.of.the.board.for.two.years.after.his.retirement. <dbl> …
## $ notes_He.did.go.on.to.work.in.real.estate.at.another.company..Savills.Studley...He.was.only.CEO.for.23.months.or.so.before.he.ended.up.becoming.vice.chairman.and.then.eventually.leaving.within.12.months.of.taking.that.role..Investigative.reporting.suggests.that.the.firm.created.a.power.struggle.between.DeMarco.and.Rudin..which.Rudin.lost..The.performance.he.put.up.was..improving..but.DeMarco.edged.him.out.of.the.slot.and.put.himself.in..This.was.involuntary.and.would.at.least.be.probably.better.justified.as.performance.related.rather.than.behavioral. <dbl> …
## $ notes_He.left.quickly..he.was.in.office.less.than.a.year..El.Pso.did.not.give.a.reason.for.the.departure..He.threw.the.board.a.loop.to.find.a.replacement.so.this.was.a.strange.sitution..It.does.not.suggest.a.good.turnover..One.article.remarked...If.Redd.left.to.pursue.other.opportunites..they.don.t.seem.immenient. <dbl> …
## $ notes_Hernandez.has.workplace.problems.at.a.prior.company..This.observation.is.the.acquisition.by.fiserv.in.2013 <dbl> …
## $ notes_Houston.based.United.Meridian.Corp..will.merge.with.a.Louisiana.energy.company.to.form.the.ninth.largest.independent.oil.and.gas.company..United.Meridian.and.Baton.Rouge.based.Ocean.Energy.Inc..will.be.headquartered.in.Houston.and.will.be.named.Ocean.Energy.Inc.....The.new.oil.and.gas.exploration.and.production.company.will.have.a.pro.forma.total.market.capitalization.of..3.1.billion..The.two.merging.companies.combined.currently.produce.58.000.barrels.of.oil.daily.and.350.million.cubic.feet.of.gas..for.a.total.proved.reserve.base.of.250.million.barrels.of.oil.equivalent.....John.B..Brock..chairman.and.chief.executive.officer.of.UMC..will.become.chairman.of.the.combined.company..and.James.C..Flores..chairman..president.and.CEO.of.Ocean.Energy..will.be.president. <dbl> …
## $ notes_In.1969..David.S..Loeb.co.founded.Countrywide.Credit.Industries..now.Countrywide.Financial.Corporation..with.Angelo.Mozilo..CFC.s.current.Chairman..Mr..Loeb.served.as.Countrywide.s.President.and.Chairman.from.March.of.1969.through.February.of.2000..He.was.simply.the.president.of.the.company.till.1998.1999.when.Mozillo.took.over..The.split.was.amicable.and.Loeb.stayed.around..Eventually..the.two.had.a.falling.out..Loeb.sold.all.his.shares.one.day.and.quit..leaving.Mozzillo.in.charge..Mr.Loeb.was.succeeded.at.countrywide.by.his.co.founder.mozillo.and.remained.chairman.till.his.death.in.2003.... <dbl> …
## $ notes_In.this.new.role..Holmes.will.succeed.Pamela.H..Patsley..who.will.retire.from.the.MoneyGram.Board..completing.a.planned.leadership.transition.that.was.first.announced.in.July.2015.......Pamela.Patsley.stepped.down.as.CEO.as.part.of.planned.transition..The.leadership.change.happened.as.the.company.posted.better.results.in.Q2.of.2015.and.was.improving.its.overseas.business. <dbl> …
## $ notes_Information.on.this.is.scarce...one.article.shows.that.he.was.retiring <dbl> …
## $ notes_John.B..Gerlach..longtime.president.of.Lancaster.Colony.Corp..and.its.chairman.and.CEO.since.1994..has.died.following.a.brief.illness. <dbl> …
## $ notes_John.W..Rollins.CEO.of.Rollins.Truck.Leasing.Corp...he.served.for.decades.as.president.and.CEO.before.retiring.in.2001. <dbl> …
## $ notes_Kansas.City.Power...Light.Co..announced.that.CEO.and.Chairman.Drue.Jennings.will.step.down.as.head.of.the.company......Bernard.Beaudoin..currently.president.of.KCP.L..will.take.over.as.CEO..effective.Jan..1..Jennings.will.remain.chairman.of.the.electric.utility.until.the.company.s.shareholders..meeting.on.May.1..when.he.will.retire.from.KCP.L...hanged.to.3...He.took.the.company.into.deregulater.power.and.annoucnced.at.the.time.that.he.was.going.to.delay.his.hand.off..There.was.a.change.of.palns.followed.by.a.swift.turnover.and.his.quick.departure.from.the.company <dbl> …
## $ notes_Kempton.is.the.retired.Chairman.of.the.Board.and.Chief.Executive.Officer.of.Kysor.Industrial.Corporation..February.4..1997..Scotsman.Industries.said.yesterday.that.it.would.buy.the.Kysor.Industrial.Corporation.for.about..300.million.in.cash.and.the.assumption.of.about..30.million.in.Kysor.debt..In.March.7..1997..Scotsman.acquired.Kysor.Industrial.Corporation. <dbl> …
## $ notes_KOCH.is.succeeding.STEPHEN.STROME..who.is.retiring.after.nearly.30.years.with.the.company..of.which.the.last.16.were.as.CEO..STROME.will.will.continue.to.consult.the.company..assist.in.accelerating.its.plan.of.returning.to.profitability. <dbl> …
## $ notes_Many.Teen.reatailers.struggled.to.grow.and.maintain.revenue..Abercombie.was.one.of.them.and.Jeffries.decided.to.step.down...though..voluntary...it.s.obivous.that.a.new.strategy.and.approach.was.necessary.for.the.company. <dbl> …
## $ notes_Marshall...Ilsley.Corp..was.wholly.acquired.by.the.Bank.of.Montreal.in.a..4.1.billion.all.stock.buy.out.which.finalized.on.the.day.Mr..Furlong.left.office.as.C.E.O..of.the.former. <dbl> …
## $ notes_Martin.is.credited.with.grooming.Louisville.based.Storage.Technology.Corp..for.its..4.1.billion.sale.to.San.Jose.based.Sun.Microsystems.Inc..Although.Martin.retired.after.the.completion.of.the.Sun.StorageTek.merger.in.August..the.leadership.and.business.savvy.that.he.demonstrated.in.guiding.the.company.s.growth.and.eventual.sale.prompted.the.DBJ.to.name.him..CEO.of.the.Year..for.2005. <dbl> …
## $ notes_Michael.G..Cherkasky.has.been.Chief.Executive.Officer.of.Kroll.since.May.15..2001..Previously..Mr..Cherkasky.had.been.President.and.Chief.Operating.Officer.of.Kroll.s.Investigations.and.Intelligence.Group.since.December.1997..Prior.to.the.merger.of.Kroll.Holdings..Inc..and.The.O.Gara.Company.in.December.1997..he.had.been.an.Executive.Managing.Director.of.Kroll.Associates..Inc...a.subsidiary.of.Kroll.Holdings..since.April.1997.and.Chief.Operating.Officer.of.Kroll.Holdings.since.January.1997..From.November.1995.to.January.1997..he.was.the.head.of.Kroll.Associates..North.American.Region.and.from.February.1994.to.November.1995.he.was.the.head.of.Kroll.Associates..Monitoring.Group..From.June.1993.to.November.1993..Mr..Cherkasky.was.a.candidate.for.public.office..From.1978.to.June.1993..Mr..Cherkasky.was.with.the.District.Attorney.s.office.for.New.York.County..his.last.position.being.Chief.of.the.Investigation.Division..He.has.been.a.director.of.Kroll.since.December.1997..Age.53..Kroll.was.bought.by.Marsh.and.McLennan.in.2004.when.it.became.private..It.got.tossed.around.for.several.years.afterwards <dbl> …
## $ notes_Montgomery.F..Moran..a.co.chief.executive.who.has.long.presided.over.the.company.s.operations..will.step.down.early.next.year..the.company.announced.Monday.morning..It.also.said.it.would.be.changing.the.board.....Chipotle.s.third.quarter.earnings..released.Oct..24..disappointed.Wall.Street..Adjusted.earnings.per.share.were..1.33.cents.on.revenues.of..1.13.billion..below.the..1.63.on.revenue.of..1.14.billion..which.Thomson.Reuters.I.B.E.S.had.forecast....Investors.have.criticized.Chipotle.s.co.CEO.structure..saying.the.company.spends.too.much.on.executive.compensation..Total.pay.for.co.CEOs.Monty.Moran.and.Mr..Ells.last.year.totaled..13.3.million.and..13.6.million..respectively...Chipotle.Mexican.Grill..NYSE..CMG..announced.that.its.Board.of.Directors.has.named.company.Founder.Steve.Ells.the.company.s.sole.Chief.Executive.Officer..Ells.will.also.remain.Chairman.of.Chipotle.s.board..Monty.Moran.has.stepped.down.from.the.co.CEO.role.and.from.his.board.seat.effective.immediately..and.will.retire.from.Chipotle.in.2017. <dbl> …
## $ notes_Mr..Adams.resigned.as.C.E.O..of.Tronox..Inc..on.5.Sep..2008.according.to.the.In.Re..Tronox..Inc...Securities.Litigation.Consolidated.Class.Action.Complaint.For.Violations.of.the.Federal.Securities.Laws..reference.Civil.Action.no..09.cv.06220.SAS.of.the.U.S..District.Court...Southern.District.of.New.York...However..the.date.listed.in.the.row.is.incorrect.in.that.it.mistakenly.assumes.Mr..Adams.s.departure.to.be.more.than.a.month.earlier..Furthermore..Tronox..Ltd..was.formed.the.aftermath.of.the.disintegration.of.Tronox..Inc..Individual.members.of.Tronox..Inc..and.co..were.accused.of.committing.accounting.fraud.in.the.period.after.Kerr.McGee.Corporation.unloaded.its.Legacy.Liabilities.onto.Tronox..Inc..in.their.2006.separation.agreement..Through.his.signing.off.on.multiple.fraudulent.accounting.control.documents..Mr..Adam.was.alleged.to.be.complicit.in.said.scheme..Surely.Mr..Adams.had.seen.the.writing.on.the.wall..for.he.left.mere.months.before.the.company.could.no.longer.shoulder.its.burden..However..this.pre.emptive.action.was.not.enough.to.save.him.from.being.a.defendant.in.a.multi.million.dollar.class.action.lawsuit........The.primary.reason.for.CEO.s.exit.is.more.likely.poor.financial.performance..Thomas.Adams.stepped.down.in.Aug..2008..The.company.s.financial.position.was.a.concern.because.inflationary.pressure.on.raw.materails.compounded.by.lack.of.pricing.power.available.to.the.company..The.share.price.was.plunging.to.the.extent.that.NYSE.decided.to.drop.the.stock.from.its.list..This.was.because.the.company.had.failed.to.comply.with.the.minimum.market.cap.requirement. <dbl> …
## $ notes_Mr..Ayalon.has.served.as.a.member.of.our.board.of.directors.since.November.1999..Mr..Ayalon.previously.served.as.President.and.Chief.Executive.Officer.of.DSP.Group..Inc...a.publicly.traded.fabless.semiconductor.company..from.April.1996.until.April.2005.and.from.January.2007.to.July.2009. <dbl> …
## $ notes_Mr..Kelleher.retired.as.C.E.O..of.Southwest.airlines.at.the.age.of.70.years..yet.he.remained.on.with.the.company.as.its.chairman..Although.the.man.was.diagnosed.with.prostate.cancer.recently..the.decision.to.step.down.had.been.in.the.works.for.awhile..Even.though.the.aeronautics.industry.was.in.a.downturn.by.the.early.2000s..prudent.fiscal.management.ensured.the.corporation.stayed.afloat.just.like.it.did.during.the.Persian.Gulf.War..The.old.maverick.knew.it.was.a.reasonable.time.to.leave.the.day.to.day.operations.to.a.younger.successor..and.so.it.was.that.the.entrepreneur.left.the.company.more.or.less.when.he.did. <dbl> …
## $ notes_Mr..Pennacchio.joined.the.Company.in.May.1994.and.was.employed.as.the.Chief.Executive.Officer.and.President...Mr..Pennacchio.and.the.Company.agreed.to.his.termination.of.employment.and.resignation.as.a.director.in.May.1996..and.the.Company.is.negotiating.his.contractual.severance..The.company.was.called.jan.Bell.at.the.time..They.did.the.jeweler.in.Sams.club...Pennacchio.had.a.fight.with.Arguetty..a.major.shareholder..He.was.only.there.two.years.of.five..He.apparently.told.Arguetty...it.s.your.company..you.run.it..Pay.me.our..of.his.5.year.contract......Chnaged.to.3. <dbl> …
## $ notes_Mr..Smit.left.Charter.Communications.Inc..as.its.one.time.C.E.O..to.be.the.President.of.Comcast. <dbl> …
## $ notes_Mr..Sullivan.joins.Insulet.Corporation.having.most.recently.served.as.Managing.Director.of.Aton.Partners..Prior.to.that..Mr..Sullivan.served.as.Chairman.and.CEO.of.Constitution.Medical.Investors.from.2008.to.2013..Mr..Sullivan.served.as.Executive.Chairman.of.Hologic.from.its.merger.with.Cytyc.Corporation.in.October.2007.until.May.2008..having.previously.served.Cytyc.as.Chairman..President.and.Chief.Executive.Officer..Mr..Sullivan.first.joined.Cytyc.in.1991.and.was.employed.prior.to.that.in.marketing.roles.of.increasing.responsibility.at.Abbott.Laboratories..a.diversified.healthcare.company..and.as.a.consultant.with.McKinsey...Company..an.international.management.consulting.firm..Mr..Sullivan.serves.as.a.director.of.PerkinElmer..Inc...a.global.leader.focused.on.improving.the.health.and.safety.of.people.and.the.environment..Mr..Sullivan.holds.a.Bachelor.of.Science.degree..with.Distinction..from.the.United.States.Naval.Academy.and.a.Master.of.Business.Administration.degree..with.Distinction..from.Harvard.Business.School. <dbl> …
## $ notes_Mr..Taylor.has.been.a.director.of.Adtalem.since.November.1987..In.July.2004.he.became.Adtalem.s.Chief.Executive.Officer.and.served.in.that.capacity.until.November.2006..He.has.served.as.a.Senior.Advisor.to.Adtalem.since.November.2006. <dbl> …
## $ notes_Mr..William.E..Nettles.resigned.as.an.executive.officer.and.director.of.the.Company.on.February.12..2001...When.Mr..Nettles.retired.from.the.Company.in.February.2001..Mr..McAllister.was.appointed.to.replace.him... <dbl> …
## $ notes_NASHVILLE..Tenn....BUSINESS.WIRE...HCA..NYSE.HCA..announced.today.that.Richard.M..Bracken.will.transition.at.the.end.of.the.year.from.his.role.as.Chairman.and.CEO.to.Chairman.of.the.Board..The.Board.of.Directors.has.named.R..Milton.Johnson..HCA.s.President.and.CFO..his.successor.as.Chief.Executive.Officer..effective.at.that.same.time. <dbl> …
## $ notes_NEWTON..Mass...AP..The.parent.company.of.the.General.Cinema.theater.chain.filed.for.bankruptcy.reorganization.Wednesday..saying.its.older.movie.houses.were.not.competitive.with.the.growing.number.of....megaplex....cinemas.....Richard.Smith..chief.executive.officer..and.Robert.Smith..president.and.chief.operating.officer..resigned.from.GC.Companies..Inc...in.conjunction.with.the.filing.to.avoid.conflict.of.interest..Both.hold.positions.with.Harcourt.General.Inc...which.guaranteed.some.of.the.company....s.theater.leases..G..Gail.Edwards..chief.financial.officer..will.take.over.as.president.and.CEO..Richard.Smith..son.of.the.chain....s.founder..will.remain.chairman.of.the.board.....GC.Companies.Inc..will.close.theaters.in.Florida..Georgia..Louisiana.and.Tennessee..it.said.in.a.statement..It.will.shut.17.theaters.with.108.screens.this.month..When.reorganization.is.complete.the.chain.will.have.reduced.theaters.by.41.percent.from.133.to.78..cutting.screens.36.percent.from.1.070.to.689. <dbl> …
## $ notes_PARSIPPANY..NJ....BUSINESS.WIRE....Jan..29..2019...B.G.Foods..Inc...NYSE..BGS..announced.today.that.Robert.C..Cantwell..the.Company.s.Chief.Executive.Officer.has.notified.the.Board.of.Directors.that.he.plans.to.retire.on.April.5..2019...Mr..Cantwell.s.retirement.will.bring.to.a.close.a.remarkable.career.of.more.than.35.years.of.continuous.service.to.B.G.Foods...including.approximately.23.years.of.leadership.as.Executive.Vice.President.of.Finance.and.Chief.Financial.Officer.and.more.than.four.years.of.leadership.as.President.and.Chief.Executive.Officer..Following.his.retirement..it.is.expected.that.Mr..Cantwell..who.turns.62.later.this.week..will.continue.to.advise.the.Company.on.M.A.and.capital.markets.transactions..In.accordance.with.a.succession.plan.established.in.2017..B.G.Foods..Board.of.Directors.has.appointed.Kenneth.G..Romanzi...age.59..who.currently.serves.as.the.Company.s.Executive.Vice.President.and.Chief.Operating.Officer..as.the.Company.s.next.President.and.Chief.Executive.Officer..effective.upon.Mr..Cantwell.s.retirement..At.such.time..Mr..Romanzi.will.also.replace.Mr..Cantwell.on.the.Board.of.Directors. <dbl> …
## $ notes_Pepco.Holdings.Inc..Chief.Executive.Officer.Dennis.Wraase.announced.his.retirement.and.the.company.named.Joseph.Rigby.to.replace.him..Mr..Rigby.currently.serves.as.president.and.chief.operating.officer.of.the.D.C..based.energy.delivery.giant..Mr..Wraase..a.35.year.Pepco.veteran.who.has.served.as.CEO.since.2003..will.remain.chairman.until.he.retires. <dbl> …
## $ notes_Peter.J..Kight..our.founder..has.served.as.our.Chairman.and.Chief..Executive.Officer.since.December.1997..He.also.serves.as.Chairman.and.Chief..Executive.Officer.of.CheckFree.Services.Corporation..a.position.he.has.held..since.1981...CheckFree.Investment.Corporation..CheckFree.Management.Corporation...CheckFree.i.Solutions..Inc...CheckFree.i.Solutions.Corporation..CheckFree..i.Solutions.International..Inc...CheckFree.Finance..Inc...CheckFree..International.Partner..Inc...and.CheckFree.TransPoint.Holdings.Inc..Mr..Kight.is..also.a.director.of.CheckFree.Services.Corporation..CheckFree.Management..Corporation..CheckFree.i.Solutions..Inc...CheckFree.i.Solutions.Corporation...CheckFree.i.Solutions.International..Inc...CheckFree.Finance..Inc...CheckFree..International.Partner..Inc...and.CheckFree.TransPoint.Holdings.Inc..From.1997.to..1999..Mr..Kight.served.as.President.of.CheckFree.Corporation.and..from.1981.to..1999..he.served.as.President.of.CheckFree.Services.Corporation..Mr..Kight.is.a..Director.of.Metatec.International..Inc...a.publicly.held.company.that..distributes.information.utilizing.CD.ROM.technology. <dbl> …
## $ notes_Philip.W..Tomlinson..CEO.of.Total.Systems.Services.will.retire.on.July.31..2014..He.will.be.succeeded.by.M..Troy.Woods..the.company.s.president.and.COO..Tomlinson.has.been.with.the.company.since.1974. <dbl> …
## $ notes_President.and.CEO.John.M..Cook.will.retire..However..Cook.will.stay.with.the.company.until.a.successor.is.found. <dbl> …
## $ notes_Prior.to.Medusa.Corp...on.May.1985..Crane.spinoff.of.CF.I.Steel..followed.by.the.exit.of.the.cement.business.with.the.1988.spinoff.of.Medusa.Corporation..By.1984..the.year.Robert.S..Evans.replaced.his.father.as.CEO.of.Crane..Medusa.was.a.smaller.and.leaner.company.that.was.ready.to.build.on.its.strengths..Later.in.1998..Medusa.annouced.that.it.would.be.acquired.by.Southdown.Inc...a.Houston.based.cement.producer..for..1.billion.in.stock..March.18..1998.Southdown.Inc..and.Medusa.Corp..hardened.into.a.deal.Wednesday.as.the.two.announced.they.will.merge.in.a.deal.worth..1.billion..The.companies.expect.the.transaction.to.be.completed.by.the.end.of.June..June.30..1998..the.Southdown.Inc.concluded.a.merger.transaction.with.Medusa.Corporation..Southdown.Inc.ssued.approximately.14.7.million.shares.of.its.common.stock.for.all.of.the.outstanding.common.stock.of.Medusa. <dbl> …
## $ notes_RDM.Sports.Group.has.accepted.the.resignation.of.chairman.and.chief.executive.Henry.Fong..The.company.named.James.Rand.to.fill.these.positions..Rand.has.been.a.director.of.the.company.for.the.past.four.years..Atlanta.based.RDM.Sports.produces.and.distributes.fitness.and.sporting.equipment..For.the.six.months.ended.6.29.97..sales.fell.59..to..95.5.million..Net.loss.before.extraordinary.item.totalled..27.6.million..up.from..503.thousand..Results.reflect <dbl> …
## $ notes_Rene.L..Latiolais.was.President.and.Chief.Executive.Officer.of.Freeport.McMoRan.Inc..as.cited.in.the.SEC.document.dated.August.6..1997..On.July.28..1997..IMC.Global.Inc..and.Freeport.McMoRan.Inc..announced.today.that.they.have...signed.a.non.binding.letter.of.intent.for.the.merger.of.IGL.and.FTX..with.IGL.as.the.surviving.entity..Mr..James.R..Moffett..Chairman.of.FTX..Mr..Rene.L..Latiolais..President.and.Chief.Executive.Officer.of.FTX.and.FRP..both.of.whom.will.retire.from.FTX.prior.to.the.merger..Latiolais.resigned.from.Freeport.on.January.1..1998..FSC.directors..James.R..Moffett..Rene.L..Latiolais.and.Robert.M..Wohleber.allegedly.received.substantial.income.from.other.entities.within.the.interlocking.directorates.of.Freeport.McMoRan.companies.and.arguably.had.an.interest.in.appeasing.the.MOXY.and.FSC.insiders.who.also.served.with.Latiolais.and.Wohleber.on.the.boards.of.other.Freeport.companies. <dbl> …
## $ notes_Restructure.of.operations.across.Hillshire....McMillin.being.forced.out.and.would.remain.chair.until.Octoboer.of.that.year. <dbl> …
## $ notes_Retired.after.50.years.of.service.amd.would.stay.on.as.the.Chairman.of.the.board.for.smooth.transition.of.the.new.incumbent. <dbl> …
## $ notes_Ryan..stepped.down.as.Chief.Execuitive.Officer.yet.retained.the.position.of.chairman..ZixIt.reported.a.fourth.quarter.loss.of..10.4.millionc.compared.with.a.loss.of..8.2.million.a.year.ago.though.revenue.for.the.quarter.was..1.9.million..up.from.last.year. <dbl> …
## $ notes_SAN.FRANCISCO..MarketWatch.....Analysts.International.Corp..anly.after.Tuesday.s.closing.bell.said.Michael.LaVelle.is.retiring.as.chief.executive.officer..effective.Dec..31..pursuant.to.a.previously.disclosed.succession.plan..LaVelle.will.continue.to.serve.as.chairman..according.to.the.Minneapolis.based.technology.services.provider..Jeffrey.Baker..Analysts.International.s.president..will.succeed.LaVelle..the.company.said. <dbl> …
## $ notes_Says.DiMicco...Nucor.couldn.t.be.in.better.hands..I.m.very.confident.in.the.ability.of.John.and.the.rest.of.our.management.team.to.take.on.our.current.and.future.challenges.and.to.lead.the.company.s.continual.growth.in.the.coming.years..As.executive.chairman..I.look.forward.to.continuing.to.work.with.and.provide.strong.support.to.the.executive.team.led.by.John.in.the.areas.of.corporate.growth..strategic.succession.planning.and.Nucor.s.efforts.to.promote.a.strong..vibrant.manufacturing.base........Daniel.DiMicco.is.credited.with.increasing.sales.by.five.times.and.delivering.total.shareholder.return.of.464.percent..He.stepped.down.as.part.of.normal.leadership.transition.process.but.continued.as.executive.chairman.of.Nucor. <dbl> …
## $ notes_School.Specialty.Inc..has.announced.that.its.chairman.and.chief.executive.officer.Daniel.Spalding.has.died.unexpectedly. <dbl> …
## $ notes_Shares.of.Advo.Inc..soared.by.nearly.50..early.Thursday.on.news.that.the.junk.mail.giant.will.be.acquired.by.Valassis.Communications.Inc..in.a.deal.valued.at..1.3.billion..Together..the.two.should.see.revenue.of..2.65.billion.in.2007..The.company.will.be.headquartered.in.Valassis..home.of.Livonia..Mich...but..maintain.a.substantial.presence..in.Windsor..Conn..Alan.Schultz.will.remain.chairman..president.and.CEO.while.Advo.chief.S..Scott.Harding.will.serve.as.a.consultant..No.changes.will.be.made.to.the.Valassis.board. <dbl> …
## $ notes_STAMFORD..Conn..Ronald.E..Ferguson.will.step.down.as.chief.executive.officer.of.General.Re.Corp..Oct..1.and.will.be.succeeded.by.Joseph.P..Brandon..now.a.General.Re.executive.vp.....Mr..Ferguson.will.remain.chairman.of.Stamford..Conn..based.General.Re.until.June.2002..when.he.will.retire.and.Mr..Brandon.will.assume.the.additional.post.of.chairman. <dbl> …
## $ notes_Sterling.L..Williams.served.as.Chief.Executive.Officer.during.fiscal.1996..In.October.1996..Mr..Williams.resigned.from.that.position.and.Warner.C..Blow.was.elected.Chief.Executive.Officer.of.the.Company.. <dbl> …
## $ notes_The.company.said.Chairman.and.CEO.William.C..McCord.will.retire.on.April.30.when.he.reaches.the.age.of.65..Company.President.David.W..Biegler..46..will.succeed.McCord.while.retaining.his.title.as.president..ENSERCH.does.not.have.a.mandatory.retirement.age..but.the.company.does.not.plan.to.renew.McCord.s.contract..which.expires.in.April..However..ENSERCH.expects.McCord.to.stay.on.its.board..In.Aug.5..1997..Texas.Utilities.Company.and.ENSERCH.merged.. <dbl> …
## $ notes_The.Wall.Street.Journal.describes.Franklin.s.retirement.as.a.planned.event..and.there.was.little.to.no.media.coverage.about.it.the.small.coverage.there.was.mainly.included.positive.comments. <dbl> …
## $ notes_United.Stationers.Inc...now.Essendant..said.Thomas.W..Sturgess.resigned.his.posts.as.chairman..president.and.chief.executive.officer..The.business.products.wholesaler.said.Mr..Sturgess..who.will.remain.a.board.member..stepped.down.in.order.to..devote.more.time.to.his.family...Company.officials.couldn.t.be.reached.following.Monday.evening.s.disclosure..The.3rd.quarter.was.one.of.the.company.s.best.ever..Analysts.did.not.think.he.was.pushed.out..CEO.left.abruptly.and.a.controlling.shareholder.was.named.as.interim.CEO..Sturgess.had.been.a.representative.of.that.owner <dbl> …
## $ notes_Washlow.stated...I.have.enjoyed.my.years.at.Lawson.immensely.and.have.reached.a.point.where.I.would.like.to.spend.more.time.with.my.family..focus.on.personal.business.activities..long.on.hold..and.increase.my.involvement.in.community.activities..I.am.confident.that.the.team.we.have.built.will.continue.to.take.our.family.of.businesses.forward.in.the.years.to.come.. <dbl> …
## $ notes_William.P..Fricks.has.served.as.Chairman.and.Chief.Executive.Officer.of.the.Company.since.January.1997..Prior.to.that.he.was.Chief.Executive.Officer.from.November.1995.and.President.and.Chief.Operating.Officer.from.September.1994..Mr..Fricks.first.joined.Newport.News.in.1966..Election.to.General.Dynamics.Board..General.Dynamics.has.agreed.to.elect.William.P..Fricks..the.Chairman.and.Chief.Executive.Officer.of.the.Company..to.the.Board.of.Directors.of.General.Dynamics.following.consummation.of.the.Offer..Northrop.Grumman.purchased.newport.in.2001 <dbl> …
## $ notes_Wright.retired.from.his.role.as.Chief.Executive.Officer.in.2001.after.being.CEO.since.1981..He.remained.chairman.of.the.board. <dbl> …
xgboost_spec <-
boost_tree(trees = tune()) %>%
set_mode("classification") %>%
set_engine("xgboost")
xgboost_workflow <-
workflow() %>%
add_recipe(xgboost_rec) %>%
add_model(xgboost_spec)
doParallel::registerDoParallel()
set.seed(65743)
xgboost_tune <-
tune_grid(xgboost_workflow,
resamples = departure_cv,
grid = 5)