Goal: Build a classification model to predict whether the person died in an expedition

Import Data

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.1
## ══ Using correlationfunnel? ════════════════════════════════════════════════════
## You might also be interested in applied data science training for business.
## </> Learn more at - www.business-science.io </>
library(tidytext)
## Warning: package 'tidytext' was built under R version 4.4.1
library(xgboost)
## Warning: package 'xgboost' was built under R version 4.4.1
## 
## Attaching package: 'xgboost'
## 
## The following object is masked from 'package:dplyr':
## 
##     slice
library(textrecipes)
## Warning: package 'textrecipes' was built under R version 4.4.1
## 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
members <- readr::read_csv('https://raw.githubusercontent.com/rfordatascience/tidytuesday/master/data/2020/2020-09-22/members.csv')
## Rows: 76519 Columns: 21
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (10): expedition_id, member_id, peak_id, peak_name, season, sex, citizen...
## dbl  (5): year, age, highpoint_metres, death_height_metres, injury_height_me...
## lgl  (6): hired, success, solo, oxygen_used, died, injured
## 
## ℹ 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.

Explore Data

skimr::skim(members)
Data summary
Name members
Number of rows 76519
Number of columns 21
_______________________
Column type frequency:
character 10
logical 6
numeric 5
________________________
Group variables None

Variable type: character

skim_variable n_missing complete_rate min max empty n_unique whitespace
expedition_id 0 1.00 9 9 0 10350 0
member_id 0 1.00 12 12 0 76518 0
peak_id 0 1.00 4 4 0 391 0
peak_name 15 1.00 4 25 0 390 0
season 0 1.00 6 7 0 5 0
sex 2 1.00 1 1 0 2 0
citizenship 10 1.00 2 23 0 212 0
expedition_role 21 1.00 4 25 0 524 0
death_cause 75413 0.01 3 27 0 12 0
injury_type 74807 0.02 3 27 0 11 0

Variable type: logical

skim_variable n_missing complete_rate mean count
hired 0 1 0.21 FAL: 60788, TRU: 15731
success 0 1 0.38 FAL: 47320, TRU: 29199
solo 0 1 0.00 FAL: 76398, TRU: 121
oxygen_used 0 1 0.24 FAL: 58286, TRU: 18233
died 0 1 0.01 FAL: 75413, TRU: 1106
injured 0 1 0.02 FAL: 74806, TRU: 1713

Variable type: numeric

skim_variable n_missing complete_rate mean sd p0 p25 p50 p75 p100 hist
year 0 1.00 2000.36 14.78 1905 1991 2004 2012 2019 ▁▁▁▃▇
age 3497 0.95 37.33 10.40 7 29 36 44 85 ▁▇▅▁▁
highpoint_metres 21833 0.71 7470.68 1040.06 3800 6700 7400 8400 8850 ▁▁▆▃▇
death_height_metres 75451 0.01 6592.85 1308.19 400 5800 6600 7550 8830 ▁▁▂▇▆
injury_height_metres 75510 0.01 7049.91 1214.24 400 6200 7100 8000 8880 ▁▁▂▇▇
str(members)
## spc_tbl_ [76,519 × 21] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
##  $ expedition_id       : chr [1:76519] "AMAD78301" "AMAD78301" "AMAD78301" "AMAD78301" ...
##  $ member_id           : chr [1:76519] "AMAD78301-01" "AMAD78301-02" "AMAD78301-03" "AMAD78301-04" ...
##  $ peak_id             : chr [1:76519] "AMAD" "AMAD" "AMAD" "AMAD" ...
##  $ peak_name           : chr [1:76519] "Ama Dablam" "Ama Dablam" "Ama Dablam" "Ama Dablam" ...
##  $ year                : num [1:76519] 1978 1978 1978 1978 1978 ...
##  $ season              : chr [1:76519] "Autumn" "Autumn" "Autumn" "Autumn" ...
##  $ sex                 : chr [1:76519] "M" "M" "M" "M" ...
##  $ age                 : num [1:76519] 40 41 27 40 34 25 41 29 35 37 ...
##  $ citizenship         : chr [1:76519] "France" "France" "France" "France" ...
##  $ expedition_role     : chr [1:76519] "Leader" "Deputy Leader" "Climber" "Exp Doctor" ...
##  $ hired               : logi [1:76519] FALSE FALSE FALSE FALSE FALSE FALSE ...
##  $ highpoint_metres    : num [1:76519] NA 6000 NA 6000 NA ...
##  $ success             : logi [1:76519] FALSE FALSE FALSE FALSE FALSE FALSE ...
##  $ solo                : logi [1:76519] FALSE FALSE FALSE FALSE FALSE FALSE ...
##  $ oxygen_used         : logi [1:76519] FALSE FALSE FALSE FALSE FALSE FALSE ...
##  $ died                : logi [1:76519] FALSE FALSE FALSE FALSE FALSE FALSE ...
##  $ death_cause         : chr [1:76519] NA NA NA NA ...
##  $ death_height_metres : num [1:76519] NA NA NA NA NA NA NA NA NA NA ...
##  $ injured             : logi [1:76519] FALSE FALSE FALSE FALSE FALSE FALSE ...
##  $ injury_type         : chr [1:76519] NA NA NA NA ...
##  $ injury_height_metres: num [1:76519] NA NA NA NA NA NA NA NA NA NA ...
##  - attr(*, "spec")=
##   .. cols(
##   ..   expedition_id = col_character(),
##   ..   member_id = col_character(),
##   ..   peak_id = col_character(),
##   ..   peak_name = col_character(),
##   ..   year = col_double(),
##   ..   season = col_character(),
##   ..   sex = col_character(),
##   ..   age = col_double(),
##   ..   citizenship = col_character(),
##   ..   expedition_role = col_character(),
##   ..   hired = col_logical(),
##   ..   highpoint_metres = col_double(),
##   ..   success = col_logical(),
##   ..   solo = col_logical(),
##   ..   oxygen_used = col_logical(),
##   ..   died = col_logical(),
##   ..   death_cause = col_character(),
##   ..   death_height_metres = col_double(),
##   ..   injured = col_logical(),
##   ..   injury_type = col_character(),
##   ..   injury_height_metres = col_double()
##   .. )
##  - attr(*, "problems")=<externalptr>
variances <- apply(members, 2, var, na.rm = TRUE)
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
## Warning in FUN(newX[, i], ...): NAs introduced by coercion
zero_variance_columns <- names(variances[variances == 0])

print(zero_variance_columns)
##  [1] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA

Clean Data

factors_vec <- c("death_cause", "injury_type", "highpoint_metres", "death_height_metres")

members_clean <- members %>% 
 select(-death_cause, -injury_type, -highpoint_metres, -death_height_metres, -injury_height_metres) %>%
  drop_na()
# Adressing Missing Values
members_clean <- members_clean %>%
 mutate(across(where(is.character), factor)) %>%
  
  mutate(across(where(is.logical), factor)) %>%
  mutate(member_id = as.character(member_id))

skimr::skim(members_clean)
Data summary
Name members_clean
Number of rows 72985
Number of columns 16
_______________________
Column type frequency:
character 1
factor 13
numeric 2
________________________
Group variables None

Variable type: character

skim_variable n_missing complete_rate min max empty n_unique whitespace
member_id 0 1 12 12 0 72984 0

Variable type: factor

skim_variable n_missing complete_rate ordered n_unique top_counts
expedition_id 0 1 FALSE 10279 EVE: 92, HIM: 90, EVE: 79, EVE: 76
peak_id 0 1 FALSE 390 EVE: 20994, CHO: 8608, AMA: 8235, MAN: 4510
peak_name 0 1 FALSE 390 Eve: 20994, Cho: 8608, Ama: 8235, Man: 4510
season 0 1 FALSE 4 Spr: 36151, Aut: 34186, Win: 2011, Sum: 637
sex 0 1 FALSE 2 M: 66151, F: 6834
citizenship 0 1 FALSE 207 Nep: 14367, USA: 6318, Jap: 6188, UK: 5071
expedition_role 0 1 FALSE 483 Cli: 43315, H-A: 13033, Lea: 9885, Exp: 1411
hired 0 1 FALSE 2 FAL: 59007, TRU: 13978
success 0 1 FALSE 2 FAL: 44914, TRU: 28071
solo 0 1 FALSE 2 FAL: 72869, TRU: 116
oxygen_used 0 1 FALSE 2 FAL: 55216, TRU: 17769
died 0 1 FALSE 2 FAL: 72056, TRU: 929
injured 0 1 FALSE 2 FAL: 71334, TRU: 1651

Variable type: numeric

skim_variable n_missing complete_rate mean sd p0 p25 p50 p75 p100 hist
year 0 1 2001.00 14.12 1905 1992 2004 2012 2019 ▁▁▁▃▇
age 0 1 37.34 10.40 7 29 36 44 85 ▁▇▅▁▁

Continue Exploring Data

members_clean %>%
  ggplot(aes(x = age, fill = as.factor(died))) +
  geom_histogram(binwidth = 5, alpha = 0.7, position = "dodge") +
  facet_wrap(~ as.factor(died), scales = "free_y") +
  labs(
    title = "Age Distribution by Survival Status",
    x = "Age",
    y = "count",
    fill = "Died"
  ) +
  theme_minimal()

Prepare Data

data_binarized_tbl <- members_clean %>%
  select(-peak_id, -expedition_id) %>%
  distinct(member_id, .keep_all = TRUE) %>%
  mutate(died = case_when(died == "TRUE" ~ "died", died == "FALSE" ~ "no")) %>%
  binarize()


data_binarized_tbl %>% glimpse()
## Rows: 72,984
## Columns: 69
## $ `member_id__ACHN15301-01`      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `member_id__-OTHER`            <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ peak_name__Ama_Dablam          <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ peak_name__Annapurna_I         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Annapurna_IV        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Baruntse            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Cho_Oyu             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Dhaulagiri_I        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Everest             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Himlung_Himal       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Kangchenjunga       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Lhotse              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Makalu              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Manaslu             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ peak_name__Pumori              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `peak_name__-OTHER`            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `year__-Inf_1992`              <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ year__1992_2004                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ year__2004_2012                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ year__2012_Inf                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ season__Autumn                 <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, …
## $ season__Spring                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, …
## $ season__Winter                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `season__-OTHER`               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ sex__F                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ sex__M                         <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ `age__-Inf_29`                 <dbl> 0, 0, 1, 0, 0, 1, 0, 1, 0, 0, 1, 0, 1, …
## $ age__29_36                     <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, …
## $ age__36_44                     <dbl> 1, 1, 0, 1, 0, 0, 1, 0, 0, 1, 0, 1, 0, …
## $ age__44_Inf                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Australia         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Austria           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Canada            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__China             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__France            <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, …
## $ citizenship__Germany           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__India             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Italy             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Japan             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Nepal             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Netherlands       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__New_Zealand       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Poland            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Russia            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__S_Korea           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Spain             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__Switzerland       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__UK                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ citizenship__USA               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 1, 1, …
## $ citizenship__W_Germany         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, …
## $ `citizenship__-OTHER`          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ expedition_role__Climber       <dbl> 0, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 0, …
## $ expedition_role__Deputy_Leader <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ expedition_role__Exp_Doctor    <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `expedition_role__H-A_Worker`  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ expedition_role__Leader        <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ `expedition_role__-OTHER`      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, …
## $ hired__FALSE                   <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ hired__TRUE                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ success__FALSE                 <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 1, 1, …
## $ success__TRUE                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, …
## $ solo__FALSE                    <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ `solo__-OTHER`                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ oxygen_used__FALSE             <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ oxygen_used__TRUE              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ died__died                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ died__no                       <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ injured__FALSE                 <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, …
## $ injured__TRUE                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …

Correlate

data_corr_tbl <- data_binarized_tbl %>% 
  correlate( died__died )
## Warning: correlate(): [Data Imbalance Detected] Consider sampling to balance the classes more than 5%
##   Column with imbalance: died__died
data_corr_tbl
## # A tibble: 69 × 3
##    feature   bin          correlation
##    <fct>     <chr>              <dbl>
##  1 died      died              1     
##  2 died      no               -1     
##  3 year      -Inf_1992         0.0519
##  4 peak_name Annapurna_I       0.0336
##  5 success   FALSE             0.0332
##  6 success   TRUE             -0.0332
##  7 peak_name Dhaulagiri_I      0.0290
##  8 peak_name Ama_Dablam       -0.0281
##  9 peak_name Cho_Oyu          -0.0241
## 10 year      2004_2012        -0.0211
## # ℹ 59 more rows

Plot

data_corr_tbl %>%
  plot_correlation_funnel()
## Warning: ggrepel: 41 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps

Split Data

library(tidymodels)
## Warning: package 'tidymodels' was built under R version 4.4.1
## ── 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.1
## Warning: package 'dials' was built under R version 4.4.1
## Warning: package 'infer' was built under R version 4.4.1
## Warning: package 'modeldata' was built under R version 4.4.1
## Warning: package 'parsnip' was built under R version 4.4.2
## Warning: package 'tune' was built under R version 4.4.1
## Warning: package 'workflows' was built under R version 4.4.2
## Warning: package 'workflowsets' was built under R version 4.4.1
## 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()
## ✖ xgboost::slice()  masks dplyr::slice()
## ✖ yardstick::spec() masks readr::spec()
## ✖ recipes::step()   masks stats::step()
## • Use tidymodels_prefer() to resolve common conflicts.
set.seed(1234)
members_clean <- members_clean %>% sample_n(100)

data_split <- initial_split(members_clean, strata = died)
data_train <- training(data_split)
data_test <- testing(data_split)

data_cv <- rsample::vfold_cv(data_train, strata = died)
data_cv
## #  10-fold cross-validation using stratification 
## # A tibble: 10 × 2
##    splits         id    
##    <list>         <chr> 
##  1 <split [67/8]> Fold01
##  2 <split [67/8]> Fold02
##  3 <split [67/8]> Fold03
##  4 <split [67/8]> Fold04
##  5 <split [67/8]> 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
data_train %>% count(died)
## # A tibble: 2 × 2
##   died      n
##   <fct> <int>
## 1 FALSE    74
## 2 TRUE      1

Preprocess Data

library(themis)
## Warning: package 'themis' was built under R version 4.4.1
xgboost_rec <- recipes::recipe(died~ ., data = data_train) %>%
  update_role(expedition_id, new_role = "ID") %>%
  step_dummy(all_nominal_predictors()) 
  
  
 xgboost_rec %>% prep() %>% juice() %>% glimpse()
## New names:
## • `expedition_role_Climber.Guide` -> `expedition_role_Climber.Guide...1209`
## • `expedition_role_Climber.Sirdar` -> `expedition_role_Climber.Sirdar...1210`
## • `expedition_role_Climber.Guide` -> `expedition_role_Climber.Guide...1225`
## • `expedition_role_Climber.Sirdar` -> `expedition_role_Climber.Sirdar...1234`
## • `expedition_role_Leader.Scientist` ->
##   `expedition_role_Leader.Scientist...1435`
## • `expedition_role_Leader.Scientist` ->
##   `expedition_role_Leader.Scientist...1450`
## Rows: 75
## Columns: 1,553
## $ expedition_id                             <fct> BARU07307, KJER89301, NUPW84…
## $ year                                      <dbl> 2007, 1989, 1984, 2014, 2004…
## $ age                                       <dbl> 48, 29, 33, 49, 65, 33, 39, …
## $ died                                      <fct> FALSE, FALSE, FALSE, FALSE, …
## $ member_id_AMAD06330.08                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_AMAD07337.04                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_AMAD14343.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_AMAD16312.14                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_AMAD18341.12                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_AMAD18368.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_AMAD95301.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_ANN112104.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_ANN390301.04                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_BARU01308.05                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_BARU02306.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_BARU07307.01                    <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_BHRI82301.16                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_BURK17301.06                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_CHAN98301.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_CHOY01105.07                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_CHOY03301.05                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_CHOY07349.06                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_CHOY09358.12                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_CHOY10326.10                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1…
## $ member_id_CHOY10341.05                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_CHOY13104.01                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_CHOY93305.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_DHA105106.01                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_DHA114110.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_DHA117304.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_DHA179101.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_DHA179101.04                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_DHA196306.01                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_DHA198303.04                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER03114.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER03144.15                    <dbl> 0, 0, 0, 0, 0, 0, 1, 0, 0, 0…
## $ member_id_EVER04120.01                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER05103.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER06116.10                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER06123.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER10154.08                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER11138.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 1, 0, 0…
## $ member_id_EVER13185.06                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER15126.22                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER17169.04                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER18102.17                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER96122.14                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_EVER98109.07                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_GANG90301.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_GAUR71301.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_HIME74301.07                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_HIML03303.09                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 0…
## $ member_id_HIML14304.04                    <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 0, 0…
## $ member_id_HIML16311.05                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_KJER89301.02                    <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_LHOT86102.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MAKA17108.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MAKA81301.01                    <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ member_id_MANA08330.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MANA09102.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MANA10306.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MANA10319.12                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MANA11108.07                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MANA16316.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MANA90302.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_MANA91304.04                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_NALA00201.02                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_NEMJ88401.08                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_NUPW84301.07                    <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_PUMO00104.05                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_PUMO96101.05                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_PUTH79301.20                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_PUTH84101.07                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_SARI09201.08                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_TARS81301.08                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_TUKU05303.04                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_YALU84302.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ member_id_YALU88301.03                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_AMAD                              <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0…
## $ peak_id_AMOT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_AMPG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_AMPH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_AMPM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ANID                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ANN1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ANN2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ANN3                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ANN4                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ANNE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ANNM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ANNS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_APIM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ARNK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BAMO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BARU                              <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BAUD                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BEDG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BHEM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BHRI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BHRS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BHUL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BIJO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BOBA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BOKT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BTAK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_BURK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CBAM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHAG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHAK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHAM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHAN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHAW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHEK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHEO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHIV                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHKA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHMN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHND                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHOB                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHOL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHOP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHOY                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1…
## $ peak_id_CHRE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHRI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHRW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHUB                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHUG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHUK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHUL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHUM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHUR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHUW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CHWT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CPHU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_CTSE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DANG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DANS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DHA1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DHA2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DHA3                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DHA4                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DHA5                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DHA6                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DHAM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DHEC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DING                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DINS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DOLM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DOMK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DOMO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DORJ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DRAG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DRAN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DROM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DUDH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DZA2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DZAN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_DZAS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_EVER                              <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 0, 0…
## $ peak_id_FANG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_FIRN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_FIRW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_FUTI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAMA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAN1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAN2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAN3                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAN4                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAN5                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAN6                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GANC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAND                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GANG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GANW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAUG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAUR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GAUS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GDNG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GHAN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GHEN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GHUN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GHUS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GHYM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GHYN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GIME                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GIMM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GLAC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GOJN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GORH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GORK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GURJ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GURK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GYAC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GYAJ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_GYLZ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HCHI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HIME                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HIMJ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HIML                              <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 1, 0…
## $ peak_id_HIMN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HIMW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HIUP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HMLE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HNKU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HONG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HONK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_HUNK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_IMJA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JABR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JAGD                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JANE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JANK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JANU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JASG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JETH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JING                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JOBO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JOMS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JONG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_JUNC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KABD                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KABN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KABR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KABS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KAG1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KAGA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KAKU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KALI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KAN1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KAN2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KANB                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KANC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KAND                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KANG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KANS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KANT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KAPT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KARS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KARY                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KCHN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KCHS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KGRI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KGUR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KHAM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KHAT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KHUM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KIMS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KIRA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KJER                              <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KJRN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KJRS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KNAG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KOJI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KORL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KOTA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KTEG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KTOK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KTSU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KTUN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KUML                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KUSU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KWAN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KYAS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KYAZ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_KYR1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LAMJ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LAMP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LANG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LANR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LANY                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LARK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LAS2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LASH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LCHA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LCHN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LDAK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LDNG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LEOE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LEON                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LHAS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LHAY                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LHOM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LHOT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LIK1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LIK2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LING                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LMOC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LNAK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LNJU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LNKE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LNPO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LOBE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LOBW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LSHR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LSIS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LUGU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LUN2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LUNR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_LUNW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MACH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MAK2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MAKA                              <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ peak_id_MALA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MANA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MANN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MANP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MARD                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MATA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MERA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MERR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MING                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MNSL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MOJC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MPNW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MUKT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MUPK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MUST                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_MYAG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NAG1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NAG2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NALA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NALS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NAMP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NAN2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NANG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NAUL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NCHU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NEMJ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NEPA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NGO2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NGO3                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NGOJ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NGOR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NILC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NILN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NILS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NORB                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NPHU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NREK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NUMB                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NUMR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NUPE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NUPK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NUPL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NUPT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_NUPW                              <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_OHMI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_OMBG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_OMBK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_OMIT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PALD                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PAN1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PANB                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PAND                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PANG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PANN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PANT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PARC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PASA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PATR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PAWR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PBUK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PEMK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PERI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PETH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PHAR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PHNH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PHUG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PHUK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PHUR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PIMU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PISA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PK04                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PK29                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PK41                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PKAR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PLNG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_POIN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_POKA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_POKR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_POTA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PTHE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PUCH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PUMO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PURB                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PURK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PUTH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_PYRM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RAKS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RAMC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RAMD                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RAMT                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RANI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RATC                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RATH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RAUN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_RIPI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ROCN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ROKA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ROLK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ROLM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_ROMA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SAIE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SAIP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SALW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SAMD                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SANK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SARI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SHA2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SHAL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SHAR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SHEY                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SHNW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SIMN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SING                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SISN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SITA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SNOW                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SPH1                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SPH2                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SPH4                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SPHN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SRKU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SWAK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SWEL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_SYKG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TAKN                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TAKP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TANK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TAPL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TARS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TASH                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TAWA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TAWO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TENE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TENG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TENR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_THAM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_THAR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_THOR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_THRK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_THUL                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TILI                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TILJ                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TILK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TKPO                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TKRE                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TKRG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TLNG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TOBS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TONG                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TRIA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TRIP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TSAR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TSIS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TSOK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TSUR                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TUKU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_TUTS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_URKM                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_URMA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_YAKA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_YALU                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_YANK                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_YANS                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_YARA                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_id_YAUP                              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ama.Dablam                      <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0…
## $ peak_name_Amotsang                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Amphu.Gyabjen                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Amphu.I                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Amphu.Middle                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Anidesh.Chuli                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Annapurna.I                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Annapurna.I.East                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Annapurna.I.Middle              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Annapurna.II                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Annapurna.III                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Annapurna.IV                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Annapurna.South                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Api.Main                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Arniko.Chuli                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Bamongo                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Baruntse                        <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Baudha                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Beding.Go                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Bhairab.Takura                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Bhemdang.Ri                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Bhrikuti                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Bhrikuti.Shail                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Bhulu.Lhasa                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Bijora.Hiunchuli                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Bobaye                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Boktoh                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Burke.Kang                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chago                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chako                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chamar.Kang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chamar.North                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chamlang                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chandi.Himal                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Changla                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Changtse                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Changwathang                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chaw.Peak                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chekigo                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Cheo.Himal                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chhiv.Himal                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chhochenphu.Himal               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chhopa.Bamare                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chhuboche                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chhukung.Ri                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chhukung.Tse                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Cho.Oyu                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1…
## $ peak_name_Cho.Polu                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chobuje                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Cholatse                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chukyima.Go                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chulu.Central                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chulu.West                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Chumbu                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Churen.Himal.Central            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Churen.Himal.East               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Churen.Himal.West               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Danga                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Danphe.Shail                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dhampus                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dhaulagiri.I                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dhaulagiri.II                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dhaulagiri.III                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dhaulagiri.IV                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dhaulagiri.V                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dhaulagiri.VI                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dhechyan.Khang                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dingjung.North                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dingjung.Ri                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dolma.Khang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dome.Kang                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Domo                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dorje.Lhakpa                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dragmorpa.Ri                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Drangnag.Ri                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Drohmo                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dudh.Kundali                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dzanye                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dzanye.II                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Dzasampatse                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Everest                         <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 0, 0…
## $ peak_name_Fang                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Firnkopf                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Firnkopf.West                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Futi.Himal                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gama.Peak                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ganchenpo                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gandharva.Chuli                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ganesh.I                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ganesh.II                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ganesh.III                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ganesh.IV                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ganesh.V                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ganesh.VI                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gangapurna                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gangapurna.West                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gaugiri                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gaurishankar                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gaurishankar.South              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gave.Ding                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ghenge.Liru                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ghhanyala.Hies                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ghustang.North                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ghustang.South                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ghyun.Himal.I                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ghyuthumba.Main                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gimmigela.Chuli                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gimmigela.Chuli.East            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Glacier.Dome                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gojung                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gorakh.Himal                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gorakh.Khang                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gurja.Himal                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gurkarpo.Ri                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gyachung.Kang                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gyajikang                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Gyalzen.Peak                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Himalchuli.East                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Himalchuli.North                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Himalchuli.West                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Himjung                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Himlung.East                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Himlung.Himal                   <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 1, 0…
## $ peak_name_Hiunchuli                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Hongde                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Hongku                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Hongku.Chuli                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Hungchhi                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Hunku                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Imjatse                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jabou.Ri                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jagdula                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Janak.Chuli                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jannu                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jannu.East                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jasemba.Goth                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jethi.Bahurani                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jinjang                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jobo.Rinjang                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jomsom.Himal                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Jongsang                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Junction.Peak                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kabru.Dome                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kabru.Main                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kabru.North                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kabru.South                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kagmara.I                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kali.Himal                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kande.Hiunchuli                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kande.Hiunchuli.North..I        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kande.Hiunchuli.North..II       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kang.Guru                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kang.Kuru                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kang.Nagchugo                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangbachen                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangchenjunga                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangchenjunga.Central           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangchenjunga.South             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangchung.Nup                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangchung.Shar                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangtega                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangtokal                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kangtsune                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kanjeralwa                      <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kanjiroba.North                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kanjiroba.South                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kanta.Gaton                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kanti.Himal                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kaptang                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Karsang.Kang                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Karyolung                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Khamjung                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Khangri.Shar                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Khatang                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Khatung.Khang                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Khumbutse                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kimshung                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kirat.Chuli                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kojichuwa.Chuli                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Korlang.Pari.Tippa              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kotang                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kumlung                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kusum.Kanguru                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kwangde                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kyashar                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kyazo.Ri                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Kyungka.Ri.1                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lachama.Chuli                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lachama.North                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lamjung.Himal                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lampo                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langdak                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langdung                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langju                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langmoche.Ri                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langpo                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langshisa.Ri                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langtang.Lirung                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langtang.Ri                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Langtang.Yubra                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Larkya.Peak                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lashar.I                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lashar.II                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Leonpo.Gang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Leonpo.Gang.East                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lha.Shamma                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lhayul.Peak                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lhonak                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lhotse                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lhotse.Middle                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lhotse.Shar                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lingtren                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Linkhu.Chuli.Nup                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Linkhu.Chuli.Shar               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lobuje.East                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lobuje.West                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lugula                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lunag.II                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lunag.Ri                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lunag.West                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Lunchhung.Kamo.East             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Machhapuchhare                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Makalu                          <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ peak_name_Makalu.II                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Malanphulan                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Manapathi                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Manapathi.NW                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Manaslu                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Manaslu.North                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Mansail                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Mardi.Himal                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Matathumba                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Mera.Peak                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Merra                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Mingbo.Ri                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Mojca                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Mukut.Himal                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Mustang.Himal                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Mustang.Peak                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Myagdi.Matha                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nagoru                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nalakankar.North                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nalakankar.South                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nampa                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nangamari.I                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nangamari.II                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nangpai.Gosum.I                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nangpai.Gosum.II                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Narphu                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Naulekh                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nemjung                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nepal.Peak                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ngojumba.Kang.I                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ngojumba.Kang.II                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ngojumba.Kang.III               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nilgiri.Central                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nilgiri.North                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nilgiri.South                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nirekha                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Norbu.Kang                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Numbur                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Numri                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nup.La.Kang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nupche.Kang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nupchu                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nuptse                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nuptse.East.I                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Nuptse.West.II                  <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ohmi.Kangri                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ombak.Himal                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ombigaichen                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Omitso.Go                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pabuk.Kang                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Paldor                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Palung                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Panalotapa                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Panbari                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pandra                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pangbuk.North                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pangbuk.Ri                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pankar.Himal                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Panpoche.1                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Parchamo                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pasang.Lhamu.Chuli              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Patrasi.Himal                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pawar.Central                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Peak.29                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Peak.4                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Peak.41                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pemthang.Karpo.Ri               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Peri                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pethangtse                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pethangtse.East                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pharilapcha                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Phu.Kang                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Phu.Kang.Go                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Phungi.Himal                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Phurbi.Chhyachu                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pimu                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pisang                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pointed.Peak                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pokalde                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pokharkang                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pota.Himal.North                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pumori                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Punchen.Himal                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Purbung.Himal                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Purkhung                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Putha.Hiunchuli                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Pyramid.Peak                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Raksha.Urai                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ramdung                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ramtang                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ramtang.Chang                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Rani.Peak                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Rathong                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ratna.Chuli                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Raungsiyar                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Ripimo.Shar                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Roc.Noir                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Rokapi                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Rolmi                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Rolwaling.Kang                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Roma                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Saipal                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Saipal.East.Humla               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Saldim.West                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Samdo                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Sano.Kailash                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Saribung                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Serku.Dolma                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Shalbachum                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Sharphu.I                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Sharphu.II                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Sharphu.IV                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Shartse                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Shartse.II                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Shershon.Northwest              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Shey.Shikhar                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Simnang.Himal                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Singu.Chuli                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Sisne.Himal                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Sita.Chuchura                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Snow.Peak                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Sphinx                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Swaksa.Kang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Swelokhan                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Syaokang                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Takargo                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Takargo.East                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Takphu.Himal                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Takphu.North                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Talung                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tankya.I                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Taple.Shikhar                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tarke.Kang.Shar                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tashi.Kang                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tawa                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tawoche                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tengi.Ragi.Tau                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tengi.Ragi.Tau.East             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tengkangpoche                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tengkoma                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Thamserku                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tharke.Kang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tharpu.Chuli                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Thorong.Peak                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Thulagi                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Til.Kang                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tilicho                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tilje                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tobsar                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tongu                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Triangle.Peak                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tripura.Hiunchuli               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tsartse                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tsaurabong.Peak                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tsisima                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tso.Karpo.Kang                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tukuche                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Tutse                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Urkema                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Urkinmang                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Yakawa.Kang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Yala.Chuli                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Yalung.Kang                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Yanme.Kang                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Yansa.Tsenji                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ peak_name_Yaupa                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ season_Spring                             <dbl> 0, 0, 0, 0, 1, 0, 1, 1, 0, 0…
## $ season_Summer                             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ season_Winter                             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ sex_M                                     <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ citizenship_Algeria                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Andorra                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Argentina                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Argentina.Canada              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Armenia                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Australia                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Australia.Greece              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Australia.Ireland             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Australia.New.Zealand         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Australia.Sweden              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Australia.UK                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Australia.USA                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Austria                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Austria.Brazil                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Azerbaijan                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Azerbaijan.Russia             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Bahrain                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Bangladesh                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Belarus                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Belgium                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Bhutan                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Bolivia                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Bosnia.Herzegovina            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Bosnia.Herzegovina.USA        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Botswana                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Brazil                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Bulgaria                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Canada                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Canada.Ireland                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Canada.Macedonia              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Canada.Russia                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Canada.UK                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Canada.USA                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Chile                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Chile.Sweden                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_China                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_China.USA                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Colombia                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Colombia.USA                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Costa.Rica                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Croatia                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Cyprus                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Czech.Republic                <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Czechoslovakia                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Denmark                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Denmark.Australia             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Dominican.Republic            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Ecuador                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Ecuador.Germany               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Egypt                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Egypt.UK                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Estonia                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Finland                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_France                        <dbl> 0, 1, 1, 1, 0, 0, 0, 0, 0, 0…
## $ citizenship_France.Algeria                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_France.Switzerland            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_France.USA                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Georgia                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Germany                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1…
## $ citizenship_Germany.Iran                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Germany.S.Africa              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Germany.Switzerland           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Germany.USA                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Greece                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Guatemala                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Hong.Kong                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Hungary                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Hungary.Romania               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Iceland                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_India                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_India.Nepal                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Indonesia                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Iran                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Ireland                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Ireland.UK                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Israel                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Italy                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Italy.Slovenia                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Japan                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Jordan                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Kazakhstan                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Kenya                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Kosovo                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Kuwait                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Kyrgyz.Republic               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Kyrgyzstan                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Latvia                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Lebanon                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Liechtenstein                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Lithuania                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Lithuania.USA                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Luxembourg                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Macedonia                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Macedonia.Australia           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Malaysia                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Malta                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Mauritius                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Mexico                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Moldova                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Mongolia                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Montenegro                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Morocco                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Myanmar                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_N.Korea                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Nepal                         <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 0…
## $ citizenship_Nepal.Australia               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Nepal.Canada                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Nepal.India                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Netherlands                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Netherlands.Switzerland       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_New.Zealand                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_New.Zealand.Australia         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_New.Zealand.UK                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Norway                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Oman                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Pakistan                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Palestine                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Panama                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Paraguay.Germany              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Peru                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Philippines                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Poland                        <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ citizenship_Poland.Canada                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Poland.USA                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Portugal                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Qatar                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Romania                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Romania.USA                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Russia                        <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0…
## $ citizenship_Russia.Kazakhstan             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_S.Africa                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_S.Africa.UK                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_S.Africa.Zambia               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_S.Korea                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_San.Marino                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Saudi.Arabia                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Saudi.Arabia.USA              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Serbia                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Singapore                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Singapore.Malaysia            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Slovakia                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Slovakia.USA                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Slovenia                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Spain                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Spain.Brazil                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Spain.USA                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Sri.Lanka                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Sweden                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Switzerland                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Switzerland.France            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Switzerland.Germany           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Switzerland.Greece            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Switzerland.UK                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Switzerland.USA               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Syria                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Taiwan                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Tanzania                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Thailand                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Tunisia                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Turkey                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Turkey.USA                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Turkmenistan                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UAE                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Argentina                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Australia                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Bangladesh                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Canada                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Egypt                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Hong.Kong                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Iceland                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.India                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Italy                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Kenya                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Lebanon                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Nepal                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.New.Zealand                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.Russia                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.S.Africa                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_UK.USA                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Ukraine                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Uruguay                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Austria                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Brazil                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Canada                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.China                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Dominican.Republic        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Ethiopia                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Iran                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Ireland                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Israel                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Jamaica                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Poland                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Romania                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Russia                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.Switzerland               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USA.UK                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_USSR                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Uzbekistan                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Venezuela                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Venezuela.Spain               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Vietnam                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_W.Germany                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_W.Germany.Iran                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ citizenship_Yugoslavia                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_X2nd.Deputy.Leader        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_X2nd.Exp.Doctor           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_X2nd.Sirdar               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_ABC.Cook                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_ABC.Manager               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_ABC.Manager..Tawoche.     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_ABC.Mgr..Tawoche.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_ABC.Staff                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_ABC.support               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Acting.Leader             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Admin.support             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Advance.BC.Manager        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Advance.Team.Leader       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Advisor                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Advisor.Leader            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Airdrop.Team              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Army.Leader..S.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assistant                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assistant.BC.Mgr          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assistant.Cameraman       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assistant.Coach           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assistant.Guide           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assistant.Leader          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assistant.Sirdar          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assoc.Member..N.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Assoc.Member..S.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Asst.BC.Manager           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Base.Camp.Leader          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Worker                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Administration         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Administrator          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Assistant              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Chef                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Communications.Mgr     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Cook                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Food.Manager           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Kitchen.Staff          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Manager                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Manager...Cook         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Manager..C1.only.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Manager..until.C1.     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Manager.Cameraman      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Manager.Climber        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Manager.               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Medical.Officer        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Member                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Mgr                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Mgr.Cameraman          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Mgr.Coach              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Nurse                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.only                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Photographer           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Radio.Operator         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Sirdar                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Staff                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Staff..KBS.News.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Support                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Support.Cameraman      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Technician             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.Telecommunications     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_BC.ABC.Mgr                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Broadcast.Crew            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Business.Manager          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_C1.Manager                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_C2.Cook                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Cameraman                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Cash.Director             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Charge.of.publicity       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Chief.Coach               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Chief.Instructor          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Chief.Leader              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Cilmber                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Cinematographer           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climb.Ldr..torchbearer.2. <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climb.Ldr..torchbearer.3. <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbe                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_climber                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber                   <dbl> 0, 0, 1, 1, 0, 0, 0, 0, 0, 1…
## $ expedition_role_Climber...transport       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Ama.Dablam.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Autonomous.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..BC.ABC.staff.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Bobaye.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..C2.only.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..C3.only.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..CCTV.            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Cholatse.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..CSS.             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Film.Team.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Group.A.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Group.B.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Grp.1.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Grp.2.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Guest.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..I.or.II.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..I.               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..II.              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Jannu.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Kanch.Central.   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Kanch.S.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Kirat.Chuli.     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Lhotse.Shar.     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Lhotse.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..MM.              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..N.Col.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..N.Face.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..N.               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Nampa.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..NE.Ridge.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Pvt.             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Pyramid.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..rope.team.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..S.Face.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..S.               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..security.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..support.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..SW.Face.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Tawoche.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..torch.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..torchbear.4.     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..torchbearer.1.   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..torchbearer.5.   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..torchlighter.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Trainee.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..trekking.agency. <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..unofficial.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..W.Peak.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..W.Ridge.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..with.Arnot.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber..Xixa.also.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Guide...1209      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Sirdar...1210     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Advisor           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Asst.BC.Manager   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.BC.Manager        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.BC.Mgr            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Cameraman         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Cleaner           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Coach             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Cyclist           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Equipment.Mgr     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Exp.Doctor        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Exp.Secretary     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Exp..Doctor       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Film.Crew         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Food.Officer      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Guide...1225      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.H.A.Worker        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Journalist        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Kayaker           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Manager           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Photographer      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Reporter          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Research          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Scientist         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Sirdar...1234     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.skier             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Skier             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Transport         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climber.Trek.Guide        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Advisor          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Assistant        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Guide            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Guide..Grp.1.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Guide..Pvt._     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Ldr..N.Face.     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Ldr..N.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Ldr..NE.Ridge.   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Ldr..S.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Ldr.Exp.Doctor   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Leader           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Leader..Lhotse.  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Leader..Tawoche. <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Leader..W.Peak.  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Scientist        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.sirdar           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Climbing.Sirdar           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Co.Deputy.Leader          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Co.Leader                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Co.Leader..Group.A.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Co.Leader..Group.B.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Co.Pilot                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Commandant                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Commander.in.Chief        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Commander.General         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Communications            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Communications.Mgr        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Communications.Officer    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Communications.staff      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Convenor.Organizer        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Cook                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Cook.at.C2                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Climbing.Ldr..N.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Climbing.Ldr..S.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Climbing.Leader       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Ldr.Scientist         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Ldr.Climb.Ldr         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Ldr.Exp.Doctor        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Ldr.Organizer         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Leader...BC.Manager   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Leader..admin.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Leader..Film.Team.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Dep.Leader.Exp.Doctor     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Climbing.Leader    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Gen.Ldr            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Ldr..N.Face.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Ldr..NE.Ridge.     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Ldr.BC.Mgr         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Ldr.Climbing.Ldr   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Ldr.Exp.Doctor     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Ldr.Exp.Mgr        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.leader             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader             <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader..Ama.Dab.   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader..French.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader..Xixa.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader.I.QM        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader.II          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader.III         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader.BC.Mgr      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader.Guide       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Deputy.Leader.            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Driver                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Ecological.Survey         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Equipment                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Equipment.Mgr             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Everest.Lhotse.Climber    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Everest.Climber           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Advisor               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Artist                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Captain               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Captain..Ama.Dablam.  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Commandant            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Commander             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Cook                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Dentist               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Docter                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor                <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor...Logistics    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor..ABC.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor..C1.only.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor..C2.only.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor..Ev...Lhotse.  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor..N.side.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor..S.            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor..W.Ridge.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor.1              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor.2              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor..BC.Mgr        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor.BC.Manager     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor.Climber        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor.Kayaker        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor.Medical.Res.   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Doctor.Researcher     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Guide                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Interpreter           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Leader                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Manager               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Nurse                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Organiser             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Organizer             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Organizer..BC.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Pharmacist            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Photographer          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.President             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Reporter              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Satellite.Engineer    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Secretary             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.Trainer               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Exp.TV.Director           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Face.Leader               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.Crew                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.Crew..TET.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.Support              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.support.crew         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.team                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.Team                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.Team..NE.Ridge.      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.Team.Leader          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.Team.Liaison         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Film.Team.Exp.Doctor      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Food                      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Food...Transportation     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Food.Manager              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Food.Officer              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Foods                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_General.Advisor           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_General.Commander         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_General.Director          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_General.Leader            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_General.Manager           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Assistant             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Assistant..Guide      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Assistant..Guide.     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Cameraman             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Cook                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Exp.Doctor            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Rope.Fixer            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Worder                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Worker                <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 0…
## $ expedition_role_H.A.Worker..C4.Mgr.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Worker..Cook.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Worker.Climber        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Worker.Cook           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.A.Worker.Kitchen.Boy    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_H.W.Worker                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_HA.Cook                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_HA.Worker                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Hang.glider.Pilot         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Head.of.Organization      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Helicopter.Tech           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_High.Altitude.Doctor      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Historian                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Honorary.Leader           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Icefall.Doctor            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Interpreter               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Intrepreter               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Joint.Leader              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Journalist                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Journalist.at.BC          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Journalist.Photographer   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Kayaker                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Kitchen.Boy               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Kitchen.Staff             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Ladder.Removal            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_leader                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader                    <dbl> 1, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ expedition_role_Leader...Exp.Doctor       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..2nd.smt.group.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Admin.            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..American.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..BC.only.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Czech.            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..French.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Group.1.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Group.2.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Honorable.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..I.                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..II.               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Ktm.only.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Lhotse.S.Face.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Lhotse.W.Face.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..nomimal.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Nominal.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..North.side.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..S.                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..South.side.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Swiss.            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Tawoche.          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Tibetan.Staff.    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..until.BC.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..until.C1.         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Xixa.also.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.of.Hankuk.Grp      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.of.Jap..Mbrs       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.of.KPNU.Grp        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Scientist...1435   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..BC.Manager        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Exp.Doctor        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Manager           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Organizer         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader..Speed.Climber     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Adv.BC.Manager     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.BC.Manager         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.BC.Mgr             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Exp.Doctor         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Exp.Mgr            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Film.Team          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Instructor         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Journalist         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Organizer          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Scientist...1450   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.Transport          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leader.                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Leaer                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Lhotse.Climber            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Liaison.Officer           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Logistics.Supervisor      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Manager                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Media.Coordinator         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Media.Officer             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Medical.Officer           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Medical.Research          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Medical.Team              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Member                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Member..ABC.N.Col.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Member.Instructor         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Meteorologist             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Mgr...Climbing.Ldr        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Movie.Team                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Naike                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Non.Climber               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Non.member                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Nuptse.Group.Leader       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Organiser                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Organizer                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Organizer...Med.Off       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Original.Leader           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Photo.Team                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Photographer              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Physiologist              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Pilot                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Piotr.Czeslaw             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Police.Leader             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Porter                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_PR...media.manager        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_President                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Press.Correspondent       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Press.Director            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Producer..Director        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Programme.Director        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Radio.Officer             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Radio.Operator            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Radio.Operator..BC.       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Radio.Technician          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Reporter                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Reporter.Team             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Research                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Research.Doctor           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Researcher                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Rope.fixing               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Rope.Team                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Rope.Team.H.A.Assistant   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Sandrine.Marie.Rose       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Scientific.Coordinator    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Scientific.Team           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Scientist                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Secretary                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Secretary.interpreter     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Signal.Officer            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Sirdar                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Sirdar.Climber            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Sirdar.Climbing.Ldr       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Sirder                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Ski.Team                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Ski.Team.Leader           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Skiing.Demonstrator       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Staff                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Staff.Photographer        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Staff.Writer              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Student.Leader            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Support                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Support.Climber           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Support.Crew              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Support.member            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Support.Member            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Support.Member..N.side.   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Support.Member..S.side.   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Support.Member..S.        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Survey.Party.Leader       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Surveyor                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Tactician                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Team.Historian            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Team.Leader..N.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Team.Leader..S.           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Team.Mgr..Trainer         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Technical.Advisor         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Technical.Manager         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Temporary.Leader          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Trainer                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Transport                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Transport.Manager         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Transport.Officer         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Transport.Offier          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Transportation            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Treasurer                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Treasurer.Transport       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Trekker                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Trekking.Leader           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_TV...Radio.Team           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_TV.Cameraman              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_TV.Crew                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_TV.Director               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_TV.Film.Team              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_TV.Producer               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_TV.Reporter               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Vice.Leader               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Video.Editor              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Winch.Operator.at.C1      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Wireless.Operater         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_Wireless.Operator         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ expedition_role_xClimber                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ hired_TRUE.                               <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 0…
## $ success_TRUE.                             <dbl> 0, 0, 1, 1, 1, 0, 1, 1, 1, 0…
## $ solo_TRUE.                                <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ oxygen_used_TRUE.                         <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 0, 0…
## $ injured_TRUE.                             <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…

Specify Model

xgboost_spec <-
  boost_tree(trees = tune()) %>%
  set_mode("classification") %>%
  set_engine("xgboost")


xgboost_workflow <-
  workflow() %>%
  add_recipe(xgboost_rec) %>%
  add_model(xgboost_spec)
library(usemodels)
## Warning: package 'usemodels' was built under R version 4.4.1
usemodels::use_xgboost(formula = died~., data = data_train)
## xgboost_recipe <- 
##   recipe(formula = died ~ ., 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(83950)
## xgboost_tune <-
##   tune_grid(xgboost_workflow, resamples = stop("add your rsample object"), grid = stop("add number of candidate points"))
xgboost_recipe <- 
  recipe(formula = died ~ ., data = data_train) %>% 
  
  step_other(expedition_id, threshold = 0.05) %>%  
  step_dummy(all_nominal_predictors(), one_hot = TRUE) %>%  
  step_YeoJohnson(all_numeric_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(83950)
xgboost_tune <-
  tune_grid(xgboost_workflow, resamples = data_cv, grid = 5)
## New names:
## New names:
## → A | warning: ! There are new levels in a factor: `MANA09102-03`,
## `EVER10154-08`, `ANN390301-04`, `AMAD16312-14`, `YALU84302-03`, `EVER15126-22`,
## `MAKA17108-03`, and `EVER98109-07`.
## There were issues with some computations A: x1
## New names:
## There were issues with some computations A: x2
## New names:
## There were issues with some computations A: x3
## New names:
## There were issues with some computations A: x4
## New names:
## There were issues with some computations A: x5
## 
## → B | warning: No control observations were detected in `truth` with control
## level 'TRUE'.
## There were issues with some computations A: x5
## There were issues with some computations A: x5 B: x1
## New names:
## New names:
## 
## → C | warning: ! There are new levels in a factor: `DHA105106-01`,
## `BURK17301-06`, `AMAD07337-04`, `DHA198303-04`, `PUMO96101-05`, `DHA179101-04`,
## `CHOY01105-07`, and `DHA117304-03`.
## There were issues with some computations A: x5 B: x1
## There were issues with some computations A: x5 B: x1 C: x1
## New names:
## There were issues with some computations A: x5 B: x1 C: x2
## New names:
## There were issues with some computations A: x5 B: x1 C: x3
## New names:
## There were issues with some computations A: x5 B: x1 C: x4
## New names:
## There were issues with some computations A: x5 B: x1 C: x5
## New names:
## New names:
## 
## → D | warning: ! There are new levels in a factor: `KJER89301-02`,
## `EVER11138-02`, `TARS81301-08`, `AMAD18341-12`, `PUTH84101-07`, `CHOY93305-03`,
## `ANN112104-02`, and `CHOY09358-12`.
## There were issues with some computations A: x5 B: x1 C: x5
## There were issues with some computations A: x5 B: x2 C: x5 D: x1
## New names:
## There were issues with some computations A: x5 B: x2 C: x5 D: x2
## New names:
## There were issues with some computations A: x5 B: x2 C: x5 D: x3
## New names:
## There were issues with some computations A: x5 B: x2 C: x5 D: x4
## New names:
## There were issues with some computations A: x5 B: x2 C: x5 D: x5
## New names:
## New names:
## 
## → E | warning: ! There are new levels in a factor: `HIML14304-04`,
## `MAKA81301-01`, `DHA179101-02`, `EVER03114-03`, `CHOY10341-05`, `GAUR71301-03`,
## `CHOY13104-01`, and `CHOY03301-05`.
## There were issues with some computations A: x5 B: x2 C: x5 D: x5
## There were issues with some computations A: x5 B: x3 C: x5 D: x5 E: x1
## New names:
## There were issues with some computations A: x5 B: x3 C: x5 D: x5 E: x2
## New names:
## There were issues with some computations A: x5 B: x3 C: x5 D: x5 E: x3
## New names:
## There were issues with some computations A: x5 B: x3 C: x5 D: x5 E: x4
## New names:
## There were issues with some computations A: x5 B: x3 C: x5 D: x5 E: x5
## New names:
## New names:
## 
## → F | warning: ! There are new levels in a factor: `BARU07307-01`,
## `EVER06123-03`, `MANA10306-03`, `LHOT86102-02`, `MANA11108-07`, `MANA91304-04`,
## `MANA10319-12`, and `PUMO00104-05`.
## There were issues with some computations A: x5 B: x3 C: x5 D: x5 E: x5
## There were issues with some computations A: x5 B: x4 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x4 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x4 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x4 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x4 C: x5 D: x5 E: x…
## New names:
## New names:
## 
## → G | warning: ! There are new levels in a factor: `NUPW84301-07`,
## `YALU88301-03`, `EVER06116-10`, `AMAD06330-08`, `NEMJ88401-08`, `MANA16316-02`,
## and `EVER13185-06`.
## There were issues with some computations A: x5 B: x4 C: x5 D: x5 E: x…
## There were issues with some computations A: x5 B: x5 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x5 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x5 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x5 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x5 C: x5 D: x5 E: x…
## New names:
## New names:
## 
## → H | warning: ! There are new levels in a factor: `GANG90301-03`,
## `BARU02306-02`, `CHOY07349-06`, `HIME74301-07`, `MANA90302-03`, `DHA196306-01`,
## and `NALA00201-02`.
## There were issues with some computations A: x5 B: x5 C: x5 D: x5 E: x…
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## New names:
## 
## → I | warning: ! There are new levels in a factor: `HIML03303-09`,
## `DHA114110-03`, `HIML16311-05`, `AMAD18368-03`, `TUKU05303-04`, `MANA08330-03`,
## and `SARI09201-08`.
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x6 C: x5 D: x5 E: x…
## There were issues with some computations A: x5 B: x7 C: x5 D: x5 E: x…
## New names:
## New names:
## 
## → J | warning: ! There are new levels in a factor: `AMAD04110-02`,
## `AMAD14343-02`, `BHRI82301-16`, `EVER05103-02`, `BARU01308-05`, `EVER96122-14`,
## and `PUTH79301-20`.
## There were issues with some computations A: x5 B: x7 C: x5 D: x5 E: x…
## There were issues with some computations A: x5 B: x7 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x7 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x7 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x7 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x7 C: x5 D: x5 E: x…
## New names:
## New names:
## 
## → K | warning: ! There are new levels in a factor: `EVER03144-15`,
## `CHOY10326-10`, `AMAD95301-03`, `EVER04120-01`, `CHAN98301-03`, `EVER17169-04`,
## and `EVER18102-17`.
## There were issues with some computations A: x5 B: x7 C: x5 D: x5 E: x…
## There were issues with some computations A: x5 B: x8 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x8 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x8 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x8 C: x5 D: x5 E: x…
## New names:
## There were issues with some computations A: x5 B: x8 C: x5 D: x5 E: x…
## There were issues with some computations A: x5 B: x9 C: x5 D: x5 E: x…
## 
## • `expedition_role_Climber.Guide` -> `expedition_role_Climber.Guide...1210`
## • `expedition_role_Climber.Sirdar` -> `expedition_role_Climber.Sirdar...1211`
## • `expedition_role_Climber.Guide` -> `expedition_role_Climber.Guide...1226`
## • `expedition_role_Climber.Sirdar` -> `expedition_role_Climber.Sirdar...1235`
## • `expedition_role_Leader.Scientist` ->
##   `expedition_role_Leader.Scientist...1436`
## • `expedition_role_Leader.Scientist` ->
##   `expedition_role_Leader.Scientist...1451`