library(tidymodels)
library(censored)
library(modeldata)
cat_adoption
#> # A tibble: 2,257 × 20
#> time event sex neutered intake_condition intake_type latitude longitude
#> <dbl> <dbl> <fct> <fct> <fct> <fct> <dbl> <dbl>
#> 1 17 1 male yes fractious owner_surren… 33.8 -118.
#> 2 98 1 male yes normal stray 33.8 -118.
#> 3 15 0 male yes ill_moderatete owner_surren… 33.8 -118.
#> 4 72 1 female yes fractious owner_surren… 33.8 -118.
#> 5 22 0 male yes normal owner_surren… 33.8 -118.
#> 6 66 1 male yes normal owner_surren… 33.8 -118.
#> 7 200 1 female yes other other 33.9 -118.
#> 8 9 0 female yes normal owner_surren… 33.9 -118.
#> 9 45 1 male yes ill_mild stray 33.8 -118.
#> 10 38 1 male no ill_mild stray 33.9 -118.
#> # ℹ 2,247 more rows
#> # ℹ 12 more variables: black <int>, brown <int>, brown_tabby <int>,
#> # calico <int>, cream <int>, gray <int>, gray_tabby <int>, orange <int>,
#> # orange_tabby <int>, tan <int>, tortie <int>, white <int>