departures <- readr::read_csv('https://raw.githubusercontent.com/rfordatascience/tidytuesday/master/data/2021/2021-04-27/departures.csv')
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 |
factors_vec <- departures %>% select(leftofc, departure_code, co_per_rol, fyear, coname, tenure_no_ceodb, max_tenure_ceodb, fyear_gone) %>% names()
data_clean <- departures %>%
select(-c(interim_coceo, still_there, eight_ks, gvkey, co_per_rol, leftofc, cik, fyear, '_merge')) %>%
filter(fyear_gone != "2997") %>%
filter(!is.na(ceo_dismissal)) %>%
mutate(
departure_code = factor(departure_code),
tenure_no_ceodb = factor(tenure_no_ceodb),
max_tenure_ceodb = factor(max_tenure_ceodb),
fyear_gone = factor(fyear_gone),
ceo_dismissal = factor(ceo_dismissal)
)
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 |
data_clean %>% count(ceo_dismissal)
## # A tibble: 2 × 2
## ceo_dismissal n
## <fct> <int>
## 1 0 5993
## 2 1 1484
data_clean %>%
ggplot(aes(ceo_dismissal)) +
geom_bar()
ceo_dismissal vs. max tenure
#data_clean %>%
#ggplot(aes(max_tenure_ceodb)) +
#geom_boxplot()
# Doesn't represent the data well in my case
correlation plot
# Step 1: binarize
data_binarized <- data_clean %>%
select(-notes, -sources, -exec_fullname, -coname) %>%
binarize()
data_binarized %>% glimpse
## Rows: 7,477
## Columns: 47
## $ `dismissal_dataset_id__-Inf_2176` <dbl> 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ dismissal_dataset_id__2176_4326 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ dismissal_dataset_id__4326_6580 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ dismissal_dataset_id__6580_Inf <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ departure_code__1 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ departure_code__2 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ departure_code__3 <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, …
## $ departure_code__4 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ departure_code__5 <dbl> 0, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, …
## $ departure_code__6 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ departure_code__7 <dbl> 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, …
## $ ceo_dismissal__0 <dbl> 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, …
## $ ceo_dismissal__1 <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, …
## $ tenure_no_ceodb__1 <dbl> 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, …
## $ `tenure_no_ceodb__-OTHER` <dbl> 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, …
## $ max_tenure_ceodb__2 <dbl> 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, …
## $ fyear_gone__1993 <dbl> 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, …
## $ fyear_gone__1994 <dbl> 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, …
## $ fyear_gone__1996 <dbl> 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, …
## $ fyear_gone__1998 <dbl> 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, …
## $ fyear_gone__1999 <dbl> 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, …
## $ fyear_gone__2001 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, …
## $ fyear_gone__2002 <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, …
## $ fyear_gone__2003 <dbl> 1, 0, 1, 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, …
## $ fyear_gone__2005 <dbl> 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, …
## $ fyear_gone__2007 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, …
## $ fyear_gone__2008 <dbl> 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, …
## $ fyear_gone__2010 <dbl> 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, …
## $ fyear_gone__2012 <dbl> 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, …
## $ fyear_gone__2014 <dbl> 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, …
## $ fyear_gone__2016 <dbl> 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, …
## $ fyear_gone__2018 <dbl> 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, …
## $ `fyear_gone__-OTHER` <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
# Step 2: correlation
data_correlation <- data_binarized %>%
select(-`fyear_gone__-OTHER`, -`max_tenure_ceodb__-OTHER`, -`tenure_no_ceodb__-OTHER`, -`dismissal_dataset_id__-Inf_2176`) %>%
correlate(ceo_dismissal__1)
data_correlation
## # A tibble: 43 × 3
## feature bin correlation
## <fct> <chr> <dbl>
## 1 ceo_dismissal 0 -1
## 2 ceo_dismissal 1 1
## 3 departure_code 3 0.929
## 4 departure_code 5 -0.477
## 5 departure_code 7 -0.304
## 6 departure_code 4 0.273
## 7 departure_code 6 -0.0786
## 8 max_tenure_ceodb 1 0.0582
## 9 departure_code 2 -0.0568
## 10 max_tenure_ceodb 2 -0.0539
## # ℹ 33 more rows
# Step 3: plot
data_correlation %>%
correlationfunnel::plot_correlation_funnel()
## Warning: ggrepel: 27 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps
There is a moderate correlation between departure codes and ceo dismissals so some departures codes are more indicative of ceo dismissals than others.
library(dplyr)
library(rsample)
set.seed(1234)
data_clean <- data_clean %>% sample_n(100)
data_split <- initial_split(data_clean, strata = ceo_dismissal)
data_train <- training(data_split)
data_test <- testing(data_split)
data_cv <- rsample::vfold_cv(data_train, strata = ceo_dismissal)
data_cv
## # 10-fold cross-validation using stratification
## # A tibble: 10 × 2
## splits id
## <list> <chr>
## 1 <split [66/9]> Fold01
## 2 <split [66/9]> Fold02
## 3 <split [67/8]> Fold03
## 4 <split [68/7]> Fold04
## 5 <split [68/7]> Fold05
## 6 <split [68/7]> Fold06
## 7 <split [68/7]> Fold07
## 8 <split [68/7]> Fold08
## 9 <split [68/7]> Fold09
## 10 <split [68/7]> Fold10
# Create a numeric version of ceo_dismissal
#data_train$ceo_dismissal_numeric <- as.numeric(as.character(data_train$departure_code))
# Create a factor version of ceo_dismissal
#data_train$ceo_dismissal_factor <- factor(data_train$ceo_dismissal, levels = c(0, 1), labels = c("Not Dismissed", "Dismissed"))
# Check the structure to confirm both variables are present
str(data_train)
## tibble [75 × 10] (S3: tbl_df/tbl/data.frame)
## $ dismissal_dataset_id: num [1:75] 1994 3192 6735 4562 7051 ...
## $ coname : chr [1:75] "KELLY SERVICES INC -CL A" "EDISON INTERNATIONAL" "AZZURRA HOLDING CORP" "POLARIS INDUSTRIES INC" ...
## $ exec_fullname : chr [1:75] "Terence E. Adderley" "John E. Bryson" "George P. Roberts" "W. Hall Wendel Jr." ...
## $ departure_code : Factor w/ 7 levels "1","2","3","4",..: 5 5 5 5 2 5 7 5 5 7 ...
## $ ceo_dismissal : Factor w/ 2 levels "0","1": 1 1 1 1 1 1 1 1 1 1 ...
## $ tenure_no_ceodb : Factor w/ 3 levels "1","2","3": 1 1 2 1 2 1 1 1 1 1 ...
## $ max_tenure_ceodb : Factor w/ 4 levels "1","2","3","4": 1 1 2 1 2 1 1 1 1 1 ...
## $ fyear_gone : Factor w/ 34 levels "1980","1988",..: 19 21 16 12 28 22 13 15 13 20 ...
## $ notes : chr [1:75] "In connection with execution of the Company’s management succession plan in 2006, the Compensation and Corporat"| __truncated__ "Mr. Bryson retired as C.E.O., chairman, and president of Edison International on 31 July 2008, marking the end "| __truncated__ "P-Com, Inc. (OTCBB:PCOM), a worldwide provider of\n wireless telecom products and services, today announced tha"| __truncated__ "W. Hall Wendel, Jr., stepped down as CEO in May 1999, remaining a major shareholder as well as board chairman. "| __truncated__ ...
## $ sources : chr [1:75] "https://www.sec.gov/Archives/edgar/data/55135/000095012408001758/k24744ddef14a.htm" "https://newsroom.edison.com/releases/edison-international-announces-management-succession-plan\n https://www.go"| __truncated__ "https://sec.report/Document/0001144204-03-005347/" "http://www.fundinguniverse.com/company-histories/polaris-industries-inc-history/" ...
library(dplyr)
library(recipes)
## Warning: package 'recipes' was built under R version 4.3.3
# Assuming data_train is already defined and includes the necessary columns
# Create the recipe
xgboost_rec <- recipe(ceo_dismissal ~ ., data = data_train) %>%
update_role(dismissal_dataset_id, new_role = "ID") %>%
step_dummy(all_nominal_predictors()) %>%
step_normalize(all_numeric_predictors()) %>%
step_zv(all_predictors())
xgboost_rec %>% prep() %>% juice() %>% glimpse()
## Warning: ! The following columns have zero variance so scaling cannot be used:
## departure_code_X6, tenure_no_ceodb_X3, max_tenure_ceodb_X3,
## max_tenure_ceodb_X4, fyear_gone_X1988, fyear_gone_X1990, fyear_gone_X1991,
## fyear_gone_X1992, fyear_gone_X2017, fyear_gone_X2020, and fyear_gone_X2021.
## ℹ Consider using ?step_zv (`?recipes::step_zv()`) to remove those columns
## before normalizing.
## Rows: 75
## Columns: 331
## $ dismissal_dataset_id <dbl> …
## $ ceo_dismissal <fct> …
## $ coname_ALERIS.CORP <dbl> …
## $ coname_AMEREN.CORP <dbl> …
## $ coname_ARROW.ELECTRONICS.INC <dbl> …
## $ coname_ATLAS.AIR.WORLDWIDE.HLDG.INC <dbl> …
## $ coname_AZZURRA.HOLDING.CORP <dbl> …
## $ coname_BALLY.ENTERTAINMENT.CORP <dbl> …
## $ coname_BANDAG.INC <dbl> …
## $ coname_BELL.INDUSTRIES.INC <dbl> …
## $ coname_BIOMATRIX.INC <dbl> …
## $ coname_BIRMINGHAM.STEEL.CORP <dbl> …
## $ coname_BORGWARNER.INC <dbl> …
## $ coname_CAMBRIDGE.TECHNOLOGY.PARTNER <dbl> …
## $ coname_CARBO.CERAMICS.INC <dbl> …
## $ coname_CAREFUSION.CORP <dbl> …
## $ coname_CAREINSITE.INC <dbl> …
## $ coname_CBS.INC <dbl> …
## $ coname_CILCORP.INC <dbl> …
## $ coname_CONCERTO.SOFTWARE.INC <dbl> …
## $ coname_CONECTIV.INC <dbl> …
## $ coname_CORECIVIC.INC <dbl> …
## $ coname_COTY.INC <dbl> …
## $ coname_DIGITAL.INSIGHT.CORP <dbl> …
## $ coname_DIRECTV <dbl> …
## $ coname_DOWNEY.FINANCIAL.CORP <dbl> …
## $ coname_EDISON.INTERNATIONAL <dbl> …
## $ coname_ENERGEN.CORP <dbl> …
## $ coname_EPICOR.SOFTWARE.CORP..OLD <dbl> …
## $ coname_FIRST.COMMERCIAL.CORP <dbl> …
## $ coname_FISERV.INC <dbl> …
## $ coname_GENWORTH.FINANCIAL.INC <dbl> …
## $ coname_GILLETTE.CO <dbl> …
## $ coname_GLOBAL.CROSSING.LTD <dbl> …
## $ coname_HANDLEMAN.CO <dbl> …
## $ coname_HANDY...HARMAN.LTD <dbl> …
## $ coname_INTEGRATED.CIRCUIT.SYSTEMS <dbl> …
## $ coname_INTL.GAME.TECHNOLOGY <dbl> …
## $ coname_IOWA.ILLINOIS.GAS...ELEC <dbl> …
## $ coname_IPAYMENT.INC <dbl> …
## $ coname_JUST.FOR.FEET.INC <dbl> …
## $ coname_KELLY.SERVICES.INC..CL.A <dbl> …
## $ coname_LABORATORY.CP.OF.AMER.HLDGS <dbl> …
## $ coname_LEGGETT...PLATT.INC <dbl> …
## $ coname_MATERIAL.SCIENCES.CORP <dbl> …
## $ coname_MCCAW.CELLULAR.COMM..CL.A <dbl> …
## $ coname_MCKESSON.CORP <dbl> …
## $ coname_MEAD.CORP <dbl> …
## $ coname_MILLIPORE.CORP <dbl> …
## $ coname_ORGANOGENESIS.INC <dbl> …
## $ coname_PERFORMANCE.FOOD.GROUP.CO <dbl> …
## $ coname_POLARIS.INDUSTRIES.INC <dbl> …
## $ coname_PORTLAND.GENERAL.CORP <dbl> …
## $ coname_PRICE..T..ROWE..GROUP <dbl> …
## $ coname_PROCTER...GAMBLE.CO <dbl> …
## $ coname_QUAKER.CHEMICAL.CORP <dbl> …
## $ coname_REGIS.CORP.MN <dbl> …
## $ coname_REYNOLDS.METALS.CO <dbl> …
## $ coname_ROCKWELL.AUTOMATION <dbl> …
## $ coname_RURAL.METRO.CORP <dbl> …
## $ coname_SANTANDER.HOLDINGS.USA.INC <dbl> …
## $ coname_SEARS.ROEBUCK...CO <dbl> …
## $ coname_SOUTHERN.NEW.ENG.TELECOMM <dbl> …
## $ coname_SPORTS.AUTHORITY.INC.OLD <dbl> …
## $ coname_ST.JOE.CO <dbl> …
## $ coname_STERIS.PLC <dbl> …
## $ coname_SUN.MICROSYSTEMS.INC <dbl> …
## $ coname_SUNOCO.INC <dbl> …
## $ coname_TIME.WARNER.INC <dbl> …
## $ coname_TRAVELERS.COS.INC <dbl> …
## $ coname_TXU.GAS.CO <dbl> …
## $ coname_U.S.TRUST.CORP <dbl> …
## $ coname_ULTA.BEAUTY.INC <dbl> …
## $ coname_VERTEX.PHARMACEUTICALS.INC <dbl> …
## $ coname_WINDSTREAM.HOLDINGS.INC <dbl> …
## $ coname_XTO.ENERGY.INC <dbl> …
## $ exec_fullname_Barnett.Grace <dbl> …
## $ exec_fullname_Bernd.Erich.Beetz <dbl> …
## $ exec_fullname_Bill.R..Sanford <dbl> …
## $ exec_fullname_Bob.R..Simpson <dbl> …
## $ exec_fullname_Carl.A..Grimstad <dbl> …
## $ exec_fullname_Craig.O..McCaw <dbl> …
## $ exec_fullname_Daniel.D..Rosenthal <dbl> …
## $ exec_fullname_David.L..Mahoney <dbl> …
## $ exec_fullname_David.L..Schlotterbeck.B.S..M.S. <dbl> …
## $ exec_fullname_David.P..King <dbl> …
## $ exec_fullname_David.W..Sear <dbl> …
## $ exec_fullname_Donahue.L..Wildman <dbl> …
## $ exec_fullname_Donald.R..Beall <dbl> …
## $ exec_fullname_Endre.A..Balazs <dbl> …
## $ exec_fullname_Francis.J..Lunger <dbl> …
## $ exec_fullname_Francis.M..Scricco <dbl> …
## $ exec_fullname_G..Robert.Evans <dbl> …
## $ exec_fullname_George.H..Conrades <dbl> …
## $ exec_fullname_George.P..Roberts <dbl> …
## $ exec_fullname_H..Marshall.Schwarz <dbl> …
## $ exec_fullname_Harold.Ruttenberg <dbl> …
## $ exec_fullname_Harry.M..Cornell.Jr. <dbl> …
## $ exec_fullname_Howard.E..Cosgrove <dbl> …
## $ exec_fullname_James.Aloysius.Charles.Kennedy.C.F.A..CFA <dbl> …
## $ exec_fullname_James.D..Foy <dbl> …
## $ exec_fullname_James.K..Sims <dbl> …
## $ exec_fullname_James.T..McManus.II <dbl> …
## $ exec_fullname_Jay.S..Fishman <dbl> …
## $ exec_fullname_Jeffery.R..Gardner <dbl> …
## $ exec_fullname_Jeffrey.L..Bewkes <dbl> …
## $ exec_fullname_Jeremiah.J..Sheehan <dbl> …
## $ exec_fullname_Jerome.F..Tatar <dbl> …
## $ exec_fullname_Jesse.P..Orsini <dbl> …
## $ exec_fullname_John.B..Furman <dbl> …
## $ exec_fullname_John.C..Dorman <dbl> …
## $ exec_fullname_John.D..Ferguson <dbl> …
## $ exec_fullname_John.E..Bryson <dbl> …
## $ exec_fullname_John.E..Pepper <dbl> …
## $ exec_fullname_Jonathan.I..Schwartz <dbl> …
## $ exec_fullname_Joseph.P..Campanelli <dbl> …
## $ exec_fullname_Ken.L..Harrison <dbl> …
## $ exec_fullname_L..George.Klaus <dbl> …
## $ exec_fullname_L..Park.Brady..Jr. <dbl> …
## $ exec_fullname_Laurence.Alan.Tisch <dbl> …
## $ exec_fullname_Leo.J..Hindery.Jr. <dbl> …
## $ exec_fullname_Leslie.M..Muma <dbl> …
## $ exec_fullname_Lyn.Kirby <dbl> …
## $ exec_fullname_Martin.E..Hanaka <dbl> …
## $ exec_fullname_Martin.G..Carver <dbl> …
## $ exec_fullname_Matthew.W..Emmens <dbl> …
## $ exec_fullname_Michael.A..Chowdry <dbl> …
## $ exec_fullname_Michael.C..Hawley <dbl> …
## $ exec_fullname_Michael.D..White <dbl> …
## $ exec_fullname_Michael.Desmond.Fraizer <dbl> …
## $ exec_fullname_Michael.L..Sabolinski <dbl> …
## $ exec_fullname_Myron.Kunin <dbl> …
## $ exec_fullname_Neil.D..Arnold <dbl> …
## $ exec_fullname_Paul.C..Suthern <dbl> …
## $ exec_fullname_Ralph.L..Cheek <dbl> …
## $ exec_fullname_Robert.A..Garvey <dbl> …
## $ exec_fullname_Robert.C..Sledd <dbl> …
## $ exec_fullname_Robert.H..Campbell <dbl> …
## $ exec_fullname_Robert.O..Viets <dbl> …
## $ exec_fullname_Sigismundus.W.W..Lubsen <dbl> …
## $ exec_fullname_Stanley.J..Bright <dbl> …
## $ exec_fullname_Stephen.Strome <dbl> …
## $ exec_fullname_Terence.E..Adderley <dbl> …
## $ exec_fullname_Theodore.Williams <dbl> …
## $ exec_fullname_Thomas.J..Matthews <dbl> …
## $ exec_fullname_Thomas.R..Voss <dbl> …
## $ exec_fullname_Timothy.M..Manganello <dbl> …
## $ exec_fullname_W..Hall.Wendel.Jr. <dbl> …
## $ exec_fullname_Walter.H..Monteith.Jr. <dbl> …
## $ exec_fullname_William.C..McCord <dbl> …
## $ departure_code_X2 <dbl> …
## $ departure_code_X3 <dbl> …
## $ departure_code_X4 <dbl> …
## $ departure_code_X5 <dbl> …
## $ departure_code_X7 <dbl> …
## $ tenure_no_ceodb_X2 <dbl> …
## $ max_tenure_ceodb_X2 <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_X2018 <dbl> …
## $ fyear_gone_X2019 <dbl> …
## $ notes_A.few.weeks.after.selling.the.junk.bonds..Just.for.Feet.issued.an.earnings.warning..This..press.release.alerted.investors.that.the.company.would.likely.post.its.first.ever.quarterly.loss..during.the.second.quarter.of.fiscal.1999..One.month.later..Just.for.Feet.shocked.its..investors.and.creditors.when.it.announced.that.it.might.default.on.its.first.interest.payment..on.the..200.million.of.junk.bonds..Investors.received.more.disturbing.news.in.July.1999..when.Harold.Ruttenberg.unexpectedly.resigned.as.Just.for.Feet.s.CEO..The.company..replaced.Ruttenberg.with.a.corporate.turnaround.specialist..Helen.Rockey..Upon.resigning...Ruttenberg.insisted.that.Just.for.Feet.s.financial.problems.were.only.temporary.and.that.the..company.would.likely.post.a.profit.during.the.third.quarter.of.fiscal.1999...Harold.Ruttenberg.s.statement.did.not.reassure.investors..The.company.s.stock.price.went..into.a.freefall.during.the.spring.and.summer.of.1999..slipping.to.near..4.per.share.by.the..end.of.July..In.September..the.company.announced.that.it.had.lost..25.9.million.during.the..second.quarter.of.fiscal.1999..a.much.larger.loss.than.had.been.expected.by.Wall.Street. <dbl> …
## $ notes_According.to.a.statement.by.Arrow..the.resignation.was.by.mutual.agreement.with.the.distributor.s.Board.of.Directors. <dbl> …
## $ notes_After.a.decline.of.72..market.shares..Campenelli.was.released.by.Sovereign..now.Santander...This.decline.followed.the.collapse.of.Washington.Mutual.Inc. <dbl> …
## $ notes_After.months.of.steadily.declining.stock.prices..Global.Crossing.Ltd..Chief.Executive.Officer.Leo.Hindery.resigned.Wednesday..Vice.Chairman.Thomas.Casey.will.take.Hindery.s.place..Hindery.will.remain.in.his.role.as.chairman.and.CEO.of.GlobalCenter..the.company.s.Web.hosting.subsidiary..until.the.completion.of.GlobalCenter.s.sale.to.Exodus.Communications..expected.early.next.year <dbl> …
## $ notes_As.expected..former.Sun.Microsystems.CEO.Jonathan.Schwartz.confirmed.that.he.is.leaving.the.venerable.server.and.software.company.now.that.it.s.been.acquired.by.Oracle. <dbl> …
## $ notes_AT.T.announced.that.John.Stankey.will.be.CEO.of.AT.T.Entertainment...Internet.Services..responsible.for.leading.its.combined.DIRECTV.and.AT.T.Home.Solutions.operations..AT.T.has.completed.its.acquisition.of.DIRECTV..Stankey.will.report.to.Stephenson..DIRECTV.President..Chairman.and.CEO.Mike.White.announced.his.plans.to.retire. <dbl> …
## $ notes_Barnett.Grace.was.listed.as.the.First.Commercial.Corp.s.Chairman.of.the.Board..Chief.Executive.Officer..President..Director..Pursuant.to.an.Agreement.and.Plan.of.Merger..dated.as.of.February.8.1998..by.and.between.Regions.and.FCC..and.in.consideration.thereof..FCC.issued.an.option.to.Regions.on.February.8..1998.to.purchase..under.certain.conditions..up.to.7.480.450.shares.of.FCC.Common.Stock.subject.to.adjustment.under.certain.circumstances.at.a.purchase.price.of..59.00.per.share..subject.to.adjustment.pursuant.to.anti.dilution.provisions..Regions.is.the.corporation.surviving.from.the.merger..Barnett.Grace.assumed.the.title.of.president.of.Regions.West.August.1..1998.at.the.merger.of.First.Commercial.Corporation.with.Regions..He.joined.Commercial.National.Bank.of.Little.Rock.in.1972..When.the.bank.merged.to.form.First.Commercial.Bank..Arkansas..largest.bank..he.served.as.vice.chairman.of.the.bank.and.president.of.the.newly.formed.First.Commercial.Corporation..Through.the.years.he.held.the.positions.of.president..CEO.and.chairman.of.the.bank.while.he.became.vice.chairman..president..chief.operating.officer.and.then.chairman.and.CEO.of.First.Commercial.Corporation..Aug.9..1999..Grace.Exits.from.Regions.Post.and.Fleischauer.was.named.as.successor. <dbl> …
## $ notes_Bernd.Beetz.has.advised.the.Coty.Board.of.Directors.of.his.decision.to.retire.as.chief.executive.officer.of.the.global.beauty.company..At.its.meeting.in.New.York.yesterday..the.Coty.board.accepted.his.decision.and.unanimously.appointed.Michele.Scannavini.as.his.successor.effective.August.1. <dbl> …
## $ notes_Carl.Grimstad..who.founded.iPayment.Inc..in.the.1990s..claims.the.board.of.directors.violated.his.employment.agreement.when.it.fired.him.without.required.notice...The.company.ended.up.in.a.tangle.of.private.placement.and.debt.problems..It.eventually.was.sold.into.a.private.entitey.and.the.ousted.CEO.was.suing.for.back.payments.and.other.violations.of.terms <dbl> …
## $ notes_Chairman.of.the.Board.and.Chief.Executive.Officer.of.the...Company.since.October.1996..President.and.Chief.Operating...Officer.of.the.Company..1994.1996..Executive.Vice.President....Fabricated.Products.of.the.Company..1993.1994..Director....Union.Camp.Corporation..Federal.Reserve.Bank.of.Richmond.and...Universal.Corporation. <dbl> …
## $ notes_Chowdry..46..at.the.time..died.when.his.private.plane.crashed.shortly.after.takeoff.as.per.the..Wall.Street.Journal. <dbl> …
## $ notes_Clearly.was.planned.as.a.retire...article.shows.almost.2.full.years.in.advance.to.properly.transision.to.new.leadership. <dbl> …
## $ notes_Concerto.Software.Inc..and.Aspect.Communications.Corporation..NASDAQ..ASPT..today.announced.a.definitive.agreement.to.combine.the.companies..Under.the.agreement..Aspect.shareholders.will.receive..11.60.in.cash.for.each.share.of.common.stock..which.represents.an.approximate.15..premium.to.the.average.closing.price.over.the.last.30.trading.days..The.holder.of.Aspect.Series.B.Preferred.Stock.will.receive.an.equivalent.amount.of.cash.per.share.on.an.as.converted.basis..Based.on.the.number.of.shares.of.Aspect.common.stock..common.stock.options.and.Series.B.Preferred.Stock.outstanding.on.July.4..2005..the.transaction.is.valued.at.approximately..1.0.billion. <dbl> …
## $ notes_Conrades.made.many.sacrafices.in.order.for.Akamai.to.be.succesful.in.the.years.prior.to.his.retirement..He.took.pay.cuts..endured.personal.losses..and.an.economic.downturns.yet.perservered.to.make.the.company.strive.during.his.tenure..The.compnay.was.on.the.rise.when.he.decided.to.retire.as.CHief.Executive.Officer.yet.remained.with.the.company.as.executive.chairman. <dbl> …
## $ notes_Digital.Insight.announced.that.Mr..Dorman..its.chairman..C.E.O...and.president..planned.to.retire.within.the.time.span.of.a.year.and.a.half.on.23.May.2003..The.executive.search.ended.on.1.Aug..2003.when.Mr..Dorman.retired.from.all.of.his.official.duties.with.the.company..A.CreditUnionTimes.interview.with.Mr..Dorman.shed.more.light.surrounding.the.circumstances.of.his.departure..Mr..Dorman.qualified.the.use.of.the.term..retiring..by.saying.that.it.meant.not.working.full.time.with.one.company.and.receiving.periodic.pay.checks..Mr..Dorman.said.that.the.decision.to.retire.young.at.the.age.of.52.years.was.a.long.time.in.the.works..and.that.he.looked.forward.to.engaging.in.new.opportunities.along.with.his.wife..Some.of.the.activities.he.listed.as.being.particularly.suited.to.him.were.travel..mentoring..and.philanthropy..Seeing.as.how.Mr..Dorman.was.not.seeking.to.gain.employment.with.another.company..it.can.be.safely.assumed.that.the.man.was.true.to.his.word.in.retiring. <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..David.W..Sear.resigned.in.August.1996.and.Mr..Arnold.will.not.be.standing.for.re.election.as.a.director..In.August.1996.Mr..Boreen.was.appointed.by.the.board.of.directors.as.interim.CEO.pending.the.search.by.the.Company.for.a.new.CEO...Changed.to.3...quitting.everything.and.an.insider.takes.over.as..interim..suggests.forced <dbl> …
## $ notes_Drug.distributor.McKesson.HBOC.Inc..on.Monday.named.Co.chief.Executive.John.Hammergren.as.sole.CEO..and.said.it.would.revamp.its.Internet.unit.and.cut.an.unspecified.number.of.jobs..The.other.co.CEO..David.L..Mahoney..is.leaving.the.San.Francisco.based.health.care.company..No.reason.was.given.for.his.departure. <dbl> …
## $ notes_Early.in.1998..as.part.of.a.carefully.planned.succession..Harry.Cornell..Jr...announced.that.he.would.retire.as.CEO.in.May.1999..although.he.would.continue.to.serve.as.chairman.of.the.board.of.directors. <dbl> …
## $ notes_Fishman.deicded.to.step.down.from.CEO.as.he.developed.a.neurodegenerative.condition.that.appeared.to.be.a.form.of.ALS. <dbl> …
## $ notes_Former.T..Rowe.Price.Group.Inc..CEO.James.A.C..Kennedy.has.a.new.gig.lined.up.for.retirement..Help.pilot.an.airline.that.s.gone.though.a.lot.of.turbulence.lately..He.joins.the.airline.s.board.after.stepping.down.as.CEO.at.T..Rowe..NASDAQ..TROW..at.the.beginning.of.the.year..He.is.preparing.to.officially.retire.from.the.Baltimore.money.manager.March.31.but.will.remain.on.its.board.until.April. <dbl> …
## $ notes_From.1970.until.December.31..1997..Mr..Williams.was.Chairman.of.the.Board.and.Chief.Executive.Officer.of..BELL.INDUSTRIES.IN..He.resigned.as.Chief.Executive.Officer.on.December.31..1997..but.remained.Chairman..On.February.1..1999..he.became.Co.Chairman.. <dbl> …
## $ notes_George.Klaus.has.been.a.director.of.the.Company.since.February.1996..and.has.been.Chairman.of.the.Board.since.September.1996..On.January.19..2009..he.became.the.Company.s.President.and.Chief.Executive.Officer..Mr..Klaus.served.as.Executive.Chairman.of.the.Company.from.February.19..2008.through.January.15..2009..Mr..Klaus.served.as.Chief.Executive.Officer.of.the.Company.from.February.1996.through.February.19..2008.. <dbl> …
## $ notes_Having.completed.one.of.the.most.dramatic.and.high.profile.corporate.restructurings.in.the.aerospace.industry..Donald.R..Beall.on.Wednesday.made.the.surprise.announcement.that.he.will.step.down.as.chairman.and.chief.executive.of.Rockwell.International.on.Sept..30..He.will.be.succeeded.by.Don.H..Davis..who.has.been.Rockwell.s.president.and.chief.operating.officer.since.1995. <dbl> …
## $ notes_Hawley..who.stepped.down.immediately..will.be.temporarily.replaced.by.two.men..Edward.F..DeGraan..57..will.be.promoted.to.chief.executive.from.president.and.chief.operating.officer..And.Richard.R..Pivirotto..70..a.board.member.since.1980..will.be.acting.chairman..Indications.are.that.performance.was.bad.and.the.management.was.not.a.good.fit..Big.jump.in.share.price.as.his.departure.was.annoucnced <dbl> …
## $ notes_He.appears.to.have.named.his.own.successor.and.transitioned.immediatley.to.board.chairman.following.his.retirement...The.coverage.talked.about.the.jump.in.revenue.and.profit.in.his.last.year. <dbl> …
## $ notes_He.did.leave.before.the.mandated.time.but.most.coverage.was.kind.and.talked.about.his..turnaround..at.the.company..He.might.not.really.have.earned.his.stripes.as.a.retailer.so.much.as.a.corporate.credit.card.magnate.but.good.coverage.generally. <dbl> …
## $ notes_He.left.the.CEO.chair.but.moved.to.chairman.and.stayed.there.for.7.years..An.insider.took.over.his.role.who.had.been.with.the.company.for.17.years....Hininger. <dbl> …
## $ notes_He.stepped.in.as..principal.executive.officer..when.leblanc.left..Arnold.works.for.a.holding.company.that.owns.handy.and.harman..H.H.do.not.pay.him.directly.but.everyone.else.got.less.money..The.company.then.went.private.for.a.couple.years...2004.to.2007...When.it.emerged.again..he.was.not.on.the.sheets..There.is.a.10k.that.shows.him.as..former..executive..He.was.also.chairman.for.less.than.a.year.and.was.shown.as.resigned.effective.August.10.2005...He.was.given.a.bonus.and.severance.payment..The.bonus.was.part.of.a.chapter.11.paln...A.Mr.Trangucci.was.the.CEO.during.this.time.as.well.but.he.did.not.show.up.on.a.public.filing..Only.listed.in.passing.as.former.CEO.in.2005.10k..I.think.this.guy.was.just.here.to.turn.it.around.and.then.left...Looking.through.the.filings..it.looks.like.the.company.went.to.bankruptcy.and.stopped.reporting.as.a.listed.company. <dbl> …
## $ notes_He.was.fired.follwing.its.stock.price.down.roughly.17.percent.since.July..14...and.employees..with.a.3.percent.staff.cut.nationwide <dbl> …
## $ notes_Howard.E..Cosgrove.was.Chairman.and.Chief.Executive.Officer.of.Conectiv.and.its.predecessor.Delmarva.Power.and.Light.Company.from.December.1992.to.August.2002..On.February.25..1998..the.SEC.issued.an.order.approving.the.Application.Declaration.on.Form...U.1.previously.filed.by.Conectiv..Inc..under.Section.9.a..2..of.the.Public.Utility.Holding.Company.Act.of.1935..as.amended..The.order.approved.the.combination.of.Delmarva.Power...Light.Company.and.Atlantic.Energy..Inc...pursuant.to.which.Delmarva.and.its.direct.subsidiaries.and.the.direct.subsidiaries.of.Atlantic.will.become.direct.subsidiaries.of.Conectiv..a.Delaware.holding.company..The.merger.will.be.effective.on.March.1..1998..As.previously.announced..the.chairman.and.CEO.of.Conectiv.will.be.Howard.E..Cosgrove..Delmarva.Power...Light..based.in.Wilmington..Delaware..acquired.Atlantic.Energy..the.parent.of.Atlantic.City.Electric..for..968.million.and.formed.Conectiv. <dbl> …
## $ notes_In.1974.he.was.appointed.CEO.of.P...G.Italy..in.1978..returned.to.the.US.and.was.elected.vice.president.in.1980..in.1984.he.joined.the.company.s.Board.of.Directors.and.in.1986.became.president..CEO..of.the.company.Procter...Gamble..Having.worked.in.P...G.for.38.years..John.E..Pepper.left.the.company.as.a.Chairman.of.the.Board.of.Directors.in.2002. <dbl> …
## $ notes_In.connection.with.execution.of.the.Company.s.management.succession.plan.in.2006..the.Compensation.and.Corporate.Governance.Committees.retained.Hewitt.Associates.to.assist.in.the.evaluation.of.compensation.of.Mr..Adderley.as.Chairman.of.the.Board.of.Directors..which.is.a.non.officer.position..commencing.in.May.of.that.year..Mr..Adderley.as.an.employee.is.able.to.participate.in.the.Company.s.benefit.plans.and.Management.Retirement.Plan. <dbl> …
## $ notes_In.mid.1999.CTP.hired.Bruce.Culbert.as.vice.president.of.interactive.solutions..He.was.previously.involved.in.the.start.up.of.IBM.Interactive.Media.and.led.an.1.100.person.consulting.practice.at.IBM.Global.Services..Shortly.thereafter.CEO.James.Sims.announced.he.would.be.retiring.from.CTP..effective.July.30..Succeeding.Sims.was.Jack.Messman..a.one.time.president.and.CEO.of.Novell.Inc..and.former.chairman.and.CEO.of.Pacific.Resources.Group.Inc..Messman.was.also.a.director.of.Safeguard.Scientifics.and.had.been.a.member.of.CTP.s.board.since.1992. <dbl> …
## $ notes_International.Game.Technology.President.and.Chief.Executive.TJ.Matthews..resignation.from.those.two.posts.will.likely.be.followed.by.his.departure.as.chairman.at.some.point.in.the.future..a.JPMorgan.analyst.said.Wednesday...JPMorgan.s.Joseph.Greff.said.Matthews..departure.was.not.shocking.given.his.contract.expires.later.this.year..but.questioned.how.long.the.executive.would.stay.on.as.chairman. <dbl> …
## $ notes_It.was.stated.that.Simpson.voluntarily.resigned..however..6.months.before.XTO.Energy.bought.Hunt.Petroleum..It.was.then.a.month.prior.to.ther.retirement.of.Simpson..that.he.sold.30...2.8.million.shares..of.his.holdings.and.then..retired...In.following.articles.a.few.months.after.his.retirement.it.was.quoted.that.he.could.have.been.insider.trading.as.he.was..unsually.active..and.trading.with.XTO..Changed.to.5...although.he.was.called.for.buying.XTO.stock.and.trading..he.maintained.a.very.visble.role.in.the.company.activites.through.when.the.firm.was.acquired.by.Exxon..He.stpped.into.the.chairman.role.after.the.CEO.slot <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_Kunin.retired.as.chief.executive.officer.at.the.end.of.the.fiscal.year.1996..but.retained.his.position.as.chairman.of.the.board.in.2008.Link..Left.as.chairman.of.the.board..Regis.President.and.Chief.Operating.Officer.Finkelstein.succeeded.him. <dbl> …
## $ notes_Laurence.Alan.Tisch.was.chairman.and.CEO.of.CBS.from.1986.95..and.his.reign.was.tumultuous..Tisch.sold.CBS.to.the.Westinghouse.Corporation.in.1995..On.August.1..1995..the.Board.of.Directors.of.each.of.Westinghouse.and.the.Company.independently.met.and.approved.the.Merger..On.a.report.dated.Nov.25..1995..Westinghouse.Electric.Corp..said.yesterday.it.has.completed.the..5.4.billion.purchase.of.CBS.Inc..to.become.the.nation.s.biggest.broadcaster..Under.the.agreement..each.outstanding.share.of.CBS.common.stock.was.converted.into.the.right.to.receive..82.065.in.cash..CBS.shares.were.unchanged.at..81.875..Westinghouse.shares.were.unchanged.at..16.125..The.acquisition.gained.Federal.Communications.Commission.approval.Wednesday..Westinghouse.will.keep.the.CBS.name.and.logo.for.its.broadcast.operations..CBS.will.merge.with.Westinghouse.s.Group.broadcasting.unit. <dbl> …
## $ notes_Lyn.Kirby.was.replaced.by.President.and.C.O.O..Chuck.Rubin.as.C.E.O..in.a.troubling.period.for.the.company..Jefferies...Co..disseminated.a.negative.research.entry.on.Ulta.Salon.before.its.second.quarter.report.was.even.published..prompting.numerous.share.sales.by.anxious.stockholders..Ulta.Salon.was.struggling.financially.as.a.company..and.so.its.Board.of.Directors.selected.an.insider.to.take.over.for.its.current.C.E.O..Miss.Kirby.was.partially.compensated.with.a.seat.on.the.Board.of.Directors.through.March.2011..but.the.signal.for.her.to.leave.was.crystal.clear. <dbl> …
## $ notes_Matthew.Emmens.stepped.down.as.CEO.of.Vertex.Pharmaceuticals..Company.faced.challenges.in.the.hep.C.market..with.Pharmasset.s...VRUS..interferon.free.treatment.against.the.disease.in.late.stage.development..Pharmasset.s.drug.could.offer.an.effective.treatment.for.the.liver.damaging.disease.without.the.side.effects.of.treatments.on.the.market.that.rely.on.interferon.like.Incivek. <dbl> …
## $ notes_McCaw..61..got.his.start.in.wireless.in.1981..He.and.his.brothers.purchased.spectrum.licenses.and.built.the.early.cell.phone.giant.McCaw.Cellular..which.they.sold.to.AT.T..NYSE.T..in.1993.for..11.5.billion..October.3..1994..AT.T.Corp.and.McCaw.Cellular.Communications.Inc..completed.their.merger..After.selling.McCaw.Cellular..McCaw.remained.involved.in.several.wireless.ventures..including.satellite.firm.Teledesic.and.Nextel.Communications..In.2003..he.founded.Clearwire..which.eventually.merged.with.Sprint.s.WiMAX.business.in.2008.to.form.the..new..Clearwire..and.received.an.infusion.of..3.2.billion.in.capital.from.Google..NASDAQ.GOOG...Intel..Comcast.and.others..Clearwire.received.a..1.56.billion.cash.infusion.from.Sprint.and.other.investors.last.year..but.has.continued.to.need.additional.capital. <dbl> …
## $ notes_Mead.s.chairman..president.and.chief.executive..Jerome.F..Tatar..will.serve.as.chairman.of.the.combined.company..and.John.A..Luke.Jr...Westvaco.s.chairman.and.CEO..will.be.CEO.and.president. <dbl> …
## $ notes_MIDLAND..Texas..Nov..29..2018..GLOBE.NEWSWIRE.....Diamondback.Energy..Inc...NASDAQ..FANG....Diamondback...today.announced.that.it.has.completed.its.acquisition.of.Energen.Corporation..NYSE..EGN....Energen... <dbl> …
## $ notes_Millipore.Corporation..NYSE.MIL..announced.that.its.new.President.and.CEO..Martin.D..Madaus..will.start.on.January.1..2005..Dr..Madaus.will.also.join.Millipore.s.Board.of.Directors.on.January.1..Dr..Madaus.will.assume.the.role.of.President.and.CEO.from.Francis.J..Lunger..who.will.remain.as.Chairman.of.the.Board.until.March.1..2005. <dbl> …
## $ notes_Monteith..who.marked.his.61st.birthday.this.month..said.he.has.no.plans.to.step.down.until.he.reaches.65..when.company.rules.require.policy.making.employees.to.retire..He.was.replace.by.Daniel.J..Miglio.as.chairman.in.1994. <dbl> …
## $ notes_Mr.Sigismundus.W.W..Lubsen...formely.a.Class.1.Director..resigned.as.President.and.CEO.and.as.a.Director.of.the.company.effective.July.31..1995. <dbl> …
## $ notes_Mr..Brady.retired.from.his.position.as.Chief.Executive.Officer.and.resigned.as.a.member.of.the.Board.of.Directors.of.St..Joe.effective.August.14..2014..The.management.shakeup.came.after.fund.manager.Bruce.Berkowitz..who.controls.29.percent.of.St..Joe.s.stock..threatened.a.proxy.fight.and.gained.control.of.the.board.of.directors.....Berkowitz.said.at.the.time.he.was.unhappy.with.the.pace.of.development.at.the.real.estate.company..St..Joe.s.development.activity.has.just.about.stopped.with.the.collapse.of.the.real.estate.market.over.the.past.few.years. <dbl> …
## $ notes_Mr..Bryson.retired.as.C.E.O...chairman..and.president.of.Edison.International.on.31.July.2008..marking.the.end.of.a.17.year.tenure.as.chief.executive..Mr..Bryson.s.retirement.was.publicized.ahead.of.time.on.25.Oct..2007.in.a.corporate.press.release..as.well.as.the.appointment.of.Mr..Craver..Jr..to.succeed.him.in.the.aforementioned.positions.upon.the.effective.date.of.retirement. <dbl> …
## $ notes_Mr..McAlister.noted.that.Daniel.D..Rosenthal..Downey.s.current.President.and.Chief.Executive.Officer..will.continue.to.provide.his.experience.and.expertise.to.Downey..as.he.will.remain.on.the.Board.of.Directors.and.will.be.President.of.DSL.Service.Company..Downey.s.successful.real.estate.development.subsidiary......Changed.code.to.3..Downey.Financial.posted.a.loss.of..219.million.for.the.quarter.during.which.Daniel.Rosenthal.left..It.was.double.the.analysts..estimates..Share.prices.fell.by.95..over.the.last.one.year..The.exit.of.Chairman.and.Co.Founder..Maurice.McAllister.followed.by.that.of.the.CEO.was.seen.as.an.opportunity.for.the.company.to.seek.external.help.to.revive.itself. <dbl> …
## $ notes_Mr.Manganello.served.as.the.CEO.of.Borgwarner.Inc.for.10.years..He.was.62.when.he.retired.from.the.position.of.CEO..He.remained.executive.chairman.after.his.retirement..He.retired.as.executive.chairman.in.April.2013. <dbl> …
## $ notes_MSC.moves.into.a.new.210.000.square.foot.headquarters.in.Elk.Grove..Illinois..Evans.steps.down.as.CEO.and.is.replaced.by.Gerald.G..Nadig..although.he.stayed.on.as.chairman. <dbl> …
## $ notes_NASHVILLE..Tenn....MUSCATINE..Iowa...BUSINESS.WIRE...Bridgestone.Americas.Holding..Inc...BSAH..has.completed.its..1.05.billion.cash.merger.with.Bandag..Incorporated..Bandag.........The.closing.occurred.May.31..2007. <dbl> …
## $ notes_On.February.18..1999..Merck...Co...Inc....Merck...and.Merck.Medco.Managed.Care..L.L.C....Merck.Medco...filed.a.complaint.in.the.Superior.Court.of.New.Jersey.against.the.Company..CareInsite..Martin.J..Wygod..Chairman.of.the.Company..and.Paul.C..Suthern..Roger.C..Holstein.and.Charles.A..Mele..officers.and.or.directors.of.the.Company..Merck.and.Merck.Medco.asserted.that.the.Company..CareInsite.and.the.individual.defendants.were.in.violation.of.certain.non.competition..non.solicitation.and.other.agreements..Careinsight.was.sold.to.healtheon.in.2000.and.suthern.had.a.role.in.the.new.company <dbl> …
## $ notes_Orsini.retired.in.2001..He.stayed.on.the.board.of.the.directors.and.stayed.on.at.the.company.in.a.consulting.capacity..In.2006.he.served.as.interim.CEO.and.then.went.back.into.retirement. <dbl> …
## $ notes_P.Com..Inc...OTCBB.PCOM...a.worldwide.provider.of..wireless.telecom.products.and.services..today.announced.that.it.has.appointed..Sam.Smookler..the.former.CEO.of.Stratex.Networks.and.a.telecom.industry.leader..with.more.than.30.years.of.experience..as.President.and.Chief.Executive.Officer.....Smookler..whose.appointments.are.effective.immediately..was.also.named.to..P.Com.s.Board.of.Directors..George.Roberts..P.Com.s.Chairman.of.the.Board.and..acting.CEO.since.January.2002..will.remain.Chairman. <dbl> …
## $ notes_PFG.went.private.and.CEO.did.not.take.over...went.on.to.be.on.board.at.Owens...Minor <dbl> …
## $ notes_PHILADELPHIA....Sunoco.Inc..Chairman.and.Chief.Executive.Robert.H..Campbell.will.retire.in.mid.2000..he.announced.Thursday..Campbell.was.serving.as.Sunoco.chairman.and.CEO.after.a.distinguished.40.year.career.with.the.company. <dbl> …
## $ notes_PORTLAND..Ore....BUSINESS.WIRE...Feb..8..2000..Portland.General..Electric..PGE..announced.today.that.Ken.L..Harrison..PGE.Chairman..and.Chief.Executive.Officer.will.retire.on.March.31..2000.after.25..years.of.service.at.the.Portland.based.electric.utility..Current.PGE..President..Peggy.Fowler.will.lead.the.company.as.President.and.CEO..upon.Harrison.s.departure..Subsequent.to.the.merger.with.Enron..Harrison.also..served.as.Vice.Chairman.of.Enron.and.Chairman.of.Enron.Communications..until.December.1999. <dbl> …
## $ notes_President.and.chief.executive.officer.John.Furman.resigned.from.Rural.Metro.Corp..in.hopes.of.taking.over.Lake.County.s.ambulance.services. <dbl> …
## $ notes_Ralph.L..Cheek.has.served.as.a.director.since.May.1987..Mr..Cheek.served.as..Chairman..President.and.Chief.Executive.Officer.of.the.Corporation.and.its.predecessors.from.1987.to.August.1994...On.Oct..21..2004..IMCO.Recycling.Inc..and.Commonwealth.Industries..Inc...announced.today.that..following.the.completion.of.their.proposed.merger..they.will.name.the.merged.company.Aleris.International..Inc..Other.sources..When.it.became.apparent.that.it.was.time.to.follow.opportunities.in.the.international.marketplace..IMCO.undertook.an.executive.management.reorganization..Ralph.Cheek.stepped.down.from.his.domestic.leadership.position.in.order.to.pursue.international.opportunities.for.the.company..Replacing.him.as.interim.CEO.was.Don.V..Ingram..formerly.a.chairman.of.International.Metal.Company..IMCO.board.member..and.a.major.shareholder.of.IMCO.stock....Read.more..https...www.referenceforbusiness.com.history2.68.IMCO.Recycling.Incorporated.html.ixzz6Op2ARUNJ <dbl> …
## $ notes_Retired.Chairman.of.the.Board.of.U.S..Trust.Corporation..Mr..Schwarz..who.is.Chairman.of.the.Company.s.Executive.Committee..also.serves.as.a.director.of.U.S..Trust.Company.and.the.Atlantic.Mutual.Companies..He.was.first.elected.to.the.Company.s.Board.of.Directors.in.1986.and.has.served.as.a.director.continuously.since.then..He.is.a.Class.III.director..His.term.will.expire.in.2005..Company.was.sold.to.schwab.in.2000 <dbl> …
## $ notes_SAN.DIEGO..Nov..2..2010..PRNewswire.FirstCall.....CareFusion.Corp...NYSE..CFN...a.leading..global.medical.device.company..announced.today.that.David.L..Schlotterbeck..chairman.and.CEO..will.retire.on.Feb..28..2011........With.an.experienced.leadership.team.in.place.and.a.solid.year.behind.us.as.a.public.company..I.am.confident.that.I.ll.leave.CareFusion.in.an.excellent.position.to.continue.to.grow.well.into.the.future...Schlotterbeck.said...We.established.a.differentiated.vision.to.lower.the.cost.and.improve.the.safety.of.health.care.for.generations.to.come..and.have.executed.against.it.with.an.enviable.portfolio.of.industry.leading.medical.devices.and.services.for.our.customers.worldwide..I.am.proud.of.the.company.and.our.position.in.the.industry.as.I.anticipate.this.new.phase.in.my.life.. <dbl> …
## $ notes_Sanford..Chairman.of.the.Board..Chief.Executive.Officer..and.Executive.Founder.of.STERIS.Corporation..announced.that.he.will.retire.July.21..2000..Sanford.has.been.the.corporation.s.only.Chairman.and.Chief.Executive.Officer.since.its.inception.in.1987..Sanford.will.continue.to.be.associated.with.STERIS.as.Executive.Founder.and.Special.Executive.Advisor.to.the.Company.s.Board.of.Directors...As.a.part.of.a.management.succession.plan..Les.C..Vinney.was.named.to.the.newly.created.position.of.president.and.COO.on.March.21..2000..The.Board.expects.to.name.Vinney.as.CEO.and.elect.current.board.member.Dr..Jerry.E..Robertson.as.non.executive.chairman.to.succeed.Sanford. <dbl> …
## $ notes_Shares.rose.on.the.annoucement..Quoated.an.analyst..Genworth.has.experienced.incessant.negative.pressures.for.the.last.four.plus.years..and.I.think.it.must.have.been.enough.for.Mike.Fraizer.at.this.stage.. <dbl> …
## $ notes_Stanley.J..Bright.was.vice.president.finance..Chief.Financial.Officer..Iowa.Illinois.Gas...Electric.Company..Davenport..Iowa...1986.1990..president..Iowa.Illinois.Gas...Electric.Company..Davenport..Iowa..since.1990..chief.operating.officer..Iowa.Illinois.Gas...Electric.Company..Davenport..Iowa...1990.1991..chairman..Chief.Executive.Officer..Iowa.Illinois.Gas...Electric.Company..Davenport..Iowa...since.1991..At.a.special.meeting.held.December.21..1994.shareholders.of.Iowa.Illinois.Gas.and.Electric.Company..an.Illinois.corporation..approved.the.Agreement.and.Plan.of.Merger..dated.as.of.July.26..1994..as.amended.and.restated.as.of.September.27..1994...among.Iowa.Illinois..Midwest.Resources.Inc...an.Iowa.corporation..and.Midwest.Power.Systems.Inc...an.Iowa.corporation.and.a.subsidiary.of.Resources...and.a.newly.formed.corporation..MidAmerican.Energy.Company..The.two.companies.announced.the.merger.agreement.on.July.27..1994..Iowa.Illinois.common.shareholders.will.receive.1.47.shares.of.MidAmerican.common.stock.for.each.Iowa.Illinois.common.share..Midwest.Resources.common.shareholders.will.receive.one.share.of.MidAmerican.common.for.each.share.of.Midwest.common..The.shareholders.of.Iowa.Illinois.will.own.44.percent.of.MidAmerican..and.Midwest.Resources.shareholders.will.own.56.percent. <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.court.document.in.the.second.attached.link.provides.substantial.evidence.that.Sabolinski.was.fired..He.allegedly.took.steps.to.mislead.shareholders.and.others.about.the.high.value.of.Organogenesis..stocks..he.then.sold.a.large.amount.of.his.holdings.in.the.company.and.gained.a.large.amount.of.profit..the.court.case.and.threat.of.charges.is.most.likely.why.he.left.although.there.is.little.media.surrounding.the.incident. <dbl> …
## $ notes_The.Genzyme.Corporation.said.yesterday.that.it.had.agreed.to.acquire.Biomatrix.Inc..for.about..738.5.million.in.cash.and.stock..Genzyme.plans.to.combine.Biomatrix.with.two.of.its.separately.traded.units..Genzyme.Surgical.Products.and.Genzyme.Tissue.Repair..to.create.a.company.called.Genzyme.Biosurgery. <dbl> …
## $ notes_There.were.moves.among.the.first..under.the.renewed.leadership.of.Todd..whose.United.Co.....owner.of.8.percent.of.the.stock....began.waging.a.proxy.battle.in.fall.1999.to.oust.Garvey.and.the.board.of.directors...changed.to.3...activist.investor.pressure <dbl> …
## $ notes_Thomas.Voss..chairman.of.Ameren.Corp..since.2010.and.president.and.chief.executive.officer.since.2009..will.retire..effective.July.1..Warner.Baxter..who.has.served.as.chief.executive.officer.of.Ameren.Missouri.since.2009..will.replace.him. <dbl> …
## $ notes_Time.Warner.s.Jeff.Bewkes.has.bid.farewell.to.staff.in.a.video..a.day.after.AT.T.completed.its..65.billion.deal.to.acquire.the.media.giant.that.includes.Warner.Bros..HBO.and.Turner.Broadcasting......Bewkes..who.started.his.career.at.Time.Warner.selling.subscriptions.to.HBO..is.exiting.his.post.as.chairman.and.CEO.with.the.merger..the.second.biggest.in.media.history.behind.only.Time.Warner.s.ill.fated.tie.up.with.AOL..He.will.remain.with.the.company.as.a.senior.advisor.during.a.transition.period..with.AT.T.s.John.Stankey.taking.over.the.properties.under.the.newly.named.WarnerMedia.as.CEO. <dbl> …
## $ notes_Viets.is.the.retired.president..chief.executive.officer.and.director.of.CILCORP.Inc..Since.1999..he.is.president.of.ROV.Consultants..LLC..Since.1988..Viets.has.served.as.President.and.CEO.of.CILCORP.Inc..He.is.also.CEO.of.the.company.s.major.subsidiaries...CILCO..QST.Enterprises.Inc...which.provides.energy.related.services.and.products.throughout.the.U.S...and.Environmental.Science.and.Engineering..Inc..On.November.1998..AES.Corp...AES..has.agreed.to.buy.the.utility.company.CILCORP.Inc..for..885.million..the.companies.said.Monday..Subject.to.the.approval.of.CILCORP.shareholders.as.well.as.the.sanction.of.regulatory.agencies..the.companies.expect.the.deal.to.close.in.mid.1999..On.October.18..1999..AES.completed.its.acquisition.of.CILCORP.through.a.merger.transaction.in.accordance.with.the.Agreement.and.Plan.of.Merger.dated.as.of.November.22..1998..CILCORP.survived.the.Merger.as.a.wholly.owned.subsidiary.of.AES. <dbl> …
## $ notes_W..Hall.Wendel..Jr...stepped.down.as.CEO.in.May.1999..remaining.a.major.shareholder.as.well.as.board.chairman..Thomas.Tiller..president.and.chief.operating.officer.since.the.previous.summer..became.the.new.CEO. <dbl> …
## $ sources_Dobbs..K...2008..Aug.01...Did.an.exit.add.options.to.review.at.downey..American.Banker.Retrieved.from.http...umiss.idm.oclc.org.login.url.https...search.proquest.com.umiss.idm.oclc.org.docview.249529527.accountid.14588..https...www.sec.gov.Archives.edgar.data.935063.000093506304000002.k012304_8kexhibit.htm..https...www.latimes.com.archives.la.xpm.2008.sep.23.fi.downey23.story.html..https...www.recode.net.2015.7.28.11615170.citrix.ceo.to.resign.elliott.management.gets.a.board.seat..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.03.02.2008.cd_max.10.30.2008.tbm.nws.q.Daniel.Rosenthal.DOWNEY.FINANCIAL.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.01.03.2008.cd_max.09.29.2008.tbm.nws.q.Daniel.Rosenthal.DOWNEY.FINANCIAL..https...www.google.com.search.q.Daniel.Rosenthal.DOWNEY.FINANCIAL <dbl> …
## $ sources_http...getfilings.com.sec.filings.110429.EPICOR.SOFTWARE.CORP_10.K.A. <dbl> …
## $ sources_http...investors.owens.minor.com.news.releases.news.release.details.robert.c.sledd.chairman.performance.food.group.will.join.owens..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.02.2006.cd_max.01.30.2007.tbm.nws.q.Robert.Sledd.PERFORMANCE.FOOD.GROUP.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.04.04.2006.cd_max.12.30.2006.tbm.nws.q.Robert.Sledd.PERFORMANCE.FOOD.GROUP..https...www.google.com.search.q.Robert.Sledd.PERFORMANCE.FOOD.GROUP <dbl> …
## $ sources_http...ir.corecivic.com.news.releases.news.release.details.cca.board.directors.appoints.mark.emkes.chairman.http...ir.corecivic.com.news.releases.news.release.details.john.d.ferguson.former.commissioner.finance.and.administration.https...www.globenewswire.com.news.release.2009.08.17.1223187.0.en.Corrections.Corporation.of.America.Announces.Damon.Hininger.to.Succeed.John.Ferguson.as.Chief.Executive.Officer.html...https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.16.2009.cd_max.02.13.2010.tbm.nws.q.John.Ferguson.CORECIVIC.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.04.18.2009.cd_max.01.13.2010.tbm.nws.q.John.Ferguson.CORECIVIC..https...www.google.com.search.q.John.Ferguson.CORECIVIC <dbl> …
## $ sources_http...media.corporate.ir.net.media_files.irol.10.101908.leggett.platt_ebook.pdf <dbl> …
## $ sources_http...www.fundinguniverse.com.company.histories.cambridge.technology.partners.inc.history. <dbl> …
## $ sources_http...www.fundinguniverse.com.company.histories.material.sciences.corporation.history. <dbl> …
## $ sources_http...www.fundinguniverse.com.company.histories.polaris.industries.inc.history. <dbl> …
## $ sources_http...www.fundinguniverse.com.company.histories.regis.corporation.history. <dbl> …
## $ sources_https...apnews.com.article.56568d9c0a222701f0457e4898023000 <dbl> …
## $ sources_https...boards.fool.com.conrades.payday.20369326.aspx..https...www.marketwatch.com.story.akamai.chairman.george.conrades.to.retire.2018.03.27..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.11.30.2004.cd_max.07.30.2005.tbm.nws.q.George.Conrades.AKAMAI.TECHNOLOGIES.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.10.02.2004.cd_max.06.29.2005.tbm.nws.q.George.Conrades.AKAMAI.TECHNOLOGIES..https...www.google.com.search.q.George.Conrades.AKAMAI.TECHNOLOGIES <dbl> …
## $ sources_https...docoh.com.filing.1088917.0000950144.00.009120.8K.file.2..https...sec.report.Document.0000950130.99.005475....https...www.wsj.com.articles.SB950540028991628340 <dbl> …
## $ sources_https...en.wikipedia.org.wiki.Sports_Authority..https...www.snewsnet.com.news.marty.hanaka.finds.redemption.at.the.sports.authority.says.forbes..http...getfilings.com.o0001047469.05.010219.html..https...www.sec.gov.Archives.edgar.data.912262.000104746905011564.a2156626zdef14a.htm <dbl> …
## $ sources_https...gsom.spbu.ru.en.gsom.board.pepper. <dbl> …
## $ sources_https...investors.quakerhoughton.com.node.9236.html <dbl> …
## $ sources_https...ir.diamondbackenergy.com.news.releases.news.release.details.diamondback.energy.inc.completes.acquisition.energen.corporation <dbl> …
## $ sources_https...lasvegassun.com.news.2009.mar.25.igt.president.resigns.board.member.take.over...https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.12.01.2008.cd_max.07.31.2009.tbm.nws.q.Thomas.Matthews.INTL.GAME.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.10.03.2008.cd_max.06.30.2009.tbm.nws.q.Thomas.Matthews.INTL.GAME..https...www.google.com.search.q.Thomas.Matthews.INTL.GAME <dbl> …
## $ sources_https...littlesis.org.person.6179.Howard_E_Cosgrove..https...www.sec.gov.Archives.edgar.data.27879.0000027879.98.000004.txt.https...pressofatlanticcity.com.business.atlantic.city.electric.to.become.part.of.energy.giant.exelon.article_244574e4.edec.11e3.aea0.001a4bcf887a.html. <dbl> …
## $ sources_https...money.cnn.com.2001.02.26.companies.mckesson...https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.11.30.2000.cd_max.07.30.2001.tbm.nws.q.David.Mahoney.MCKESSON.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.10.02.2000.cd_max.06.29.2001.tbm.nws.q.David.Mahoney.MCKESSON..https...www.google.com.search.q.David.Mahoney.MCKESSON <dbl> …
## $ sources_https...newsroom.edison.com.releases.edison.international.announces.management.succession.plan..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.04.01.2008.cd_max.11.29.2008.tbm.nws.q.John.Bryson.EDISON.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.02.02.2008.cd_max.10.29.2008.tbm.nws.q.John.Bryson.EDISON..https...www.google.com.search.q.John.Bryson.EDISON <dbl> …
## $ sources_https...nypost.com.2000.10.12.global.crossings.hindery.for.hire.quits.after.just.10.mos...http...www.internetnews.com.bus.news.article.php.482511.Global.Crossing.CEO.Hindery.is.Out.Casey.is.In.htm...https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.02.2000.cd_max.01.30.2001.tbm.nws.q.Leo.Hindery.GLOBAL.CROSSING.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.04.04.2000.cd_max.12.30.2000.tbm.nws.q.Leo.Hindery.GLOBAL.CROSSING..https...www.google.com.search.q.Leo.Hindery.GLOBAL.CROSSING <dbl> …
## $ sources_https...prabook.com.web.stanley_j.bright.1383054....https...sec.report.Document.0000052491.94.000025..__cf_chl_jschl_tk__.f3b97ac0b724d39fe00528512179d47974704628.1608589545.0.AXDEvW_rQ5YujFPw8nzI.RY.04Z8T6BG1.4edbnW0ToYkMka8qiajoYA2kir2loJRbnRDo8lNwXahTByaSlIPPVWG5VlyrGUWWMMySJFRCx7f_jHbTwoy8xYTYFdYczcgyypLameWHzs0k8rqa.D1r7c9PTwbOWZH.U2uuI_AezVINY0cDLYyQnF6SV.QfY6e6JJf69givDuO1NhkipuwJ54.MzmXgg8kMAlxrN1u87UPhwt1hJKPDBp5qOLety7u2rRTdA...fwsFNsjAO3pbTr.6o.FpHADmb6lDj0Zw9v1iIHm6PIsXN2fwSuKV_XbyZBf2F9RNsU_r8RKs9maSc24ihnmBq.o.BMF4yB3SFIg4lnfJd9GNA2b.a9GNLNyfwYA.k_heM9CRR8RLG0QLU. <dbl> …
## $ sources_https...richmond.com.business.genworth.ceo.michael.fraizer.resigns.from.top.positions.article_763ee9c6.b14a.5414.a676.c07d01347e69.html.https...www.wsj.com.articles.SB10001424052702304868004577378540962145440 <dbl> …
## $ sources_https...sec.report.Document.0000316769.96.000003..__cf_chl_jschl_tk__.4e6b0ee5c6e835b6240a7ebae0244ff94ba59883.1610059053.0.AZBTycFdkNLxcDiUlt4wZ.18.AtbMzvMG2hwPcWz26O10M53v.J7kQlZzrZQkrPSu4HJwi2RlPzEEJafCb3dRjMSgs4.hTRQgFsVa0Xfyo1BNJy92DylQHMnTLDCJ9ljdfI0GIpp55iNlNW9v5xDMQaQ_DYkXpPC1f4YPdJKKkzdhezlvBmGYudT_WW4EgAewoh.sFZGUDQqg31Yn.PCTxefWyyCf0xQA3Y3yaMOUzIl53kv3EgtonfPJR_Fg2Upc9HjyNA1Vo6uqZySwmC.UXOoImhFJDfSBfMKXC8TMYYWT.vppXl2WpzSeXPjrYOlwkxMj0qMdZ3Rehu3mUXbD_UjwLoSnW5OhG.FDz85ERv4TuiF0kWMky4y3w5kQN3dqpDtDmQj93TRBf67SYAW8zA....https...sec.report.Document.0000950133.98.000521.....http...www.corporate.ir.net.media_files.NSD.rgbk.reports.rgbk_062299_120_200.pdf....https...www.arkansasbusiness.com.print.article.67308. <dbl> …
## $ sources_https...sec.report.Document.0000745308.15.000007..__cf_chl_jschl_tk__.e72f9bfb2d841a86e2b5ccbb34a68aa873187ad2.1607535442.0.Acuir0bj6YyUKII_NwaEd0k2snyzq48V7DGfNNaqAlQoL54AijP9p5C.wN1maBIXNIT2Eg0QntsefxJS9.5VMrrCaI8lAzptjn.r1S9iYwLRumfipbCwqcEhIl2QDaDTJtL34tIE37y9alTT3AUXRwuk5exxZ5BHWuCrwmAxUmbUqU6GqloJ5S5ZmchwLTI5xmk4v.eV49b.meWwm8Dx2UFgGHeYYh9eQW0EUUxIf2bKX8HwCDmqXWxUE3a50oiewBQeXa5DR7PXxJVS_PNHW5vez.d5znj0vgyEltdt9HbJ5SxiQm3fc4mqnq0Iq.wnhiEKQW9R26MhmvmfA2V7sjtkt0EHCqtlYLTHKr6FJS5Ye1ZvjuheFSwcXQb6q_SpHuJlEM6WhbnnXJ9D6OiIuDE..https...www.jaxdailyrecord.com.article.st.joe.quietly.appoints.ceo.park.brady <dbl> …
## $ sources_https...sec.report.Document.0000950109.96.006786. <dbl> …
## $ sources_https...sec.report.Document.0000950150.99.000557.. <dbl> …
## $ sources_https...sec.report.Document.0001144204.03.005347. <dbl> …
## $ sources_https...urgentpaper.org.2020.09.30.please.read.the.case.and.answer.the.following.questions.2. <dbl> …
## $ sources_https...variety.com.2003.scene.news.cbs.mogul.tisch.dead.at.80.1117895754..https...www.encyclopedia.com.humanities.encyclopedias.almanacs.transcripts.and.maps.tisch.laurence.alan.larry.https...www.sec.gov.Archives.edgar.data.18366.0000950123.95.002925.txt.https...www.baltimoresun.com.news.bs.xpm.1995.11.25.1995329069.story.html. <dbl> …
## $ sources_https...waitr.gcs.web.com.management.carl.grimstad..https...www.bizjournals.com.newyork.news.2016.09.02.former.ceo.of.ipayment.slaps.n.jhedge.fund.with.html....https...www.sec.gov.Archives.edgar.data.1140184.000119312514451662.d842013dex991.htm <dbl> …
## $ sources_https...webcache.googleusercontent.com.search.q.cache.6L57PgA0.z8J.https...deadline.com.2018.06.jeff.bewkes.time.warner.goodbye.video.1202411582...cd.7.hl.en.ct.clnk.gl.ph <dbl> …
## $ sources_https...www.allaccess.com.net.news.archive.story.33189.albert.a.koch.named.pres.ceo.of.handleman.company..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.07.03.2007.cd_max.03.01.2008.tbm.nws.q.Stephen.Strome.HANDLEMAN.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.05.05.2007.cd_max.01.30.2008.tbm.nws.q.Stephen.Strome.HANDLEMAN..https...www.google.com.search.q.Stephen.Strome.HANDLEMAN <dbl> …
## $ sources_https...www.autonews.com.article.20121115.OEM02.121119933.borgwarner.picks.verrier.to.succeed.manganello.as.ceo..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.08.02.2012.cd_max.04.01.2013.tbm.nws.q.Timothy.Manganello.BORGWARNER.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.04.2012.cd_max.03.01.2013.tbm.nws.q.Timothy.Manganello.BORGWARNER..https...www.google.com.search.q.Timothy.Manganello.BORGWARNER <dbl> …
## $ sources_https...www.bizjournals.com.baltimore.news.2016.03.07.former.t.rowe.price.ceokennedy.joins.united.html..https...www.bizjournals.com.baltimore.news.2016.03.07.former.t.rowe.price.ceokennedy.joins.united.html..https...www.wsj.com.articles.t.rowe.price.ceo.james.kennedy.to.retire.1430918065..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.09.01.2015.cd_max.04.30.2016.tbm.nws.q.James.Kennedy.PRICE..T..ROWE..source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.07.04.2015.cd_max.03.30.2016.tbm.nws.q.James.Kennedy.PRICE..T..ROWE...https...www.google.com.search.q.James.Kennedy.PRICE..T..ROWE. <dbl> …
## $ sources_https...www.bizjournals.com.birmingham.stories.2000.04.03.focus2.html <dbl> …
## $ sources_https...www.bizjournals.com.boston.stories.2008.09.29.daily50.html..https...www.bizjournals.com.boston.news.2016.12.01.needham.bank.hires.ex.sovereign.ceo.as.top.html..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.01.2008.cd_max.01.29.2009.tbm.nws.q.Joseph.Campanelli.SANTANDER.HOLDINGS.USA.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.04.03.2008.cd_max.12.29.2008.tbm.nws.q.Joseph.Campanelli.SANTANDER.HOLDINGS.USA..https...www.google.com.search.q.Joseph.Campanelli.SANTANDER.HOLDINGS.USA <dbl> …
## $ sources_https...www.bizjournals.com.milwaukee.stories.2004.10.04.daily11.html..http...archive.jsonline.com.business.former.fiserv.ceo.leslie.muma.joins.rival.fis.as.director.b99167670z1.236608781.html..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.08.02.2005.cd_max.04.01.2006.tbm.nws.q.Leslie.Muma.FISERV.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.04.2005.cd_max.03.01.2006.tbm.nws.q.Leslie.Muma.FISERV..https...www.google.com.search.q.Leslie.Muma.FISERV <dbl> …
## $ sources_https...www.bizjournals.com.stlouis.news.2014.02.18.amerens.voss.to.retire.html..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.09.02.2013.cd_max.05.02.2014.tbm.nws.q.Thomas.Voss.AMEREN.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.07.05.2013.cd_max.04.01.2014.tbm.nws.q.Thomas.Voss.AMEREN..https...www.google.com.search.q.Thomas.Voss.AMEREN <dbl> …
## $ sources_https...www.bizjournals.com.triad.news.2019.06.05.labcop.ceo.and.president.to.retire.direct.board.html <dbl> …
## $ sources_https...www.bloomberg.com.press.releases.2000.02.08.ken.harrison.ceo.of.portland.general.electric.retires.after <dbl> …
## $ sources_https...www.businesswire.com.news.home.20041206006017.en.New.President.CEO.Millipore.Effective.January.1..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.09.02.2004.cd_max.05.02.2005.tbm.nws.q.Francis.Lunger.MILLIPORE.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.07.05.2004.cd_max.04.01.2005.tbm.nws.q.Francis.Lunger.MILLIPORE..https...www.google.com.search.q.Francis.Lunger.MILLIPORE <dbl> …
## $ sources_https...www.businesswire.com.news.home.20070601005389.en.Bridgestone.Americas.Completes.Acquisition.of.Bandag <dbl> …
## $ sources_https...www.courant.com.news.connecticut.hc.xpm.1991.09.30.0000211442.story.html..and.https...www.courant.com.news.connecticut.hc.xpm.1994.06.05.9406130581.story.html <dbl> …
## $ sources_https...www.cutimes.com.2003.06.03.digital.insights.dorman.led.company.through.a.very.interesting.period..slreturn.20191104115907..https...www.marketwatch.com.story.digital.insight.ceo.dorman.to.retire.within.18.months..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.04.02.2003.cd_max.11.30.2003.tbm.nws.q.John.Dorman.DIGITAL.INSIGHT.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.02.02.2003.cd_max.10.30.2003.tbm.nws.q.John.Dorman.DIGITAL.INSIGHT..https...www.google.com.search.q.John.Dorman.DIGITAL.INSIGHT <dbl> …
## $ sources_https...www.democratandchronicle.com.story.money.2014.12.12.ceo.struggling.windstream.20297493...https...www.nwaonline.com.news.2015.mar.22.windstream.changes.focus.of.leadership....https...www.multichannel.com.news.windstream.ceo.jeff.gardner.resigns.386244..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.08.12.2014.cd_max.04.11.2015.tbm.nws.q.Jeffery.Gardner.WINDSTREAM.HOLDINGS.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.14.2014.cd_max.03.11.2015.tbm.nws.q.Jeffery.Gardner.WINDSTREAM.HOLDINGS..https...www.google.com.search.q.Jeffery.Gardner.WINDSTREAM.HOLDINGS <dbl> …
## $ sources_https...www.eetimes.com.document.asp.doc_id.1133117..https...www.eetimes.com.document.asp.doc_id.1133117..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.01.31.2002.cd_max.09.30.2002.tbm.nws.q.Francis.Scricco.ARROW.ELECTRONICS.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.12.03.2001.cd_max.08.30.2002.tbm.nws.q.Francis.Scricco.ARROW.ELECTRONICS..https...www.google.com.search.q.Francis.Scricco.ARROW.ELECTRONICS <dbl> …
## $ sources_https...www.fiercebiotech.com.biotech.vertex.ceo.stepping.down.after.banner.year..https...www.fiercebiotech.com.biotech.vertex.ceo.stepping.down.after.banner.year..https...xconomy.com.boston.2011.12.15.vertex.names.jeff.leiden.as.new.ceo.staring.down.tough.new.competition...https...investors.vrtx.com.news.releases.news.release.details.vertex.announces.ceo.succession.plan.2012..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.10.03.2011.cd_max.06.01.2012.tbm.nws.q.Matthew.Emmens.VERTEX.PHARMACEUTICALS.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.08.05.2011.cd_max.05.01.2012.tbm.nws.q.Matthew.Emmens.VERTEX.PHARMACEUTICALS..https...www.google.com.search.q.Matthew.Emmens.VERTEX.PHARMACEUTICALS <dbl> …
## $ sources_https...www.fiercewireless.com.wireless.craig.mccaw.resigns.as.clearwire.chairman <dbl> …
## $ sources_https...www.hydrocarbononline.com.doc.bob.campbell.retires.as.sunoco.chairman.and.c.0001.and.https...www.wsj.com.articles.SB944155107101219523 <dbl> …
## $ sources_https...www.infectioncontroltoday.com.archive.chairman.and.ceo.steris.announces.retirement.https...www.hospitalnetwork.com.doc.steris.chairman.and.ceo.to.retire.0001 <dbl> …
## $ sources_https...www.insidearm.com.news.00015881.concerto.software.and.aspect.communicatio. <dbl> …
## $ sources_https...www.insurancejournal.com.news.national.2016.08.21.423992.htm..https...www.insurancejournal.com.news.national.2016.01.28.396692.htm..https...www.insurancejournal.com.news.national.2016.01.28.396692.htm..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.08.01.2015.cd_max.03.30.2016.tbm.nws.q.Jay.Fishman.TRAVELERS.COS.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.03.2015.cd_max.02.28.2016.tbm.nws.q.Jay.Fishman.TRAVELERS.COS..https...www.google.com.search.q.Jay.Fishman.TRAVELERS.COS <dbl> …
## $ sources_https...www.latimes.com.archives.la.xpm.1997.jul.03.fi.9254.story.html <dbl> …
## $ sources_https...www.legacy.com.obituaries.latimes.obituary.aspx.n.donahue.lee.wildman.pid.190309932.fhid.11591.https...www.latimes.com.archives.la.xpm.2009.jun.22.he.wildmanluck22.story.html.https...www.sec.gov.Archives.edgar.data.9435.0000950152.94.000373.txt <dbl> …
## $ sources_https...www.mercurynews.com.2010.02.04.sun.microsystems.ceo.no.more.a.haiku.for.his.last.day...https...www.mercurynews.com.2010.02.04.sun.microsystems.ceo.no.more.a.haiku.for.his.last.day...https...www.theguardian.com.technology.blog.2010.feb.04.jonathan.schwartz.sun.microsystems.tweet.ceo.resignation..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.10.03.2009.cd_max.06.02.2010.tbm.nws.q.Jonathan.Schwartz.SUN.MICROSYSTEMS.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.08.05.2009.cd_max.05.02.2010.tbm.nws.q.Jonathan.Schwartz.SUN.MICROSYSTEMS..https...www.google.com.search.q.Jonathan.Schwartz.SUN.MICROSYSTEMS <dbl> …
## $ sources_https...www.nytimes.com.2000.03.07.business.genzyme.to.buy.biomatrix.for.738.million.html....text.The.20Genzyme.20Corporation.20said.20yesterday.million.20in.20cash.20and.20stock. <dbl> …
## $ sources_https...www.orlandosentinel.com.news.os.xpm.2000.01.13.0001120410.story.amp.html..https...wallmine.com.people.49353.john.b.furman..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.10.02.1999.cd_max.05.31.2000.tbm.nws.q.John.Furman.RURAL.METRO.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.08.04.1999.cd_max.04.30.2000.tbm.nws.q.John.Furman.RURAL.METRO..https...www.google.com.search.q.John.Furman.RURAL.METRO <dbl> …
## $ sources_https...www.prnewswire.com.news.releases.carefusion.chairman..ceo.david.l.schlotterbeck.to.retire.in.february.2011.106507823.html..https...evonexus.org.people.dave.schlotterbeck...https...www.businesswire.com.news.home.20110509006595.en.Aperio.Appoints.Healthcare.Veteran.David.Schlotterbeck.Board..https...www.prnewswire.com.news.releases.carefusion.chairman..ceo.david.l.schlotterbeck.to.retire.in.february.2011.106507823.html..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.09.30.2010.cd_max.05.30.2011.tbm.nws.q.David.Schlotterbeck.CAREFUSION.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.08.02.2010.cd_max.04.29.2011.tbm.nws.q.David.Schlotterbeck.CAREFUSION..https...www.google.com.search.q.David.Schlotterbeck.CAREFUSION <dbl> …
## $ sources_https...www.prnewswire.com.news.releases.michele.scannavini.coty.prestige.president.is.named.companys.new.chief.executive.officer.163673026.html..https...www.prnewswire.com.news.releases.michele.scannavini.coty.prestige.president.is.named.companys.new.chief.executive.officer.163673026.html..https...www.wsj.com.articles.SB10000872396390443343704577548770208436782..https...www.wsj.com.articles.SB10000872396390443343704577548770208436782..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.04.01.2012.cd_max.11.29.2012.tbm.nws.q.Bernd.Beetz.COTY.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.02.02.2012.cd_max.10.29.2012.tbm.nws.q.Bernd.Beetz.COTY..https...www.google.com.search.q.Bernd.Beetz.COTY <dbl> …
## $ sources_https...www.sec.gov.Archives.edgar.data.106618.000092189504000594.formdef14a01306_04292004.htm.https...www.sec.gov.Archives.edgar.data.106618.000092189506002609.form10k06447_12312005.htm. <dbl> …
## $ sources_https...www.sec.gov.Archives.edgar.data.202890.0000912057.97.012502.txt..https...www.businesswire.com.news.home.20041021005274.en.IMCO.Recycling.Commonwealth.Industries.Aleris.International <dbl> …
## $ sources_https...www.sec.gov.Archives.edgar.data.55135.000095012408001758.k24744ddef14a.htm <dbl> …
## $ sources_https...www.spoke.com.people.robert.viets.3e1429c09e597c1003745c68.https...www.peoriamagazines.com.ibi.1997.jan.interview.robert.o.viets.https...www.sec.gov.Archives.edgar.data.762129.000095017299001491.0000950172.99.001491.txt. <dbl> …
## $ sources_https...www.streetinsider.com.Corporate.News.AT.26T..28T.29.Announces.Completion.of.DIRECTV.Acquisition.3B.DIRECTV.CEO.White.to.Retire.10749693.html..https...www.streetinsider.com.Corporate.News.AT.26T..28T.29.Announces.Completion.of.DIRECTV.Acquisition.3B.DIRECTV.CEO.White.to.Retire.10749693.html..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.03.02.2015.cd_max.10.30.2015.tbm.nws.q.Michael.White.DIRECTV.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.01.02.2015.cd_max.09.29.2015.tbm.nws.q.Michael.White.DIRECTV..https...www.google.com.search.q.Michael.White.DIRECTV <dbl> …
## $ sources_https...www.thestreet.com.story.10850432.1.ugly.day.for.ulta.salon.html..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.05.03.2010.cd_max.12.31.2010.tbm.nws.q.Lyn.Kirby.ULTA.BEAUTY.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.03.05.2010.cd_max.11.30.2010.tbm.nws.q.Lyn.Kirby.ULTA.BEAUTY..https...www.google.com.search.q.Lyn.Kirby.ULTA.BEAUTY <dbl> …
## $ sources_https...www.thestreet.com.story.1134351.1.update.shares.of.gillette.soar.16.after.ceo.forced.to.resign.html..https...corporate.findlaw.com.contracts.compensation.termination.settlement.agreement.gillette.co.and.michael.c.html..https...www.thestreet.com.story.1134351.1.update.shares.of.gillette.soar.16.after.ceo.forced.to.resign.html..https...www.thestreet.com.story.1134351.1.update.shares.of.gillette.soar.16.after.ceo.forced.to.resign.html..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.06.20.2000.cd_max.02.17.2001.tbm.nws.q.Michael.Hawley.GILLETTE.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.04.22.2000.cd_max.01.17.2001.tbm.nws.q.Michael.Hawley.GILLETTE..https...www.google.com.search.q.Michael.Hawley.GILLETTE <dbl> …
## $ sources_https...www.upi.com.Archives.1993.02.10.ENSERCH.announces.new.strategy.retires.chairman.slashes.dividend.5446729320400..https...sec.report.Document.0000033015.98.000002..__cf_chl_jschl_tk__.e586260f73c156357d6ac7fc7d8336a740159064.1590822724.0.Aet6Xc7FjaJ.51meHsHgCf_B0zQhZeG7sxY.J_hSe6IRTn.MD9STGyVtKxANKvoawaoyUwNI5gx8Q_575.Zq5IqqDjV_EMurbbJ2RzgRLkGDlYkr8QEDJSCbqv8L1NtkCCDeNXVRpsnzx3RDnc.ecdCnpUx_IyN3IBQ1TUPwAeB1TZtYEQuDkGlc33QINx66_7tHgquiCbwluDnYSSYxEZsZrrPXqVXFzEdixdgBIcHdYvFg.KUsklrFwnEMa7EMApLiHy249Sz4H15GP93Zv4RNx3lk1KAeb4BL9zjbO7XQxUGeucYvbEQOtUubvRhPt3SkmTsR62TbtNySweP.RtZA3.RNP6uSaWWR8AJZbSKvAPkhRhfcYUPSa57Eb5G_aw <dbl> …
## $ sources_https...www.washingtonpost.com.archive.business.2000.01.14.schwab.to.buy.us.trust.corp.df851b41.0121.4cdb.8991.aeaf67cbba9e...https...www.sec.gov.Archives.edgar.data.13610.000095012304004543.y93074dfdef14a.htm..https...observer.com.2000.01.charles.schwab.shells.out.for.us.trust. <dbl> …
## $ sources_https...www.wsj.com.articles.SB9573792367921508700..https...sec.report.Document.0000083604.98.000006. <dbl> …
## $ sources_https...www.wsj.com.articles.SB968620776678235700.https...www.chicagotribune.com.news.ct.xpm.2000.03.15.0003310011.story.html <dbl> …
## $ sources_Link.1..https...www.biospace.com.article.releases..b.michael.l.sabolinski.m.d.b.resigns.from.nitromed.inc...Link.2..http...securities.stanford.edu.filings.documents.1030.OI04.01.20041025_r01c_0410027.pdf..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.12.01.2001.cd_max.07.31.2002.tbm.nws.q.Michael.Sabolinski.ORGANOGENESIS.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.10.03.2001.cd_max.06.30.2002.tbm.nws.q.Michael.Sabolinski.ORGANOGENESIS..https...www.google.com.search.q.Michael.Sabolinski.ORGANOGENESIS <dbl> …
## $ sources_Noted....2006..May.15...Wall.Street.Journal.Retrieved.from.http...umiss.idm.oclc.org.login.url.https...www.proquest.com.umiss.idm.oclc.org.docview.398968416.accountid.14588....https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.12.10.2000.cd_max.08.09.2001.tbm.nws.q.Jesse.Orsini.CARBO.CERAMICS.source.lnms.tbm.nws.sa.X.ved.0ahUKEwj.o8.h0__hAhUJP6wKHX8eCbEQ_AUIDigB.biw.1920.bih.969..https...www.google.com.search.safe.active.rlz.1C1CHBF_enUS819US819.tbs.cdr.1.cd_min.10.12.2000.cd_max.07.09.2001.tbm.nws.q.Jesse.Orsini.CARBO.CERAMICS..https...www.google.com.search.q.Jesse.Orsini.CARBO.CERAMICS <dbl> …
## $ sources_Reynolds..D..J...2009..Sep.09...XTO.s.simpson.has.a.thirst.for.hugoton.royalty..Wall.Street.Journal.Retrieved.from.http...umiss.idm.oclc.org.login.url.https...search.proquest.com.umiss.idm.oclc.org.docview.399062950.accountid.14588..November.21..2008...November.20..2008..XTO.Energy.Inc..Announces.Executive.Promotions.Effective.December.1..2008..S.P.DAILY.NEWS. <dbl> …
# # Prepare the recipe
# xgboost_rec_prep <- prep(xgboost_rec, training = data_train)
#
# # Check the prepared recipe summary
# summary(xgboost_rec_prep)
library(usemodels)
usemodels::use_xgboost(ceo_dismissal ~ ., data = data_train)
## xgboost_recipe <-
## recipe(formula = ceo_dismissal ~ ., data = data_train) %>%
## step_zv(all_predictors())
##
## xgboost_spec <-
## boost_tree(trees = tune(), min_n = tune(), tree_depth = tune(), learn_rate = tune(),
## loss_reduction = tune(), sample_size = tune()) %>%
## set_mode("classification") %>%
## set_engine("xgboost")
##
## xgboost_workflow <-
## workflow() %>%
## add_recipe(xgboost_recipe) %>%
## add_model(xgboost_spec)
##
## set.seed(64987)
## xgboost_tune <-
## tune_grid(xgboost_workflow, resamples = stop("add your rsample object"), grid = stop("add number of candidate points"))
library(workflows)
library(parsnip)
xgboost_spec <-
boost_tree(trees = tune(), min_n = tune(), tree_depth = tune(), learn_rate = tune(),
loss_reduction = tune(), sample_size = tune()) %>%
set_mode("classification") %>%
set_engine("xgboost")
xgboost_workflow <-
workflow() %>%
add_recipe(xgboost_rec) %>%
add_model(xgboost_spec)
library(tune)
doParallel::registerDoParallel()
set.seed(17375)
xgboost_tune <-
tune_grid(xgboost_workflow,
resamples = data_cv,
grid = 5)
## Warning: package 'xgboost' was built under R version 4.3.3