diff --git a/compare_nests.png b/compare_nests.png new file mode 100644 index 0000000..207dfc2 Binary files /dev/null and b/compare_nests.png differ diff --git a/data-assembly/survey-quintile-example.Rmd b/data-assembly/survey-quintile-example.Rmd index 4cae232..04be2da 100644 --- a/data-assembly/survey-quintile-example.Rmd +++ b/data-assembly/survey-quintile-example.Rmd @@ -55,18 +55,26 @@ hh_2017 <- here("nhts", # filter rows with missing value for income filter(income_k > 0) |> # create survey object with weights - as_survey_design(weights = WTHHFIN) |> - # Calculate quintile thresholds - mutate(quint_break = survey_quantile(income_k, - quantiles = c(0.2, - 0.4, - 0.6, - 0.8))) |> + as_survey_design(weights = WTHHFIN) +``` + + +```{r} +threshholds <- survey::svyquantile(~income_k, + design = hh_2017, + quantiles = c(0.2, 0.4, 0.6, 0.8)) + +``` + + +```{r} + +hh_2017 <- hh_2017 |> # compare income_k value to thresholds to get income quintile of each HH - mutate(inc_quint = case_when(income_k < quint_break$`_q20`[1] ~ "q1", - income_k < quint_break$`_q40`[1] ~ "q2", - income_k < quint_break$`_q60`[1] ~ "q3", - income_k < quint_break$`_q80`[1] ~ "q4", + mutate(inc_quint = case_when(income_k < threshholds$income_k[1] ~ "q1", + income_k < threshholds$income_k[2] ~ "q2", + income_k < threshholds$income_k[3] ~ "q3", + income_k < threshholds$income_k[4] ~ "q4", TRUE ~ "q5")) ``` diff --git a/data-assembly/upper-income-bin.R b/data-assembly/upper-income-bin.R index e69de29..795fe3c 100644 --- a/data-assembly/upper-income-bin.R +++ b/data-assembly/upper-income-bin.R @@ -0,0 +1,33 @@ +library(tidyverse) +library(here) +library(srvyr) +library(survey) + +ipums_data <- here("data", + "usa_00009.csv.gz") |> + read_csv() |> + filter(GQ != 3 & GQ != 4) + +data_2009 <- ipums_data |> + filter(YEAR == 2009 & HHINCOME > 100000) |> + group_by(SERIAL) |> + summarise(CLUSTER = first(CLUSTER), + STRATA = first(STRATA), + HHWT = first(HHWT), + HHINCOME = first(HHINCOME)) |> + as_survey_design(ids = CLUSTER, + weights = HHWT) + +survey::svyquantile(~HHINCOME, data_2009, 0.5) + +data_2017 <- ipums_data |> + filter(YEAR == 2017 & HHINCOME > 200000) |> + group_by(SERIAL) |> + summarise(CLUSTER = first(CLUSTER), + STRATA = first(STRATA), + HHWT = first(HHWT), + HHINCOME = first(HHINCOME)) |> + as_survey_design(ids = CLUSTER, + weights = HHWT) + +survey::svyquantile(~HHINCOME, data_2017, 0.5) diff --git a/models/IATBR plan/2009-data-assembly-iatbr.Rmd b/models/IATBR plan/2009-data-assembly-iatbr.Rmd new file mode 100644 index 0000000..76cfc21 --- /dev/null +++ b/models/IATBR plan/2009-data-assembly-iatbr.Rmd @@ -0,0 +1,592 @@ +--- +title: "Data Assembly: 2009 NHTS (School Trips)" +author: "Aanchal Chopra" +date: "`r Sys.Date()`" +output: html_document +--- +```{r setup, include=FALSE} +knitr::opts_chunk$set(echo = TRUE) +``` + +# Data Assembly notes + +## Constructing the Sample + +Data for this analysis is drawn from the 2009 National Household Travel Survey (https://nhts.ornl.gov/). + +#### Criteria for inclusion in sample + +**Data** + +* Data not missing for any outcome or predictor variables + +**Trip (to ensure one trip per child, and only school trips):** + +* Trip distance is shorter than 2km/1.25 miles +* Trip ends at school +* Trip is not by transit, motorcycle, or an unspecified mode (these are rare and I assume they are not available to the remaining children) +* Child does not use a school bus for the trip to _or_ from school (assume the remaining students are ineligible for school bus service) +* Survey does not indicate that the child drove to school unaccompanied (assume these are survey coding errors) +* Survey does not indicate the child traveled to school by car with "only siblings" unless the child has a sibling who is a driver. +* Trip does not begin AND end at school +* Trip ends before 10am +* This is the first qualifying trip of the day + +**Traveler** + +* Traveler is between 8 and 13 + +#### Assembling Multi-stage trips + +If the trip ending at school begins with a transfer from another mode, the prior trip is included as part of this trip, and trip characteristics are determined as follows: + +* Matched with the characteristics of the longest-distance segment of the trip: + * Mode + * Presence of others +*Summed across all segments: + * Trip distance +*Taken from the first segment of the trip: + * Population density at trip origin + * All individual- and household-level variables +* Taken from last segment of trip + * Population density at trip destination + +## Defining the variables + +#### Outcome variables + +* **'mode'**: One of: + * 7 = car + * 8 = walk + * 9 = bike + +* **'independence'**: (string) For purposes of this analysis, we describe all female household adults as moms, all male household adults as dads, and all household children as siblings. Also note that NHTS codes all household members as either male or female. We know how many non-household members are on a trip, but we don't know their ages, genders, or drivers status.The full independence variable takes one of the following 6 values to describe who was with the child on their trip to school: + * 10 = alone: There was only one person (the child) on the trip + * 21 = with mom and dad: The child was accompanied by a male household adult _and_ a female household adult + * 22 = with mom: The child was accompanied by a female household adult but no male household adult + * 23 = with dad: The child was accompanied by a male household adult but no female household adult + * 24 = with non-household: The child was accompanied by non-household members and no household members were on the trip + * 30 = with sibling: The child was accompanied by household children, but no household adults or non-household members + +* **'ind_3'**: A simplified independence variable. One of: + * 10 = alone: Same as 1 (alone) in the full independence variable + * 20 = with adults: Combination of these values from the full independence variable + * 21 (with mom and dad) + * 22 (with mom) + * 23 (with dad) + * 24 (with non-household) + * 30 = with kids: same as 30 (with sibling) in the full independence variable + +* **'ind_3_alt'**: Same as 'ind_3a', but trips with non-household members (independence = 30) are classified as trips with kids. Since we don't know if the non-household members are kids or adults, we might want to test it both ways and see if it effects the result + +* **'mode_ind'**: Combination of mode and the full independence variable. Takes the following values: + * 721 = car with mom and dad + * 722 = car with mom + * 723 = car with dad + * 724 = car with non-household + * 730 = car with sibling + * 810 = walk alone + * 821 = walk with mom and dad + * 822 = walk with mom + * 823 = walk with dad + * 824 = walk with non-household + * 830 = walk with sibling + * 910 = bike alone + * 921 = bike with mom and dad + * 922 = bike with mom + * 923 = bike with dad + * 924 = bike with non-household + * 930 = bike with sibling + +* **'mode_ind_3'**: Combination of mode and the simplified independence + variable. Takes the following values + * 720 = car with adult + * 730 = car with kid + * 810 = walk alone + * 820 = walk with adults + * 830 = walk with kids + * 910 = bike alone + * 920 = bike with adults + * 930 = bike with kids + +* **'mode_ind_3_alt'**: Combination of mode and the simplified independence variable that classifies non-household members as kids. Same categories as 'mode_ind_3. + +#### Availability variables + +**'av_car', 'av_walk', and 'av_bike'** indicate the trips for which travel by car, walking, or bike is available. We are assuming that these three modes are available for all children in the sample (even if there is not car in the household, since some children in the sample in zero-vehicle households _do_ travel by car) so this value is set to one for all cases. + +The following variables indicate the availability of independence alternatives: + + * alone_avail: TRUE/1 for all trips + * with_mom_dad_avail: True if there is both a female and a male adult in the household. + * with_mom_avail: True if there is a female adult in the household + * with_dad_avail: True if there is a male adult in the household + * with_non_hh_avail: True for all trips + * with_sib_avail: True if there are any other children in the household + * with_adult_avail: True for all trips + +#### Predictor variables + +**Household-level variables**: + + * income_k: NHTS codes income in one of 11 income categories. We convert this to a continuous variable by assigning households in each category the mid-point value of that category. The highest income category is for incomes greater than $200,000 per year. We assign an income of $250,000 to that category. log_income_k is the natural log of income_k. + * veh_per_driver: We divide the number of household vehicles by the number of household drivers. We assign a value of zero to households with zero drivers + * n_adults: The number of household adults + * has_mom: A binary variable indicating whether there is a female adult in the household + * has_dad: A binary variable indicating whether there is a male adult in the household + * non_work_mom: A binary variable indicating whether there is a female adult in the household who is not a worker + * non_work_dad: A binary variable indicating whether there is a male adult in the household who is not a worker + +**Individual-level variables**: + + * age: The child's age + *female: A binary variable indicating whether the child is female + * has_lil_sib: A binary variable indicating whether there are any younger children in the household (includes children who are the same age as the respondent) + * has_big_sib: A binary variable indicating whether there are any older children in the household + +**Trip-level variables**: + + * distance: Trip distance in kilometers. The NHTS records distance in miles and these are converted to kilometers by multiplying by 1.609 + * log_distance is the natural log of distance + * density: The approximate population density of the census block in which the trip begins or ends (whichever is higher). NHTS reports this value in people per square mile. We convert to people per square kilometer by dividing by 2.59. + * log_density is the natural log of density + +# Data Assembly + +#### 1 Load NHTS trip and person files + +```{r, message = FALSE, warning = FALSE} + +library(tidyverse) +library(knitr) +library(tidyr) +library(dplyr) +library(here) +library(kableExtra) +library(magrittr) +library(downloader) +library(naniar) + +trips09 <- here("nhts", + "data2009", + "DAYV2PUB.csv") |> + read_csv(show_col_types = FALSE) + +people09 <- here("nhts", + "data2009", + "PERV2PUB.csv") |> + read_csv(show_col_types = FALSE) |> + mutate(person_hh = paste(PERSONID, HOUSEID, sep = "-")) + +``` + +#### 2 Assemble ages of household members + +```{r, message = FALSE, warning = FALSE} + +hh_ages09 <- people09 |> + select(HOUSEID, PERSONID, R_AGE) |> + pivot_wider(names_from = PERSONID, + names_prefix = "age_", + values_from = R_AGE) +``` + +#### 3 Assemble relationships of all individuals + +```{r, message = FALSE, warning = FALSE} + +relationships09 <- people09 |> + mutate(adult = R_AGE > 17, + kid_age = ifelse(R_AGE < 18, R_AGE, -2), + R_AGE = ifelse(R_AGE < 0, 999, R_AGE), + non_worker_mom = R_AGE > 17 & WORKER != "01" & R_SEX == "02", + non_worker_dad = R_AGE > 17 & WORKER != "01" & R_SEX != "02") |> + group_by(HOUSEID) |> + mutate(n_adults = sum(adult), + num_records = n(), + non_work_mom = sum(non_worker_mom) > 0, + non_work_dad = sum(non_worker_dad) > 0) |> + mutate(youngest_kid = ifelse(num_records > HHSIZE, 1, min(R_AGE)), + oldest_kid = max(kid_age), + n_children = HHSIZE - n_adults) |> + mutate(has_big_sib = n_children > 1 & R_AGE != oldest_kid) |> + mutate(has_lil_sib = n_children > 1 & (R_AGE != youngest_kid | !has_big_sib)) |> + mutate(person_hh = paste(PERSONID, HOUSEID, sep = "-")) |> + ungroup() |> + select(person_hh, + has_lil_sib, + has_big_sib, + non_work_mom, + non_work_dad) +``` + +#### 4 Assemble trips and school trips + +```{r, message = FALSE, warning = FALSE} + +school_trips09 <- trips09 |> + mutate(include_trip = (WHYTO == "21" & + WHYFROM != "21" & ## Updated coding to match 2009 variable + R_AGE > 7 & + R_AGE < 14 & + as.numeric(ENDTIME) < 1000 & + TRPMILES > 0)) |> ## Removed transfer variable + mutate(mode = case_when(TRPTRANS == "11" ~ 1, # school bus ## Updated coding to match 2009 variables + TRPTRANS == "01" ~ 7, # car + TRPTRANS == "02" ~ 7, + TRPTRANS == "03" ~ 7, + TRPTRANS == "04" ~ 7, + TRPTRANS == "23" ~ 8, # walk + TRPTRANS == "22" ~ 9, # bike + TRPTRANS == "9" ~ 2, # transit + TRPTRANS == "10" ~ 2, + TRPTRANS == "12" ~ 2, + TRPTRANS == "13" ~ 2, + TRPTRANS == "14" ~ 2, + TRPTRANS == "15" ~ 2, + TRPTRANS == "16" ~ 2, + TRPTRANS == "17" ~ 2, + TRPTRANS == "18" ~ 2, + TRPTRANS == "24" ~ 2, + TRPTRANS == "07" ~ 3, # motorcycle + TRPTRANS == "97" ~ 4, # unspecified + TRUE ~ 5))|> ## Removed Transfers + mutate(trip_person_hh = paste(TDTRPNUM, PERSONID, HOUSEID, sep = "-")) |> + mutate(person_hh = paste(PERSONID, HOUSEID, sep = "-")) |> + group_by(person_hh) |> + mutate(can_sch_bus = sum(mode == 1) > 0) |> + ungroup() |> + filter(TRPMILES < 1.25) |> + filter(include_trip > 0) |> + filter(!duplicated(person_hh)) |> + filter(mode > 6, + !can_sch_bus) |> + left_join(hh_ages) |> + left_join(hh_genders) |> + mutate(alone = NUMONTRP == 1, + with_parent = + (ONTD_P1 == 1 & age_01 > 17) | + (ONTD_P2 == 1 & age_02 > 17) | + (ONTD_P3 == 1 & age_03 > 17) | + (ONTD_P4 == 1 & age_04 > 17) | + (ONTD_P5 == 1 & age_05 > 17) | + (ONTD_P6 == 1 & age_06 > 17) | + (ONTD_P7 == 1 & age_07 > 17) | + (ONTD_P8 == 1 & age_08 > 17) | + (ONTD_P9 == 1 & age_09 > 17) | + (ONTD_P10 == 1 & age_10 > 17) | + (ONTD_P11 == 1 & age_11 > 17) | + (ONTD_P12 == 1 & age_12 > 17) | + (ONTD_P13 == 1 & age_13 > 17), + hh_only = NUMONTRP == NONHHCNT+1) |> + left_join(relationships) |> + mutate(independence = case_when(with_mom & with_dad ~ 21, + with_mom ~ 22, + with_dad ~ 23, + alone ~ 10, + NONHHCNT == 0 ~ 30, + TRUE ~ 24)) |> + mutate(ind_3 = ifelse(independence > 20 & independence < 30, + 20, independence)) |> + mutate(ind_3_alt = case_when(independence > 10 & independence < 24 ~ 20, + independence == 24 ~ 30, + TRUE ~ independence)) |> + filter(!(mode == 7 & independence == 10), + !(mode == 7 & independence == 30 & !driver_sib)) |> + mutate(mode_ind = mode * 100 + independence, + mode_ind_3 = mode * 100 + ind_3, + mode_ind_3_alt = mode * 100 + ind_3_alt) |> + mutate(veh_per_driver = ifelse(DRVRCNT > 0, HHVEHCNT/DRVRCNT, 0)) |> + mutate(income_k = case_when(HHFAMINC == "01" ~ 5, + HHFAMINC == "02" ~ 12.5, + HHFAMINC == "03" ~ 20, + HHFAMINC == "04" ~ 30, + HHFAMINC == "05" ~ 42.5, + HHFAMINC == "06" ~ 62.5, + HHFAMINC == "07" ~ 87.5, + HHFAMINC == "08" ~ 112.5, + HHFAMINC == "09" ~ 137.5, + HHFAMINC == "10" ~ 175, + HHFAMINC == "11" ~ 250, + TRUE ~ -9)) |> + mutate(income_k = ifelse(income_k == 250, income_k, income_k * 1.14)) |> ## adjust for 2017 income, except if 250 + filter(income_k > 0) |> + mutate(max_od_dens = HBPPOPDN) |> ## adjust density variable + filter(max_od_dens > 0) |> + rename(age = R_AGE) |> + mutate(female = as.numeric(R_SEX == "02"), + has_mom = as.numeric(has_mom), + has_dad = as.numeric(has_dad), + non_work_mom = as.numeric(non_work_mom), + non_work_dad = as.numeric(non_work_dad), + has_lil_sib = as.numeric(has_lil_sib), + has_big_sib = as.numeric(has_big_sib), + distance = TRPMILES * 1.609, + density = max_od_dens / 2.59) |> + mutate(with_mom_avail = ifelse(has_mom == 1, 1, 0), + with_dad_avail = ifelse(has_dad ==1, 1, 0), + with_mom_dad_avail = ifelse(has_mom + has_dad == 2, 1, 0), + with_sib_avail = ifelse(has_lil_sib + has_big_sib > 0, 1, 0)) |> + mutate(log_income_k = log(income_k), + log_distance = log(distance), + log_density = log(density), + av_car = 1, + av_walk = 1, + av_bike = 1, + alone_avail = 1, + with_non_hh_avail = 1, + with_adult_avail = 1) |> + select(mode, + independence, + ind_3, + ind_3_alt, + mode_ind, + mode_ind_3, + mode_ind_3_alt, + income_k, + log_income_k, + veh_per_driver, + n_adults, + non_work_mom, + non_work_dad, + age, + female, + has_lil_sib, + has_big_sib, + distance, + log_distance, + density, + log_density, + av_car, + av_walk, + av_bike, + alone_avail, + with_mom_dad_avail, + with_mom_avail, + with_dad_avail, + with_non_hh_avail, + with_sib_avail, + with_adult_avail) +``` + +#### 5 Add column for year + +```{r, message = FALSE, warning = FALSE} + +school_trips <- school_trips |> + mutate(year = 2009) + +``` + +# Summary Statistics + +#### Sample Size + +```{r, message = FALSE, warning = FALSE, results='asis', echo=FALSE} + +tibble(Unit = c("Households", + "Children", + "Trips"), + Sample = c(nrow(school_trips), + nrow(school_trips), + nrow(school_trips))) |> + kable(caption = "Sample size")|> + kable_styling(full_width = FALSE, position = "left") + +``` + +#### Outcome 1: Full Independence Variable + +```{r,message = FALSE, warning = FALSE, results='asis', echo=FALSE} + + mode_ind_table_count <- school_trips |> + group_by(independence, mode) |> + summarise(n = n()) |> + ungroup() |> + pivot_wider(names_from = mode, values_from = n) |> + replace_na(list(`7` = 0)) |> + cbind(`-` = c("Alone", + "With mom and dad", + "With mom", + "With dad", + "With non-household", + "With siblings")) |> + rename(Car = `7`, + Walk = `8`, + Bike = `9`) |> + select(`-`, + Car, + Bike, + Walk) |> + mutate(Total = Car + Bike + Walk) |> + rbind(tibble(`-` = "Total", + Car = sum(school_trips$mode == 7), + Walk = sum(school_trips$mode == 8), + Bike = sum(school_trips$mode ==9), + Total = nrow(school_trips))) + +mode_ind_table_pct <- mode_ind_table_count |> + mutate(across(-`-`, ~ paste0(round(.x * 100/ nrow(school_trips),1), "%"))) + +kable(mode_ind_table_count, + caption = "Number of trips in sample by mode and (full) independence") |> +kable_styling(full_width = FALSE, position = "left") + +kable(mode_ind_table_pct, + caption = "Share of trips in sample by mode and (full) independence") |> +kable_styling(full_width = FALSE, position = "left") + +``` + +#### Outcome 2: Simplified Independence Variable + +```{r,message = FALSE, warning = FALSE, results='asis', echo=FALSE} + +mode_ind3_table_count <- school_trips |> + group_by(ind_3, mode) |> + summarise(n = n()) |> + ungroup() |> + pivot_wider(names_from = mode, values_from = n) |> + replace_na(list(`7` = 0)) |> + cbind(`-` = c("Alone", + "With adults", + "With kids")) |> + rename(Car = `7`, + Walk = `8`, + Bike = `9`) |> + select(`-`, + Car, + Bike, + Walk) |> + mutate(Total = Car + Bike + Walk) |> + rbind(tibble(`-` = "Total", + Car = sum(school_trips$mode == 7), + Walk = sum(school_trips$mode == 8), + Bike = sum(school_trips$mode ==9), + Total = nrow(school_trips))) + +mode_ind3_table_pct <- mode_ind3_table_count |> + mutate(across(-`-`, ~ paste0(round(.x * 100/ nrow(school_trips),1), "%"))) + +kable(mode_ind3_table_count, + caption = "Number of trips in sample by mode and (simplified) independence")|> +kable_styling(full_width = FALSE, position = "left") + +kable(mode_ind3_table_pct, + caption = "Share of trips in sample by mode and (simplified) independence")|> +kable_styling(full_width = FALSE, position = "left") + +``` + +#### Outcome 3: Alternative Simplified Independence Variable + +```{r,message = FALSE, warning = FALSE, results='asis', echo=FALSE} + +mode_ind3alt_table_count <- school_trips |> + group_by(ind_3_alt, mode) |> + summarise(n = n()) |> + ungroup() |> + pivot_wider(names_from = mode, values_from = n) |> + replace_na(list(`7` = 0)) |> + cbind(`-` = c("Alone", + "With adults", + "With kids")) |> + rename(Car = `7`, + Walk = `8`, + Bike = `9`) |> + select(`-`, + Car, + Bike, + Walk) |> + mutate(Total = Car + Bike + Walk) |> + rbind(tibble(`-` = "Total", + Car = sum(school_trips$mode == 7), + Walk = sum(school_trips$mode == 8), + Bike = sum(school_trips$mode ==9), + Total = nrow(school_trips))) + +mode_ind3alt_table_pct <- mode_ind3alt_table_count |> + mutate(across(-`-`, ~ paste0(round(.x * 100/ nrow(school_trips),1), "%"))) + +kable(mode_ind3alt_table_count, + caption = "Number of trips in sample by mode and (alternative simplified) independence")|> +kable_styling(full_width = FALSE, position = "left") + +kable(mode_ind3alt_table_pct, + caption = "Share of trips in sample by mode and (alternative simplified) independence")|> +kable_styling(full_width = FALSE, position = "left") + +``` + +#### Choice Availability + +```{r,message = FALSE, warning = FALSE, results='asis', echo=FALSE} + +tibble(`Full independence variable` = c("Alone", + "With mom and dad", + "With mom", + "With dad", + "With non-household", + "With siblings"), + `Percent selected` = c(mean(school_trips$independence == 10), + mean(school_trips$independence == 21), + mean(school_trips$independence == 22), + mean(school_trips$independence == 23), + mean(school_trips$independence == 24), + mean(school_trips$independence == 30)), + `Percent available` = c(1, + mean(school_trips$with_mom_dad_avail), + mean(school_trips$with_mom_avail), + mean(school_trips$with_dad_avail), + 1, + mean(school_trips$with_sib_avail))) |> + mutate(`Percent selected` = paste0(round(`Percent selected`*100), "%"), + `Percent available` = paste0(round(`Percent available`*100), "%")) |> + kable(caption = "Prevalence and availability of full independence choices")|> + kable_styling(full_width = FALSE, position = "left") + +``` + +#### Predictors + +```{r,message = FALSE, warning = FALSE, results='asis', echo=FALSE} + +school_trips |> + select(-mode, + -independence, + -ind_3, + -ind_3_alt, + -mode_ind, + -mode_ind_3, + -mode_ind_3_alt, + -av_bike, + -av_car, + -av_walk, + -with_adult_avail, + -with_dad_avail, + -with_mom_avail, + -with_mom_dad_avail, + -with_non_hh_avail, + -with_sib_avail) |> + pivot_longer(cols = everything(), + names_to = "Predictor", + values_to = "Value") |> + group_by(Predictor) |> + summarise(Mean = mean(Value), + `Standard Deviation` = ifelse(length(unique(Value)) == 2, + 999, + sd(Value))) |> + replace_with_na(list(`Standard Deviation` = 999)) |> + kable(digits = 3, + caption = "Descriptive statistics of predictor variables")|> + kable_styling(full_width = FALSE, position = "left") +``` + +# Export Data + +```{r,message = FALSE, warning = FALSE, results='asis', echo=FALSE} +school_trips |> + write_rds(file = here("data", + "only-school", + "usa-2009-schooltrips.rds")) +``` diff --git a/models/IATBR plan/2017-data-assembly-iatbr.Rmd b/models/IATBR plan/2017-data-assembly-iatbr.Rmd index 224254d..1e511b2 100644 --- a/models/IATBR plan/2017-data-assembly-iatbr.Rmd +++ b/models/IATBR plan/2017-data-assembly-iatbr.Rmd @@ -108,8 +108,8 @@ library(downloader) library(naniar) trips <- here("nhts", - "data2017", - "trippub.csv") |> + "data2017", + "trippub.csv") |> read_csv(show_col_types = FALSE) people <- here("nhts", @@ -193,8 +193,8 @@ relationships <- people |> school_trips <- trips |> mutate(include_trip = (WHYTO == "08" & WHYFROM != "08" & - R_AGE > 7 & - R_AGE < 14 & + R_AGE > 6 & + R_AGE < 15 & as.numeric(ENDTIME) < 1000 & TRPMILES > 0)) |> mutate(WHYTO = ifelse(WHYTO == "07", "transfer", WHYTO), diff --git a/models/IATBR plan/3 alternatives/cross-nest/__cross_nest3.iter b/models/IATBR plan/3 alternatives/cross-nest/__cross_nest3.iter new file mode 100644 index 0000000..8094972 --- /dev/null +++ b/models/IATBR plan/3 alternatives/cross-nest/__cross_nest3.iter @@ -0,0 +1,27 @@ +alpha_active = 0.5505252704521922 +asc_kid_act = -4.913621245370995 +asc_par_act = -3.8500587228502696 +b_age_kid_act = 0.21101494851030556 +b_age_par_act = -0.0495550441750832 +b_female_kid_act = -0.28939440264820193 +b_female_par_act = -0.14323328384076842 +b_has_big_sib_kid_act = 0.32185161523557587 +b_has_big_sib_par_act = 0.07994654645797457 +b_has_lil_sib_kid_act = 0.19316985878538392 +b_has_lil_sib_par_act = 0.1972174103648105 +b_log_density_kid_act = 0.18427098222111218 +b_log_density_par_act = 0.2506965080602738 +b_log_distance_kid_act = -1.5221416401261179 +b_log_distance_par_act = -1.2749537813513911 +b_log_income_k_kid_act = -0.03719997544842733 +b_log_income_k_par_act = 0.009610233927975918 +b_non_work_dad_kid_ace = -0.05812098745989863 +b_non_work_dad_par_act = 0.05682032580441747 +b_non_work_mom_kid_act = -0.09024796359346425 +b_non_work_mom_par_act = 0.16079461463790345 +b_veh_per_driver_kid_act = -0.24614754379287 +b_veh_per_driver_par_act = -0.534308333860054 +b_y2017_kid_act = -0.08197806301882968 +b_y2017_par_act = 1.2572966494699713 +mu_active = 3.4092924727368463 +mu_parent = 1.7762410824903319 diff --git a/models/IATBR plan/3 alternatives/cross-nest/biogeme.toml b/models/IATBR plan/3 alternatives/cross-nest/biogeme.toml new file mode 100644 index 0000000..e3d56c7 --- /dev/null +++ b/models/IATBR plan/3 alternatives/cross-nest/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on April 01, 2024. 10:30:10 + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 1500 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + diff --git a/models/IATBR plan/3 alternatives/cross-nest/cross-nest3.py b/models/IATBR plan/3 alternatives/cross-nest/cross-nest3.py new file mode 100644 index 0000000..d010e83 --- /dev/null +++ b/models/IATBR plan/3 alternatives/cross-nest/cross-nest3.py @@ -0,0 +1,190 @@ +# Cross-nested model + + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable +from biogeme.nests import OneNestForCrossNestedLogit, NestsForCrossNestedLogit + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips3.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +y2017 = Variable('y2017') +veh_per_driver = Variable('veh_per_driver') +non_work_mom = Variable('non_work_mom') +non_work_dad = Variable('non_work_dad') +age = Variable('age') +female = Variable('female') +has_lil_sib = Variable('has_lil_sib') +has_big_sib = Variable('has_big_sib') +log_income_k = Variable('log_inc_k') +log_distance = Variable('log_distance') +log_density = Variable('log_density') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car is reference case) +asc_car = Beta('asc_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_car = Beta('b_log_income_k_car', 0, None, None, 1) +b_veh_per_driver_car = Beta('b_veh_per_driver_car', 0, None, None, 1) +b_non_work_mom_car = Beta('b_non_work_mom_car', 0, None, None, 1) +b_non_work_dad_car = Beta('b_non_work_dad_car', 0, None, None, 1) + +b_age_car = Beta('b_age_car', 0, None, None, 1) +b_female_car = Beta('b_female_car', 0, None, None, 1) +b_has_lil_sib_car = Beta('b_has_lil_sib_car', 0, None, None, 1) +b_has_big_sib_car = Beta('b_has_big_sib_car', 0, None, None, 1) + +b_log_distance_car = Beta('b_log_distance_car', 0, None, None, 1) +b_log_density_car = Beta('b_log_density_car', 0, None, None, 1) + +b_y2017_car = Beta('b_y2017_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) + +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) + +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# Definition of utility functions +V_car = ( + asc_car + + b_log_income_k_car * log_income_k + + b_veh_per_driver_car * veh_per_driver + + b_non_work_mom_car * non_work_mom + + b_non_work_dad_car * non_work_dad + + b_age_car * age + + b_female_car * female + + b_has_lil_sib_car * has_lil_sib + + b_has_big_sib_car * has_big_sib + + b_log_distance_car * log_distance + + b_log_density_car * log_density + + b_y2017_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_income_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_income_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {7: V_car, + 18: V_par_act, + 28: V_kid_act} + +# associate availability conditions with alternatives: +# Note: the names don't really make sense with what we're doing, +# but they're all 1s - all alternatives are available to everyone + +av = {7: av_par_car, + 18: av_par_act, + 28: av_kid_act} + +# nest membership parameters +# for now, set at 0.5. Do not estimate. +alpha_active = Beta('alpha_active', 0.25, 0, 1, 0) +alpha_parent = 1 - alpha_active + +# Define nests based on mode +mu_parent = Beta('mu_parent', 1, 1.0, None, 0) +mu_active = Beta('mu_active', 1, 1.0, None, 0) + +# Definition of nests +par_nest = OneNestForCrossNestedLogit( + nest_param=mu_parent, + dict_of_alpha={7: 1.0, + 18: alpha_parent}, + name='parent' +) + +active_nest = OneNestForCrossNestedLogit( + nest_param=mu_active, + dict_of_alpha={18: alpha_active, + 28: 1}, + name='active' +) + +nests = NestsForCrossNestedLogit( + choice_set=[7, 18, 28], + tuple_of_nests=(par_nest, + active_nest) +) + +# Define model +cross_nest = models.logcnl(V, av, nests, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, cross_nest) +the_biogeme.modelName = 'cross_nest3' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/3 alternatives/cross-nest/cross_nest3.html b/models/IATBR plan/3 alternatives/cross-nest/cross_nest3.html new file mode 100644 index 0000000..5a7cbb9 --- /dev/null +++ b/models/IATBR plan/3 alternatives/cross-nest/cross_nest3.html @@ -0,0 +1,447 @@ + +
+ + +biogeme 3.2.13 [2024-04-04]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-04 17:08:17.659179
+Report file: | cross_nest3.html |
Database name: | est |
Number of estimated parameters: | 27 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -5394.186 |
Final log likelihood: | -3164.322 |
Likelihood ratio test for the init. model: | 4459.729 |
Rho-square for the init. model: | 0.413 |
Rho-square-bar for the init. model: | 0.408 |
Akaike Information Criterion: | 6382.644 |
Bayesian Information Criterion: | 6558.118 |
Final gradient norm: | 1.6946E-02 |
Nbr of threads: | 12 |
Relative gradient: | 2.3067928907491815e-06 |
Cause of termination: | Relative gradient = 2.3e-06 <= 6.1e-06 |
Number of function evaluations: | 21 |
Number of gradient evaluations: | 15 |
Number of hessian evaluations: | 14 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 20 |
Proportion of Hessian calculation: | 14/14 = 100.0% |
Optimization time: | 0:00:27.097966 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
alpha_active | 0.551 | 0.192 | 2.87 | 0.00411 |
asc_kid_act | -4.91 | 0.373 | -13.2 | 0 |
asc_par_act | -3.85 | 0.683 | -5.64 | 1.69e-08 |
b_age_kid_act | 0.211 | 0.0192 | 11 | 0 |
b_age_par_act | -0.0496 | 0.034 | -1.46 | 0.145 |
b_female_kid_act | -0.289 | 0.0655 | -4.42 | 1e-05 |
b_female_par_act | -0.143 | 0.0808 | -1.77 | 0.0764 |
b_has_big_sib_kid_act | 0.322 | 0.0694 | 4.64 | 3.49e-06 |
b_has_big_sib_par_act | 0.0799 | 0.0769 | 1.04 | 0.298 |
b_has_lil_sib_kid_act | 0.193 | 0.0715 | 2.7 | 0.00688 |
b_has_lil_sib_par_act | 0.197 | 0.0814 | 2.42 | 0.0154 |
b_log_density_kid_act | 0.184 | 0.0273 | 6.74 | 1.59e-11 |
b_log_density_par_act | 0.251 | 0.0422 | 5.94 | 2.87e-09 |
b_log_distance_kid_act | -1.52 | 0.0844 | -18 | 0 |
b_log_distance_par_act | -1.27 | 0.222 | -5.75 | 8.99e-09 |
b_log_income_k_kid_act | -0.0372 | 0.0399 | -0.933 | 0.351 |
b_log_income_k_par_act | 0.00961 | 0.0469 | 0.205 | 0.838 |
b_non_work_dad_kid_ace | -0.0581 | 0.104 | -0.561 | 0.575 |
b_non_work_dad_par_act | 0.0568 | 0.121 | 0.471 | 0.638 |
b_non_work_mom_kid_act | -0.0902 | 0.0707 | -1.28 | 0.202 |
b_non_work_mom_par_act | 0.161 | 0.0778 | 2.07 | 0.0387 |
b_veh_per_driver_kid_act | -0.246 | 0.0877 | -2.81 | 0.00501 |
b_veh_per_driver_par_act | -0.534 | 0.122 | -4.37 | 1.24e-05 |
b_y2017_kid_act | -0.082 | 0.121 | -0.676 | 0.499 |
b_y2017_par_act | 1.26 | 0.143 | 8.77 | 0 |
mu_active | 3.41 | 0.66 | 5.17 | 2.39e-07 |
mu_parent | 1.78 | 0.377 | 4.71 | 2.46e-06 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_kid_act | alpha_active | 0.00312 | 0.0647 | -14.4 | 0 | 0.000787 | 0.011 | -13.1 | 0 |
asc_par_act | alpha_active | -0.0425 | -0.596 | -6.99 | 2.72e-12 | -0.0975 | -0.745 | -5.27 | 1.38e-07 |
asc_par_act | asc_kid_act | 0.0879 | 0.443 | 2.12 | 0.0341 | 0.103 | 0.406 | 1.69 | 0.0919 |
b_age_kid_act | alpha_active | -0.000988 | -0.408 | -2.42 | 0.0154 | -0.00167 | -0.454 | -1.69 | 0.0916 |
b_age_kid_act | asc_kid_act | -0.00367 | -0.545 | 13.6 | 0 | -0.00362 | -0.508 | 13.4 | 0 |
b_age_kid_act | asc_par_act | -6.97e-05 | -0.00699 | 7.49 | 7.08e-14 | 0.00171 | 0.131 | 5.97 | 2.38e-09 |
b_age_par_act | alpha_active | 0.0026 | 0.605 | -5.22 | 1.74e-07 | 0.00439 | 0.673 | -3.51 | 0.000443 |
b_age_par_act | asc_kid_act | -6.52e-07 | -5.45e-05 | 13.2 | 0 | -0.000236 | -0.0186 | 13 | 0 |
b_age_par_act | asc_par_act | -0.00837 | -0.473 | 6.81 | 9.87e-12 | -0.013 | -0.561 | 5.41 | 6.22e-08 |
b_age_par_act | b_age_kid_act | -0.000106 | -0.176 | -6.48 | 9.31e-11 | -0.000161 | -0.248 | -6.06 | 1.33e-09 |
b_female_kid_act | alpha_active | 0.00019 | 0.022 | -5.76 | 8.3e-09 | 0.00044 | 0.035 | -4.19 | 2.81e-05 |
b_female_kid_act | asc_kid_act | -0.00083 | -0.0346 | 12.4 | 0 | -0.000833 | -0.0341 | 12.2 | 0 |
b_female_kid_act | asc_par_act | -0.000643 | -0.0181 | 6.51 | 7.64e-11 | -0.000943 | -0.0211 | 5.18 | 2.19e-07 |
b_female_kid_act | b_age_kid_act | -3.99e-05 | -0.0331 | -7.29 | 3.19e-13 | -6.9e-05 | -0.0549 | -7.22 | 5.06e-13 |
b_female_kid_act | b_age_par_act | 0.000148 | 0.0693 | -3.37 | 0.000755 | 0.000154 | 0.0691 | -3.34 | 0.000824 |
b_female_par_act | alpha_active | -0.00341 | -0.342 | -4.01 | 6.01e-05 | -0.00731 | -0.471 | -2.88 | 0.00395 |
b_female_par_act | asc_kid_act | -0.00184 | -0.0663 | 12.6 | 0 | -0.000787 | -0.0261 | 12.4 | 0 |
b_female_par_act | asc_par_act | 0.00669 | 0.163 | 6.93 | 4.23e-12 | 0.0175 | 0.318 | 5.61 | 2.08e-08 |
b_female_par_act | b_age_kid_act | 0.000218 | 0.156 | -4.71 | 2.43e-06 | 0.000322 | 0.208 | -4.48 | 7.5e-06 |
b_female_par_act | b_age_par_act | -0.000553 | -0.223 | -1.05 | 0.292 | -0.000836 | -0.304 | -0.968 | 0.333 |
b_female_par_act | b_female_kid_act | 0.00271 | 0.546 | 2.15 | 0.0315 | 0.00266 | 0.502 | 1.97 | 0.0489 |
b_has_big_sib_kid_act | alpha_active | -0.00114 | -0.126 | -1.46 | 0.143 | -0.00244 | -0.183 | -1.06 | 0.289 |
b_has_big_sib_kid_act | asc_kid_act | -0.00586 | -0.232 | 13.5 | 0 | -0.00529 | -0.205 | 13.3 | 0 |
b_has_big_sib_kid_act | asc_par_act | -0.00101 | -0.0269 | 7.61 | 2.75e-14 | 0.00306 | 0.0647 | 6.12 | 9.31e-10 |
b_has_big_sib_kid_act | b_age_kid_act | 0.000268 | 0.211 | 1.64 | 0.101 | 0.000268 | 0.202 | 1.63 | 0.104 |
b_has_big_sib_kid_act | b_age_par_act | -0.000191 | -0.0845 | 4.71 | 2.44e-06 | -0.00026 | -0.11 | 4.61 | 4.01e-06 |
b_has_big_sib_kid_act | b_female_kid_act | -0.000204 | -0.045 | 6.28 | 3.34e-10 | -0.000177 | -0.0388 | 6.28 | 3.29e-10 |
b_has_big_sib_kid_act | b_female_par_act | 0.000128 | 0.0245 | 4.59 | 4.35e-06 | 0.000349 | 0.0623 | 4.51 | 6.56e-06 |
b_has_big_sib_par_act | alpha_active | 0.00228 | 0.226 | -3.45 | 0.000569 | 0.00375 | 0.254 | -2.51 | 0.0122 |
b_has_big_sib_par_act | asc_kid_act | -0.00215 | -0.0766 | 13.2 | 0 | -0.00221 | -0.0773 | 12.9 | 0 |
b_has_big_sib_par_act | asc_par_act | -0.0112 | -0.269 | 6.93 | 4.34e-12 | -0.0141 | -0.269 | 5.56 | 2.73e-08 |
b_has_big_sib_par_act | b_age_kid_act | -8.5e-05 | -0.0602 | -1.64 | 0.101 | -0.000115 | -0.0783 | -1.62 | 0.104 |
b_has_big_sib_par_act | b_age_par_act | 0.000649 | 0.259 | 1.72 | 0.085 | 0.000689 | 0.264 | 1.72 | 0.086 |
b_has_big_sib_par_act | b_female_kid_act | -3.02e-05 | -0.006 | 3.65 | 0.000263 | -2.77e-05 | -0.0055 | 3.65 | 0.000266 |
b_has_big_sib_par_act | b_female_par_act | -0.000614 | -0.106 | 1.97 | 0.049 | -0.00107 | -0.172 | 1.85 | 0.0645 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 0.00281 | 0.531 | -3.41 | 0.000643 | 0.00275 | 0.516 | -3.35 | 0.000813 |
b_has_lil_sib_kid_act | alpha_active | 0.00147 | 0.16 | -2.58 | 0.00994 | 0.00399 | 0.291 | -1.94 | 0.0523 |
b_has_lil_sib_kid_act | asc_kid_act | -0.00442 | -0.174 | 13.3 | 0 | -0.00442 | -0.166 | 13.1 | 0 |
b_has_lil_sib_kid_act | asc_par_act | -0.00708 | -0.188 | 7.23 | 4.85e-13 | -0.0139 | -0.285 | 5.72 | 1.03e-08 |
b_has_lil_sib_kid_act | b_age_kid_act | -2.77e-05 | -0.0217 | -0.247 | 0.805 | -0.000141 | -0.103 | -0.235 | 0.814 |
b_has_lil_sib_kid_act | b_age_par_act | 0.000123 | 0.0544 | 3.23 | 0.00123 | 0.000404 | 0.166 | 3.29 | 0.00102 |
b_has_lil_sib_kid_act | b_female_kid_act | -5.81e-05 | -0.0128 | 5.02 | 5.13e-07 | -7.24e-05 | -0.0155 | 4.94 | 7.87e-07 |
b_has_lil_sib_kid_act | b_female_par_act | -0.000351 | -0.0666 | 3.17 | 0.00153 | -0.000972 | -0.168 | 2.89 | 0.0039 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 0.00115 | 0.24 | -1.51 | 0.132 | 0.000993 | 0.2 | -1.44 | 0.149 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 0.000939 | 0.176 | 1.21 | 0.228 | 0.00124 | 0.226 | 1.23 | 0.22 |
b_has_lil_sib_par_act | alpha_active | 0.00251 | 0.246 | -2.61 | 0.00905 | 0.00615 | 0.394 | -2 | 0.0452 |
b_has_lil_sib_par_act | asc_kid_act | -0.00284 | -0.1 | 13.4 | 0 | -0.00259 | -0.0853 | 13.2 | 0 |
b_has_lil_sib_par_act | asc_par_act | -0.0123 | -0.293 | 7.11 | 1.2e-12 | -0.0225 | -0.405 | 5.63 | 1.84e-08 |
b_has_lil_sib_par_act | b_age_kid_act | -8.62e-05 | -0.0604 | -0.171 | 0.864 | -0.000277 | -0.177 | -0.159 | 0.874 |
b_has_lil_sib_par_act | b_age_par_act | 0.000264 | 0.104 | 3.05 | 0.00231 | 0.000781 | 0.282 | 3.13 | 0.00176 |
b_has_lil_sib_par_act | b_female_kid_act | -0.000105 | -0.0206 | 4.74 | 2.1e-06 | -0.000157 | -0.0295 | 4.59 | 4.43e-06 |
b_has_lil_sib_par_act | b_female_par_act | -0.000541 | -0.092 | 3 | 0.00266 | -0.00134 | -0.203 | 2.7 | 0.00683 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 0.000684 | 0.128 | -1.28 | 0.199 | 0.00048 | 0.085 | -1.22 | 0.223 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 0.0017 | 0.286 | 1.27 | 0.203 | 0.00196 | 0.313 | 1.26 | 0.207 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 0.0033 | 0.613 | 0.0622 | 0.95 | 0.0037 | 0.635 | 0.0614 | 0.951 |
b_log_density_kid_act | alpha_active | 0.000511 | 0.147 | -2.81 | 0.00498 | 0.000733 | 0.14 | -1.93 | 0.0538 |
b_log_density_kid_act | asc_kid_act | -0.00589 | -0.608 | 13.3 | 0 | -0.00624 | -0.613 | 13.1 | 0 |
b_log_density_kid_act | asc_par_act | -0.00551 | -0.384 | 7.3 | 2.9e-13 | -0.00676 | -0.362 | 5.82 | 5.81e-09 |
b_log_density_kid_act | b_age_kid_act | -1.96e-05 | -0.0402 | -0.814 | 0.416 | -3.87e-05 | -0.0738 | -0.775 | 0.439 |
b_log_density_kid_act | b_age_par_act | 0.000107 | 0.123 | 5.93 | 3.05e-09 | 0.000135 | 0.145 | 5.78 | 7.34e-09 |
b_log_density_kid_act | b_female_kid_act | -4.92e-05 | -0.0283 | 6.63 | 3.26e-11 | -3.28e-05 | -0.0183 | 6.63 | 3.4e-11 |
b_log_density_kid_act | b_female_par_act | -0.000132 | -0.0657 | 4 | 6.37e-05 | -0.000173 | -0.0784 | 3.75 | 0.000177 |
b_log_density_kid_act | b_has_big_sib_kid_act | -1.03e-05 | -0.00565 | -1.86 | 0.0632 | -2.56e-05 | -0.0135 | -1.84 | 0.0663 |
b_log_density_kid_act | b_has_big_sib_par_act | 7.47e-05 | 0.0368 | 1.3 | 0.193 | 6.28e-05 | 0.0299 | 1.29 | 0.197 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 5.99e-05 | 0.0326 | -0.121 | 0.904 | 0.000111 | 0.0566 | -0.119 | 0.906 |
b_log_density_kid_act | b_has_lil_sib_par_act | 7.53e-05 | 0.0366 | -0.16 | 0.873 | 0.000163 | 0.0732 | -0.154 | 0.877 |
b_log_density_par_act | alpha_active | 0.00136 | 0.295 | -2.38 | 0.0172 | 0.00369 | 0.456 | -1.7 | 0.0896 |
b_log_density_par_act | asc_kid_act | -0.0048 | -0.373 | 13.6 | 0 | -0.00612 | -0.389 | 13.2 | 0 |
b_log_density_par_act | asc_par_act | -0.0134 | -0.703 | 7.23 | 4.88e-13 | -0.0219 | -0.759 | 5.73 | 9.79e-09 |
b_log_density_par_act | b_age_kid_act | 1.41e-06 | 0.00217 | 1 | 0.317 | -4.48e-05 | -0.0554 | 0.839 | 0.402 |
b_log_density_par_act | b_age_par_act | 3.32e-05 | 0.0289 | 6.35 | 2.16e-10 | 0.000232 | 0.162 | 6.04 | 1.58e-09 |
b_log_density_par_act | b_female_kid_act | -6.33e-05 | -0.0275 | 7.18 | 7.02e-13 | -3.33e-05 | -0.0121 | 6.89 | 5.53e-12 |
b_log_density_par_act | b_female_par_act | -0.000298 | -0.112 | 4.53 | 6.01e-06 | -0.000833 | -0.244 | 3.94 | 8.04e-05 |
b_log_density_par_act | b_has_big_sib_kid_act | -4.16e-05 | -0.0171 | -0.913 | 0.361 | -0.00023 | -0.0784 | -0.847 | 0.397 |
b_log_density_par_act | b_has_big_sib_par_act | 0.000157 | 0.0583 | 2.07 | 0.0384 | 0.000368 | 0.113 | 2.05 | 0.0406 |
b_log_density_par_act | b_has_lil_sib_kid_act | 0.000164 | 0.0671 | 0.76 | 0.447 | 0.00046 | 0.153 | 0.744 | 0.457 |
b_log_density_par_act | b_has_lil_sib_par_act | 0.000309 | 0.113 | 0.657 | 0.511 | 0.000571 | 0.166 | 0.627 | 0.531 |
b_log_density_par_act | b_log_density_kid_act | 0.000484 | 0.52 | 2.13 | 0.0329 | 0.000553 | 0.479 | 1.76 | 0.0783 |
b_log_distance_kid_act | alpha_active | -0.00431 | -0.463 | -11.8 | 0 | -0.0107 | -0.659 | -8.11 | 4.44e-16 |
b_log_distance_kid_act | asc_kid_act | 0.0066 | 0.255 | 9.57 | 0 | 0.00627 | 0.199 | 9.29 | 0 |
b_log_distance_kid_act | asc_par_act | 0.0181 | 0.471 | 4.54 | 5.56e-06 | 0.0358 | 0.621 | 3.67 | 0.000239 |
b_log_distance_kid_act | b_age_kid_act | -0.000114 | -0.0872 | -23.2 | 0 | 0.000135 | 0.0835 | -20.4 | 0 |
b_log_distance_kid_act | b_age_par_act | -0.00027 | -0.117 | -18.1 | 0 | -0.000962 | -0.335 | -14.6 | 0 |
b_log_distance_kid_act | b_female_kid_act | 0.000349 | 0.0753 | -13.3 | 0 | 0.00031 | 0.056 | -11.9 | 0 |
b_log_distance_kid_act | b_female_par_act | 0.000894 | 0.167 | -14.6 | 0 | 0.00236 | 0.345 | -14.6 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -1.01e-06 | -0.000207 | -18.6 | 0 | 0.00044 | 0.0751 | -17.5 | 0 |
b_log_distance_kid_act | b_has_big_sib_par_act | -0.000402 | -0.0741 | -14.8 | 0 | -0.000962 | -0.148 | -13.1 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -0.000639 | -0.13 | -16.3 | 0 | -0.00158 | -0.262 | -13.8 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -0.000967 | -0.176 | -15.1 | 0 | -0.00214 | -0.311 | -12.8 | 0 |
b_log_distance_kid_act | b_log_density_kid_act | -0.000166 | -0.0885 | -21.9 | 0 | -0.000171 | -0.074 | -18.8 | 0 |
b_log_distance_kid_act | b_log_density_par_act | -0.000658 | -0.264 | -20.4 | 0 | -0.00146 | -0.41 | -16.3 | 0 |
b_log_distance_par_act | alpha_active | -0.0177 | -0.87 | -6.6 | 4.19e-11 | -0.0398 | -0.936 | -4.49 | 7.27e-06 |
b_log_distance_par_act | asc_kid_act | 0.00374 | 0.0662 | 9.39 | 0 | 0.0062 | 0.0751 | 8.68 | 0 |
b_log_distance_par_act | asc_par_act | 0.0553 | 0.66 | 5.66 | 1.53e-08 | 0.119 | 0.784 | 4.89 | 1.03e-06 |
b_log_distance_par_act | b_age_kid_act | 0.000675 | 0.237 | -9.83 | 0 | 0.00146 | 0.343 | -6.88 | 5.94e-12 |
b_log_distance_par_act | b_age_par_act | -0.00212 | -0.421 | -7.17 | 7.31e-13 | -0.00423 | -0.561 | -5.05 | 4.35e-07 |
b_log_distance_par_act | b_female_kid_act | 0.000211 | 0.0208 | -5.92 | 3.28e-09 | 0.000104 | 0.00713 | -4.27 | 1.95e-05 |
b_log_distance_par_act | b_female_par_act | 0.00362 | 0.309 | -7.57 | 3.84e-14 | 0.00816 | 0.455 | -5.7 | 1.19e-08 |
b_log_distance_par_act | b_has_big_sib_kid_act | 0.000852 | 0.0799 | -9.73 | 0 | 0.00237 | 0.154 | -7.19 | 6.27e-13 |
b_log_distance_par_act | b_has_big_sib_par_act | -0.00219 | -0.185 | -7.33 | 2.24e-13 | -0.00377 | -0.221 | -5.41 | 6.17e-08 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -0.00188 | -0.175 | -8.15 | 4.44e-16 | -0.00481 | -0.303 | -5.81 | 6.36e-09 |
b_log_distance_par_act | b_has_lil_sib_par_act | -0.00308 | -0.257 | -7.75 | 8.88e-15 | -0.00721 | -0.399 | -5.56 | 2.77e-08 |
b_log_distance_par_act | b_log_density_kid_act | -0.000593 | -0.145 | -9.09 | 0 | -0.000862 | -0.142 | -6.42 | 1.36e-10 |
b_log_distance_par_act | b_log_density_par_act | -0.00174 | -0.321 | -9.02 | 0 | -0.00448 | -0.479 | -6.23 | 4.6e-10 |
b_log_distance_par_act | b_log_distance_kid_act | 0.0078 | 0.713 | 2.15 | 0.0319 | 0.0151 | 0.806 | 1.53 | 0.126 |
b_log_income_k_kid_act | alpha_active | 0.000598 | 0.118 | -4.43 | 9.44e-06 | 0.00198 | 0.259 | -3.17 | 0.00154 |
b_log_income_k_kid_act | asc_kid_act | -0.00658 | -0.469 | 12.7 | 0 | -0.00708 | -0.477 | 12.4 | 0 |
b_log_income_k_kid_act | asc_par_act | -0.00611 | -0.294 | 6.88 | 6.16e-12 | -0.0104 | -0.383 | 5.46 | 4.86e-08 |
b_log_income_k_kid_act | b_age_kid_act | 4.89e-06 | 0.00692 | -5.85 | 5e-09 | -2.58e-05 | -0.0338 | -5.54 | 3.07e-08 |
b_log_income_k_kid_act | b_age_par_act | 0.000114 | 0.0911 | 0.257 | 0.797 | 0.000195 | 0.144 | 0.254 | 0.799 |
b_log_income_k_kid_act | b_female_kid_act | -9.5e-06 | -0.00378 | 3.31 | 0.000919 | 5.88e-05 | 0.0225 | 3.32 | 0.000897 |
b_log_income_k_kid_act | b_female_par_act | -0.000117 | -0.0401 | 1.23 | 0.219 | -0.000412 | -0.128 | 1.12 | 0.262 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | -4.66e-06 | -0.00176 | -4.54 | 5.52e-06 | -7.47e-05 | -0.027 | -4.44 | 9.18e-06 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 0.000132 | 0.045 | -1.39 | 0.164 | 0.000192 | 0.0625 | -1.39 | 0.165 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 0.000168 | 0.063 | -2.98 | 0.00284 | 0.000304 | 0.106 | -2.95 | 0.00316 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 0.000154 | 0.0517 | -2.77 | 0.00567 | 0.000338 | 0.104 | -2.7 | 0.00696 |
b_log_income_k_kid_act | b_log_density_kid_act | 5.47e-05 | 0.0538 | -4.87 | 1.09e-06 | 9.46e-05 | 0.0867 | -4.78 | 1.77e-06 |
b_log_income_k_kid_act | b_log_density_par_act | 0.000114 | 0.0845 | -5.78 | 7.44e-09 | 0.000342 | 0.203 | -5.55 | 2.8e-08 |
b_log_income_k_kid_act | b_log_distance_kid_act | -0.000264 | -0.097 | 17.7 | 0 | -0.000658 | -0.196 | 14.8 | 0 |
b_log_income_k_kid_act | b_log_distance_par_act | -0.000663 | -0.112 | 7.58 | 3.46e-14 | -0.00219 | -0.248 | 5.27 | 1.36e-07 |
b_log_income_k_par_act | alpha_active | -0.00168 | -0.299 | -3.6 | 0.000313 | -0.00417 | -0.463 | -2.49 | 0.0129 |
b_log_income_k_par_act | asc_kid_act | -0.00532 | -0.34 | 12.9 | 0 | -0.00551 | -0.315 | 12.6 | 0 |
b_log_income_k_par_act | asc_par_act | -0.00375 | -0.162 | 7.01 | 2.38e-12 | 0.00305 | 0.0951 | 5.68 | 1.36e-08 |
b_log_income_k_par_act | b_age_kid_act | 0.00014 | 0.178 | -4.64 | 3.49e-06 | 0.000251 | 0.279 | -4.43 | 9.5e-06 |
b_log_income_k_par_act | b_age_par_act | -0.000277 | -0.198 | 1.01 | 0.313 | -0.000659 | -0.413 | 0.865 | 0.387 |
b_log_income_k_par_act | b_female_kid_act | -5.43e-05 | -0.0194 | 3.79 | 0.000152 | -0.00013 | -0.0424 | 3.64 | 0.000275 |
b_log_income_k_par_act | b_female_par_act | 0.000286 | 0.0882 | 1.83 | 0.0677 | 0.000762 | 0.201 | 1.8 | 0.0719 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 0.00017 | 0.0578 | -3.95 | 7.79e-05 | 0.000314 | 0.0964 | -3.91 | 9.35e-05 |
b_log_income_k_par_act | b_has_big_sib_par_act | -0.000101 | -0.0309 | -0.791 | 0.429 | -0.000517 | -0.143 | -0.735 | 0.462 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | -2.75e-05 | -0.00928 | -2.24 | 0.0249 | -0.00035 | -0.104 | -2.05 | 0.0403 |
b_log_income_k_par_act | b_has_lil_sib_par_act | -0.000119 | -0.036 | -2.09 | 0.0369 | -0.000483 | -0.127 | -1.9 | 0.0581 |
b_log_income_k_par_act | b_log_density_kid_act | -1.7e-06 | -0.0015 | -3.47 | 0.000515 | -1.6e-05 | -0.0125 | -3.2 | 0.00138 |
b_log_income_k_par_act | b_log_density_par_act | -3.81e-05 | -0.0253 | -4.3 | 1.67e-05 | -0.000318 | -0.161 | -3.55 | 0.00039 |
b_log_income_k_par_act | b_log_distance_kid_act | 0.000182 | 0.0601 | 19 | 0 | 0.000968 | 0.244 | 17.8 | 0 |
b_log_income_k_par_act | b_log_distance_par_act | 0.0014 | 0.211 | 8.49 | 0 | 0.00408 | 0.392 | 6.18 | 6.49e-10 |
b_log_income_k_par_act | b_log_income_k_kid_act | 0.000918 | 0.56 | 1.22 | 0.221 | 0.000791 | 0.423 | 0.995 | 0.32 |
b_non_work_dad_kid_ace | alpha_active | 0.000113 | 0.00824 | -3.64 | 0.000275 | 0.000377 | 0.019 | -2.81 | 0.00489 |
b_non_work_dad_kid_ace | asc_kid_act | -0.00295 | -0.0771 | 12.5 | 0 | -0.0043 | -0.111 | 12.2 | 0 |
b_non_work_dad_kid_ace | asc_par_act | -0.00299 | -0.0529 | 6.8 | 1.02e-11 | -0.00497 | -0.0703 | 5.44 | 5.44e-08 |
b_non_work_dad_kid_ace | b_age_kid_act | -0.000131 | -0.0683 | -2.51 | 0.012 | -0.000114 | -0.0572 | -2.53 | 0.0114 |
b_non_work_dad_kid_ace | b_age_par_act | 3.7e-05 | 0.0109 | -0.0786 | 0.937 | -5.01e-06 | -0.00142 | -0.0785 | 0.937 |
b_non_work_dad_kid_ace | b_female_kid_act | 0.000143 | 0.0209 | 1.89 | 0.0581 | 9.86e-05 | 0.0145 | 1.9 | 0.0575 |
b_non_work_dad_kid_ace | b_female_par_act | -2.42e-05 | -0.00307 | 0.659 | 0.51 | -9.19e-05 | -0.011 | 0.644 | 0.519 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | 1.7e-05 | 0.00236 | -3.04 | 0.00236 | 8.85e-05 | 0.0123 | -3.07 | 0.00217 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 0.000148 | 0.0185 | -1.08 | 0.282 | 0.000191 | 0.0239 | -1.08 | 0.279 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 0.000429 | 0.0592 | -2.06 | 0.0392 | 0.000607 | 0.0819 | -2.08 | 0.0377 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 0.000358 | 0.0442 | -2.01 | 0.0448 | 0.000398 | 0.0471 | -1.98 | 0.0473 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 8.6e-07 | 0.000311 | -2.25 | 0.0243 | 8.08e-05 | 0.0285 | -2.28 | 0.0227 |
b_non_work_dad_kid_ace | b_log_density_par_act | 3.2e-05 | 0.00873 | -2.81 | 0.00492 | 0.000178 | 0.0408 | -2.8 | 0.00509 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | 4.9e-05 | 0.00664 | 11.6 | 0 | -0.000109 | -0.0125 | 10.9 | 0 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -6.04e-05 | -0.00375 | 6.52 | 7.24e-11 | -0.000434 | -0.0189 | 4.94 | 7.99e-07 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 0.000597 | 0.149 | -0.198 | 0.843 | 0.000666 | 0.161 | -0.2 | 0.842 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 0.000366 | 0.082 | -0.619 | 0.536 | 0.000421 | 0.0865 | -0.616 | 0.538 |
b_non_work_dad_par_act | alpha_active | -0.00374 | -0.245 | -2.52 | 0.0116 | -0.00901 | -0.389 | -1.87 | 0.0609 |
b_non_work_dad_par_act | asc_kid_act | -0.00397 | -0.0935 | 12.6 | 0 | -0.00495 | -0.11 | 12.3 | 0 |
b_non_work_dad_par_act | asc_par_act | 0.00489 | 0.0778 | 7.16 | 7.89e-13 | 0.0196 | 0.237 | 5.88 | 4.08e-09 |
b_non_work_dad_par_act | b_age_kid_act | 0.000196 | 0.0919 | -1.33 | 0.183 | 0.000495 | 0.214 | -1.31 | 0.192 |
b_non_work_dad_par_act | b_age_par_act | -0.000802 | -0.212 | 0.837 | 0.402 | -0.00157 | -0.383 | 0.774 | 0.439 |
b_non_work_dad_par_act | b_female_kid_act | -6.55e-05 | -0.00861 | 2.59 | 0.00966 | -0.000213 | -0.0269 | 2.49 | 0.0127 |
b_non_work_dad_par_act | b_female_par_act | 0.000973 | 0.111 | 1.52 | 0.128 | 0.00213 | 0.218 | 1.54 | 0.123 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 0.000387 | 0.0483 | -2.01 | 0.0449 | 0.000821 | 0.098 | -1.99 | 0.0466 |
b_non_work_dad_par_act | b_has_big_sib_par_act | -0.000573 | -0.0644 | -0.162 | 0.872 | -0.00105 | -0.113 | -0.154 | 0.878 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 9.39e-05 | 0.0117 | -1.01 | 0.311 | -0.000585 | -0.0678 | -0.944 | 0.345 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | -0.000141 | -0.0157 | -0.998 | 0.318 | -0.000821 | -0.0836 | -0.929 | 0.353 |
b_non_work_dad_par_act | b_log_density_kid_act | -6.68e-05 | -0.0217 | -1.07 | 0.287 | -0.000108 | -0.0326 | -1.02 | 0.306 |
b_non_work_dad_par_act | b_log_density_par_act | -0.000307 | -0.0753 | -1.57 | 0.117 | -0.000809 | -0.159 | -1.45 | 0.148 |
b_non_work_dad_par_act | b_log_distance_kid_act | 0.000658 | 0.0801 | 12 | 0 | 0.00227 | 0.223 | 12.1 | 0 |
b_non_work_dad_par_act | b_log_distance_par_act | 0.00326 | 0.182 | 7.59 | 3.26e-14 | 0.00931 | 0.348 | 6.27 | 3.63e-10 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 0.000261 | 0.0586 | 0.783 | 0.434 | -1.5e-05 | -0.00311 | 0.739 | 0.46 |
b_non_work_dad_par_act | b_log_income_k_par_act | 0.00096 | 0.194 | 0.408 | 0.683 | 0.0019 | 0.335 | 0.414 | 0.679 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 0.00721 | 0.595 | 1.15 | 0.249 | 0.00659 | 0.527 | 1.04 | 0.297 |
b_non_work_mom_kid_act | alpha_active | 0.0017 | 0.183 | -4.66 | 3.2e-06 | 0.00291 | 0.214 | -3.38 | 0.000731 |
b_non_work_mom_kid_act | asc_kid_act | -0.00286 | -0.11 | 12.7 | 0 | -0.00225 | -0.0853 | 12.5 | 0 |
b_non_work_mom_kid_act | asc_par_act | -0.00615 | -0.16 | 6.74 | 1.58e-11 | -0.00866 | -0.179 | 5.38 | 7.41e-08 |
b_non_work_mom_kid_act | b_age_kid_act | -5.86e-05 | -0.045 | -4.08 | 4.57e-05 | -0.000116 | -0.0854 | -4.03 | 5.64e-05 |
b_non_work_mom_kid_act | b_age_par_act | 0.000401 | 0.173 | -0.561 | 0.575 | 0.000498 | 0.207 | -0.567 | 0.571 |
b_non_work_mom_kid_act | b_female_kid_act | -3.98e-05 | -0.00857 | 2.06 | 0.0398 | -0.000205 | -0.0443 | 2.02 | 0.0432 |
b_non_work_mom_kid_act | b_female_par_act | -0.000477 | -0.0889 | 0.49 | 0.624 | -0.000727 | -0.127 | 0.465 | 0.642 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -0.000164 | -0.0336 | -4.1 | 4.1e-05 | -0.000211 | -0.0431 | -4.07 | 4.62e-05 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | 0.000235 | 0.0433 | -1.67 | 0.0954 | 0.000352 | 0.0647 | -1.68 | 0.092 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -0.000249 | -0.0506 | -2.79 | 0.00528 | -3.1e-05 | -0.00613 | -2.81 | 0.00495 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | 2.44e-05 | 0.00444 | -2.74 | 0.00606 | 0.000393 | 0.0682 | -2.76 | 0.00577 |
b_non_work_mom_kid_act | b_log_density_kid_act | -5.35e-05 | -0.0286 | -3.6 | 0.000318 | -4.15e-05 | -0.0214 | -3.6 | 0.000323 |
b_non_work_mom_kid_act | b_log_density_par_act | 1.66e-05 | 0.0067 | -4.33 | 1.51e-05 | 6.39e-05 | 0.0214 | -4.18 | 2.91e-05 |
b_non_work_mom_kid_act | b_log_distance_kid_act | -0.000201 | -0.0402 | 14 | 0 | -0.000574 | -0.0962 | 12.4 | 0 |
b_non_work_mom_kid_act | b_log_distance_par_act | -0.00151 | -0.138 | 6.63 | 3.26e-11 | -0.0029 | -0.185 | 4.84 | 1.32e-06 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 0.000558 | 0.205 | -0.724 | 0.469 | 0.000495 | 0.176 | -0.709 | 0.478 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 0.000141 | 0.0467 | -1.23 | 0.217 | -0.000128 | -0.0386 | -1.16 | 0.247 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -0.000219 | -0.0297 | -0.251 | 0.802 | 2.82e-05 | 0.00385 | -0.257 | 0.797 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -0.00059 | -0.0719 | -1.05 | 0.294 | -0.000672 | -0.0788 | -1.02 | 0.309 |
b_non_work_mom_par_act | alpha_active | -0.00083 | -0.08 | -2.45 | 0.0141 | -0.000546 | -0.0366 | -1.86 | 0.063 |
b_non_work_mom_par_act | asc_kid_act | -0.00437 | -0.152 | 13.2 | 0 | -0.00392 | -0.135 | 13 | 0 |
b_non_work_mom_par_act | asc_par_act | -0.0051 | -0.119 | 7.2 | 5.96e-13 | -0.00484 | -0.0913 | 5.78 | 7.5e-09 |
b_non_work_mom_par_act | b_age_kid_act | 0.00023 | 0.158 | -0.643 | 0.52 | 0.000205 | 0.138 | -0.648 | 0.517 |
b_non_work_mom_par_act | b_age_par_act | -0.000472 | -0.183 | 2.32 | 0.0204 | -0.000431 | -0.163 | 2.34 | 0.0192 |
b_non_work_mom_par_act | b_female_kid_act | -0.000276 | -0.0533 | 4.28 | 1.87e-05 | -0.00031 | -0.0609 | 4.3 | 1.71e-05 |
b_non_work_mom_par_act | b_female_par_act | 1.04e-05 | 0.00173 | 2.78 | 0.00539 | 5.25e-05 | 0.00836 | 2.72 | 0.00649 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | 0.00017 | 0.0312 | -1.56 | 0.118 | 0.000139 | 0.0258 | -1.57 | 0.117 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -0.000325 | -0.0537 | 0.716 | 0.474 | -0.000136 | -0.0227 | 0.731 | 0.465 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -0.000113 | -0.0207 | -0.305 | 0.76 | -3.91e-05 | -0.00703 | -0.305 | 0.76 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | -0.000519 | -0.0849 | -0.316 | 0.752 | -0.000537 | -0.0848 | -0.311 | 0.756 |
b_non_work_mom_par_act | b_log_density_kid_act | -9.78e-05 | -0.0469 | -0.278 | 0.781 | -0.000151 | -0.0711 | -0.279 | 0.78 |
b_non_work_mom_par_act | b_log_density_par_act | 1.13e-05 | 0.00407 | -1.04 | 0.297 | -1.86e-05 | -0.00567 | -1.01 | 0.311 |
b_non_work_mom_par_act | b_log_distance_kid_act | -0.000391 | -0.07 | 15.4 | 0 | -0.000392 | -0.0597 | 14.2 | 0 |
b_non_work_mom_par_act | b_log_distance_par_act | -0.0002 | -0.0164 | 8.22 | 2.22e-16 | -0.000515 | -0.0299 | 6.05 | 1.42e-09 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 0.000285 | 0.0943 | 2.35 | 0.0189 | 0.000298 | 0.096 | 2.36 | 0.0183 |
b_non_work_mom_par_act | b_log_income_k_par_act | 0.000824 | 0.245 | 1.89 | 0.0586 | 0.000732 | 0.201 | 1.84 | 0.0665 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -0.000282 | -0.0343 | 1.65 | 0.0996 | 0.000175 | 0.0217 | 1.71 | 0.0876 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -6.41e-05 | -0.007 | 0.739 | 0.46 | 0.000633 | 0.0675 | 0.747 | 0.455 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 0.00291 | 0.522 | 3.42 | 0.000629 | 0.00288 | 0.524 | 3.45 | 0.000552 |
b_veh_per_driver_kid_act | alpha_active | -0.0027 | -0.257 | -4.67 | 3.02e-06 | -0.00557 | -0.331 | -3.38 | 0.000731 |
b_veh_per_driver_kid_act | asc_kid_act | -0.00613 | -0.21 | 12 | 0 | -0.00695 | -0.213 | 11.7 | 0 |
b_veh_per_driver_kid_act | asc_par_act | 0.00263 | 0.0607 | 6.64 | 3.22e-11 | 0.00922 | 0.154 | 5.34 | 9.2e-08 |
b_veh_per_driver_kid_act | b_age_kid_act | 0.000143 | 0.0975 | -5.7 | 1.21e-08 | 0.000303 | 0.18 | -5.29 | 1.19e-07 |
b_veh_per_driver_kid_act | b_age_par_act | -0.000561 | -0.215 | -2.12 | 0.0337 | -0.00086 | -0.288 | -1.91 | 0.0558 |
b_veh_per_driver_kid_act | b_female_kid_act | 2.4e-05 | 0.00458 | 0.419 | 0.675 | -7.41e-05 | -0.0129 | 0.393 | 0.695 |
b_veh_per_driver_kid_act | b_female_par_act | 0.00066 | 0.109 | -0.99 | 0.322 | 0.00123 | 0.174 | -0.949 | 0.343 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 0.000325 | 0.0589 | -5.54 | 2.96e-08 | 0.000454 | 0.0746 | -5.27 | 1.33e-07 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | -0.000338 | -0.0552 | -2.87 | 0.00415 | -0.000601 | -0.0891 | -2.68 | 0.00737 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | -0.000215 | -0.0388 | -4.07 | 4.64e-05 | -0.000643 | -0.103 | -3.7 | 0.000215 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | -0.000367 | -0.0592 | -3.87 | 0.000109 | -0.00093 | -0.13 | -3.49 | 0.000492 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 5.65e-05 | 0.0267 | -5.15 | 2.54e-07 | -4.11e-06 | -0.00171 | -4.68 | 2.83e-06 |
b_veh_per_driver_kid_act | b_log_density_par_act | -5.61e-05 | -0.02 | -5.65 | 1.6e-08 | -0.00033 | -0.0892 | -4.94 | 8.01e-07 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 0.000566 | 0.1 | 12.6 | 0 | 0.00137 | 0.185 | 11.6 | 0 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 0.00257 | 0.208 | 6.49 | 8.46e-11 | 0.0056 | 0.288 | 4.81 | 1.48e-06 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -0.000581 | -0.19 | -2.2 | 0.0278 | -0.000832 | -0.238 | -2 | 0.0458 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -2.59e-05 | -0.00758 | -2.81 | 0.00489 | 0.000325 | 0.079 | -2.66 | 0.00782 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 0.000307 | 0.0369 | -1.46 | 0.145 | 0.000228 | 0.025 | -1.4 | 0.161 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 0.000851 | 0.0917 | -2.25 | 0.0245 | 0.00143 | 0.135 | -2.17 | 0.0296 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | -0.000132 | -0.0233 | -1.44 | 0.149 | -0.000169 | -0.0273 | -1.37 | 0.172 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | 0.000395 | 0.0627 | -3.75 | 0.00018 | 0.000579 | 0.085 | -3.63 | 0.000286 |
b_veh_per_driver_par_act | alpha_active | 0.000132 | 0.00962 | -6.49 | 8.45e-11 | 0.000863 | 0.0368 | -4.85 | 1.23e-06 |
b_veh_per_driver_par_act | asc_kid_act | -0.000109 | -0.00286 | 11.5 | 0 | 0.000842 | 0.0185 | 11.2 | 0 |
b_veh_per_driver_par_act | asc_par_act | -0.00286 | -0.0506 | 5.95 | 2.65e-09 | -0.00719 | -0.0862 | 4.71 | 2.46e-06 |
b_veh_per_driver_par_act | b_age_kid_act | -0.000304 | -0.158 | -6.86 | 6.88e-12 | -0.000437 | -0.186 | -5.86 | 4.67e-09 |
b_veh_per_driver_par_act | b_age_par_act | 0.000805 | 0.237 | -4.77 | 1.81e-06 | 0.0013 | 0.312 | -4.17 | 3.03e-05 |
b_veh_per_driver_par_act | b_female_kid_act | 0.000406 | 0.0594 | -2.04 | 0.0409 | 0.000571 | 0.0713 | -1.82 | 0.0687 |
b_veh_per_driver_par_act | b_female_par_act | 8.16e-05 | 0.0103 | -3.05 | 0.00229 | -1.74e-05 | -0.00176 | -2.67 | 0.00767 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | -0.00021 | -0.0293 | -6.76 | 1.38e-11 | -0.000262 | -0.0309 | -6.01 | 1.83e-09 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | 0.000308 | 0.0385 | -4.84 | 1.32e-06 | 0.000932 | 0.0991 | -4.46 | 8.31e-06 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | -0.000287 | -0.0396 | -5.71 | 1.15e-08 | -0.000292 | -0.0334 | -5.06 | 4.11e-07 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -0.000448 | -0.0555 | -5.49 | 4.07e-08 | 0.000107 | 0.0107 | -5.01 | 5.58e-07 |
b_veh_per_driver_par_act | b_log_density_kid_act | 0.000119 | 0.043 | -6.75 | 1.44e-11 | 0.000187 | 0.0559 | -5.81 | 6.41e-09 |
b_veh_per_driver_par_act | b_log_density_par_act | -0.000139 | -0.038 | -7.06 | 1.69e-12 | -0.000279 | -0.0541 | -5.97 | 2.36e-09 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.00123 | 0.167 | 8.53 | 0 | 0.00116 | 0.112 | 7.03 | 2.08e-12 |
b_veh_per_driver_par_act | b_log_distance_par_act | 0.00182 | 0.113 | 4.2 | 2.65e-05 | 0.00144 | 0.0532 | 2.99 | 0.00276 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -0.000272 | -0.0679 | -4.38 | 1.18e-05 | -0.000432 | -0.0886 | -3.77 | 0.000164 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -0.00108 | -0.243 | -4.46 | 8.06e-06 | -0.00154 | -0.269 | -3.82 | 0.000132 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 0.000397 | 0.0365 | -3.29 | 0.001 | -0.000212 | -0.0168 | -2.95 | 0.0032 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 0.000467 | 0.0386 | -3.86 | 0.000111 | -0.00112 | -0.0758 | -3.32 | 0.000909 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | 0.000352 | 0.0477 | -3.61 | 0.00031 | 0.000723 | 0.0836 | -3.27 | 0.00109 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | -0.00078 | -0.0949 | -5.09 | 3.53e-07 | -0.001 | -0.106 | -4.58 | 4.58e-06 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 0.00374 | 0.45 | -2.92 | 0.00353 | 0.00402 | 0.375 | -2.39 | 0.0171 |
b_y2017_kid_act | alpha_active | 0.0097 | 0.735 | -7.07 | 1.5e-12 | 0.0191 | 0.822 | -5.49 | 3.94e-08 |
b_y2017_kid_act | asc_kid_act | -0.000274 | -0.00746 | 12.7 | 0 | -0.00209 | -0.0464 | 12.2 | 0 |
b_y2017_kid_act | asc_par_act | -0.024 | -0.441 | 6.35 | 2.12e-10 | -0.0501 | -0.606 | 4.94 | 7.64e-07 |
b_y2017_kid_act | b_age_kid_act | -0.000552 | -0.299 | -2.73 | 0.00631 | -0.000813 | -0.35 | -2.27 | 0.0233 |
b_y2017_kid_act | b_age_par_act | 0.00177 | 0.54 | -0.372 | 0.71 | 0.00269 | 0.653 | -0.317 | 0.751 |
b_y2017_kid_act | b_female_kid_act | 0.000279 | 0.0424 | 1.77 | 0.0775 | 0.000314 | 0.0395 | 1.53 | 0.126 |
b_y2017_kid_act | b_female_par_act | -0.00193 | -0.254 | 0.437 | 0.662 | -0.0039 | -0.398 | 0.359 | 0.719 |
b_y2017_kid_act | b_has_big_sib_kid_act | -0.000431 | -0.0623 | -3.22 | 0.00126 | -0.000933 | -0.111 | -2.76 | 0.00574 |
b_y2017_kid_act | b_has_big_sib_par_act | 0.00167 | 0.216 | -1.44 | 0.149 | 0.00244 | 0.261 | -1.29 | 0.197 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 0.00128 | 0.183 | -2.48 | 0.0132 | 0.00248 | 0.287 | -2.26 | 0.0239 |
b_y2017_kid_act | b_has_lil_sib_par_act | 0.00163 | 0.21 | -2.47 | 0.0136 | 0.00348 | 0.352 | -2.33 | 0.0199 |
b_y2017_kid_act | b_log_density_kid_act | 0.000227 | 0.0853 | -2.62 | 0.00874 | 0.000353 | 0.106 | -2.19 | 0.0283 |
b_y2017_kid_act | b_log_density_par_act | 0.000577 | 0.164 | -3.3 | 0.000957 | 0.00164 | 0.32 | -2.9 | 0.00379 |
b_y2017_kid_act | b_log_distance_kid_act | -0.0024 | -0.338 | 10.2 | 0 | -0.00551 | -0.539 | 7.95 | 2e-15 |
b_y2017_kid_act | b_log_distance_par_act | -0.00965 | -0.622 | 5.17 | 2.33e-07 | -0.0202 | -0.752 | 3.69 | 0.000222 |
b_y2017_kid_act | b_log_income_k_kid_act | 0.000322 | 0.0836 | -0.429 | 0.668 | 0.000956 | 0.198 | -0.373 | 0.709 |
b_y2017_kid_act | b_log_income_k_par_act | -0.000969 | -0.226 | -0.779 | 0.436 | -0.00233 | -0.409 | -0.624 | 0.533 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 0.000112 | 0.0107 | -0.166 | 0.868 | 0.000144 | 0.0115 | -0.15 | 0.88 |
b_y2017_kid_act | b_non_work_dad_par_act | -0.00212 | -0.182 | -0.833 | 0.405 | -0.00496 | -0.339 | -0.701 | 0.483 |
b_y2017_kid_act | b_non_work_mom_kid_act | 0.00106 | 0.149 | 0.0726 | 0.942 | 0.0016 | 0.187 | 0.0644 | 0.949 |
b_y2017_kid_act | b_non_work_mom_par_act | -0.000798 | -0.101 | -1.82 | 0.0694 | -0.000674 | -0.0715 | -1.63 | 0.102 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -0.00145 | -0.181 | 1.18 | 0.238 | -0.00285 | -0.268 | 0.979 | 0.327 |
b_y2017_kid_act | b_veh_per_driver_par_act | 0.000695 | 0.0665 | 3.24 | 0.00121 | 0.00162 | 0.109 | 2.78 | 0.00537 |
b_y2017_par_act | alpha_active | -0.00423 | -0.2 | 3.11 | 0.00184 | -0.00188 | -0.0682 | 2.86 | 0.00425 |
b_y2017_par_act | asc_kid_act | -0.0123 | -0.209 | 14.4 | 0 | -0.0121 | -0.226 | 14.4 | 0 |
b_y2017_par_act | asc_par_act | -0.014 | -0.162 | 8.66 | 0 | -0.0212 | -0.217 | 7.02 | 2.17e-12 |
b_y2017_par_act | b_age_kid_act | 0.000948 | 0.321 | 6.73 | 1.68e-11 | 0.000729 | 0.265 | 7.5 | 6.57e-14 |
b_y2017_par_act | b_age_par_act | -0.00264 | -0.504 | 7.3 | 2.92e-13 | -0.00183 | -0.376 | 8.2 | 2.22e-16 |
b_y2017_par_act | b_female_kid_act | -0.000933 | -0.0888 | 8.66 | 0 | -0.000895 | -0.0952 | 9.47 | 0 |
b_y2017_par_act | b_female_par_act | 0.000992 | 0.0817 | 8.16 | 4.44e-16 | 0.000731 | 0.063 | 8.75 | 0 |
b_y2017_par_act | b_has_big_sib_kid_act | 0.00136 | 0.123 | 5.62 | 1.96e-08 | 0.000913 | 0.0917 | 6.09 | 1.1e-09 |
b_y2017_par_act | b_has_big_sib_par_act | -0.000956 | -0.0777 | 6.43 | 1.26e-10 | -0.000763 | -0.0692 | 7.03 | 2e-12 |
b_y2017_par_act | b_has_lil_sib_kid_act | 0.000864 | 0.0776 | 6.27 | 3.62e-10 | 0.000721 | 0.0704 | 6.83 | 8.21e-12 |
b_y2017_par_act | b_has_lil_sib_par_act | 0.00133 | 0.107 | 6.22 | 5.06e-10 | 0.00113 | 0.0964 | 6.71 | 1.93e-11 |
b_y2017_par_act | b_log_density_kid_act | -0.000129 | -0.0304 | 6.57 | 5.03e-11 | -6.11e-05 | -0.0156 | 7.33 | 2.34e-13 |
b_y2017_par_act | b_log_density_par_act | 0.000735 | 0.13 | 6.31 | 2.86e-10 | 0.000737 | 0.122 | 6.97 | 3.26e-12 |
b_y2017_par_act | b_log_distance_kid_act | -0.00313 | -0.276 | 14.5 | 0 | -0.00275 | -0.227 | 15.3 | 0 |
b_y2017_par_act | b_log_distance_par_act | -0.00265 | -0.107 | 10.8 | 0 | -0.00467 | -0.147 | 9 | 0 |
b_y2017_par_act | b_log_income_k_kid_act | -0.000303 | -0.0493 | 7.76 | 8.22e-15 | 0.000159 | 0.0278 | 8.76 | 0 |
b_y2017_par_act | b_log_income_k_par_act | 0.000804 | 0.117 | 7.75 | 9.33e-15 | 0.00165 | 0.245 | 8.94 | 0 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.00028 | -0.0167 | 6.82 | 8.88e-12 | 0.000323 | 0.0218 | 7.51 | 5.77e-14 |
b_y2017_par_act | b_non_work_dad_par_act | 0.00209 | 0.113 | 6.42 | 1.39e-10 | 0.00219 | 0.127 | 6.85 | 7.63e-12 |
b_y2017_par_act | b_non_work_mom_kid_act | -0.000927 | -0.0817 | 7.47 | 8.24e-14 | -0.000619 | -0.0611 | 8.23 | 2.22e-16 |
b_y2017_par_act | b_non_work_mom_par_act | 0.00319 | 0.252 | 6.86 | 6.88e-12 | 0.00296 | 0.265 | 7.62 | 2.51e-14 |
b_y2017_par_act | b_veh_per_driver_kid_act | 0.00128 | 0.0999 | 8.75 | 0 | 0.00142 | 0.113 | 9.43 | 0 |
b_y2017_par_act | b_veh_per_driver_par_act | -0.00538 | -0.322 | 8.23 | 2.22e-16 | -0.00565 | -0.322 | 8.28 | 2.22e-16 |
b_y2017_par_act | b_y2017_kid_act | -0.00148 | -0.0921 | 6.8 | 1.02e-11 | -0.000408 | -0.0235 | 7.05 | 1.79e-12 |
mu_active | alpha_active | 0.00289 | 0.036 | 4.62 | 3.91e-06 | -0.0176 | -0.139 | 4.01 | 6.01e-05 |
mu_active | asc_kid_act | 0.0398 | 0.179 | 12.7 | 0 | 0.0501 | 0.204 | 12.1 | 0 |
mu_active | asc_par_act | 0.0347 | 0.105 | 9.4 | 0 | 0.123 | 0.274 | 8.97 | 0 |
mu_active | b_age_kid_act | -0.00347 | -0.309 | 5.19 | 2.06e-07 | -0.00336 | -0.266 | 4.81 | 1.53e-06 |
mu_active | b_age_par_act | 0.00958 | 0.481 | 5.81 | 6.08e-09 | 0.00821 | 0.366 | 5.34 | 9.55e-08 |
mu_active | b_female_kid_act | 0.00238 | 0.0594 | 6.07 | 1.29e-09 | 0.00265 | 0.0613 | 5.61 | 2.01e-08 |
mu_active | b_female_par_act | -0.00205 | -0.0444 | 5.75 | 8.96e-09 | 0.00318 | 0.0596 | 5.38 | 7.38e-08 |
mu_active | b_has_big_sib_kid_act | -0.00224 | -0.0532 | 5 | 5.72e-07 | -7.53e-05 | -0.00164 | 4.65 | 3.29e-06 |
mu_active | b_has_big_sib_par_act | 0.00321 | 0.0685 | 5.46 | 4.69e-08 | 0.000485 | 0.00956 | 5.02 | 5.27e-07 |
mu_active | b_has_lil_sib_kid_act | -0.00244 | -0.0577 | 5.21 | 1.93e-07 | -0.00467 | -0.099 | 4.79 | 1.63e-06 |
mu_active | b_has_lil_sib_par_act | -0.00204 | -0.0431 | 5.2 | 2.03e-07 | -0.00107 | -0.02 | 4.82 | 1.45e-06 |
mu_active | b_log_density_kid_act | 0.00115 | 0.071 | 5.3 | 1.16e-07 | 0.00165 | 0.0916 | 4.9 | 9.54e-07 |
mu_active | b_log_density_par_act | -0.00554 | -0.258 | 5.1 | 3.48e-07 | -0.0118 | -0.424 | 4.65 | 3.28e-06 |
mu_active | b_log_distance_kid_act | 0.0103 | 0.239 | 8.26 | 2.22e-16 | 0.018 | 0.324 | 7.73 | 1.04e-14 |
mu_active | b_log_distance_par_act | 0.0123 | 0.13 | 7.69 | 1.49e-14 | 0.0402 | 0.275 | 7.37 | 1.75e-13 |
mu_active | b_log_income_k_kid_act | -0.000864 | -0.0369 | 5.63 | 1.84e-08 | -0.00347 | -0.132 | 5.17 | 2.32e-07 |
mu_active | b_log_income_k_par_act | -0.0022 | -0.0846 | 5.53 | 3.24e-08 | -0.00175 | -0.0565 | 5.12 | 3.09e-07 |
mu_active | b_non_work_dad_kid_ace | 0.00275 | 0.0431 | 5.64 | 1.66e-08 | 0.000233 | 0.0034 | 5.19 | 2.07e-07 |
mu_active | b_non_work_dad_par_act | -0.00478 | -0.0675 | 5.33 | 9.6e-08 | -0.00715 | -0.0897 | 4.92 | 8.69e-07 |
mu_active | b_non_work_mom_kid_act | 0.00356 | 0.0824 | 5.75 | 8.7e-09 | 0.00268 | 0.0575 | 5.3 | 1.13e-07 |
mu_active | b_non_work_mom_par_act | -0.011 | -0.23 | 5.13 | 2.83e-07 | -0.0135 | -0.262 | 4.75 | 2.08e-06 |
mu_active | b_veh_per_driver_kid_act | -0.00458 | -0.094 | 5.87 | 4.3e-09 | -0.00407 | -0.0703 | 5.44 | 5.31e-08 |
mu_active | b_veh_per_driver_par_act | 0.0225 | 0.354 | 6.78 | 1.16e-11 | 0.0349 | 0.432 | 6.39 | 1.65e-10 |
mu_active | b_y2017_kid_act | 0.00901 | 0.147 | 5.79 | 7.18e-09 | -0.000959 | -0.012 | 5.19 | 2.08e-07 |
mu_active | b_y2017_par_act | -0.0488 | -0.499 | 3.06 | 0.00223 | -0.0494 | -0.522 | 2.89 | 0.00387 |
mu_parent | alpha_active | -0.0243 | -0.678 | 3.28 | 0.00105 | -0.0631 | -0.872 | 2.22 | 0.0265 |
mu_parent | asc_kid_act | 0.00725 | 0.0728 | 15.2 | 0 | 0.00935 | 0.0666 | 13.1 | 0 |
mu_parent | asc_par_act | 0.0837 | 0.567 | 12.6 | 0 | 0.188 | 0.73 | 11.7 | 0 |
mu_parent | b_age_kid_act | 0.000622 | 0.124 | 5.79 | 7.18e-09 | 0.00229 | 0.316 | 4.21 | 2.51e-05 |
mu_parent | b_age_par_act | -0.00126 | -0.141 | 6.55 | 5.67e-11 | -0.00516 | -0.402 | 4.66 | 3.19e-06 |
mu_parent | b_female_kid_act | 0.00099 | 0.0555 | 7.47 | 7.77e-14 | 0.000619 | 0.0251 | 5.42 | 5.93e-08 |
mu_parent | b_female_par_act | 0.0048 | 0.233 | 7.24 | 4.35e-13 | 0.0126 | 0.413 | 5.46 | 4.7e-08 |
mu_parent | b_has_big_sib_kid_act | 0.000417 | 0.0222 | 5.21 | 1.91e-07 | 0.00333 | 0.127 | 3.88 | 0.000103 |
mu_parent | b_has_big_sib_par_act | -0.00214 | -0.103 | 5.84 | 5.08e-09 | -0.00514 | -0.177 | 4.26 | 2.02e-05 |
mu_parent | b_has_lil_sib_kid_act | -0.00323 | -0.171 | 5.42 | 6e-08 | -0.0076 | -0.282 | 3.93 | 8.58e-05 |
mu_parent | b_has_lil_sib_par_act | -0.0054 | -0.256 | 5.24 | 1.62e-07 | -0.0121 | -0.394 | 3.8 | 0.000147 |
mu_parent | b_log_density_kid_act | -0.000825 | -0.114 | 5.76 | 8.47e-09 | -0.0015 | -0.146 | 4.17 | 3.08e-05 |
mu_parent | b_log_density_par_act | -0.00287 | -0.3 | 5.36 | 8.39e-08 | -0.00734 | -0.461 | 3.83 | 0.000128 |
mu_parent | b_log_distance_kid_act | 0.0111 | 0.578 | 13.8 | 0 | 0.0218 | 0.683 | 10.1 | 0 |
mu_parent | b_log_distance_par_act | 0.0335 | 0.797 | 17.4 | 0 | 0.0756 | 0.904 | 15.2 | 0 |
mu_parent | b_log_income_k_kid_act | -0.000391 | -0.0374 | 6.56 | 5.23e-11 | -0.00329 | -0.219 | 4.68 | 2.9e-06 |
mu_parent | b_log_income_k_par_act | 0.00169 | 0.146 | 6.56 | 5.35e-11 | 0.0055 | 0.311 | 4.84 | 1.31e-06 |
mu_parent | b_non_work_dad_kid_ace | 0.000161 | 0.00567 | 6.31 | 2.87e-10 | -0.00129 | -0.0331 | 4.65 | 3.28e-06 |
mu_parent | b_non_work_dad_par_act | 0.00424 | 0.134 | 6.11 | 9.67e-10 | 0.0135 | 0.296 | 4.77 | 1.82e-06 |
mu_parent | b_non_work_mom_kid_act | -0.0019 | -0.0989 | 6.48 | 8.97e-11 | -0.00433 | -0.163 | 4.73 | 2.26e-06 |
mu_parent | b_non_work_mom_par_act | -0.00248 | -0.115 | 5.53 | 3.14e-08 | -0.00215 | -0.0732 | 4.14 | 3.52e-05 |
mu_parent | b_veh_per_driver_kid_act | 0.0031 | 0.142 | 7.42 | 1.16e-13 | 0.0084 | 0.254 | 5.54 | 2.95e-08 |
mu_parent | b_veh_per_driver_par_act | 0.00651 | 0.23 | 8.62 | 0 | 0.00746 | 0.162 | 6.13 | 8.92e-10 |
mu_parent | b_y2017_kid_act | -0.0112 | -0.411 | 5.69 | 1.25e-08 | -0.0291 | -0.637 | 4.01 | 6.16e-05 |
mu_parent | b_y2017_par_act | -0.0164 | -0.376 | 1.43 | 0.154 | -0.014 | -0.259 | 1.19 | 0.235 |
mu_parent | mu_active | 0.0315 | 0.19 | -2.64 | 0.00833 | 0.0787 | 0.316 | -2.52 | 0.0118 |
Smallest eigenvalue: 2.28448
+Largest eigenvalue: 393204
+Condition number: 172120
+ \ No newline at end of file diff --git a/models/IATBR plan/3 alternatives/cross-nest/cross_nest3.pickle b/models/IATBR plan/3 alternatives/cross-nest/cross_nest3.pickle new file mode 100644 index 0000000..e369f78 Binary files /dev/null and b/models/IATBR plan/3 alternatives/cross-nest/cross_nest3.pickle differ diff --git a/models/IATBR plan/3 alternatives/ind-nest/__ind_nests3.iter b/models/IATBR plan/3 alternatives/ind-nest/__ind_nests3.iter new file mode 100644 index 0000000..a32cc01 --- /dev/null +++ b/models/IATBR plan/3 alternatives/ind-nest/__ind_nests3.iter @@ -0,0 +1,25 @@ +asc_kid_act = -5.221925755600616 +asc_par_act = -5.649684562425619 +b_age_kid_act = 0.24265885674181156 +b_age_par_act = -0.24926976825849176 +b_female_kid_act = -0.3160862264790188 +b_female_par_act = -0.13145273674434776 +b_has_big_sib_kid_act = 0.33825512705128197 +b_has_big_sib_par_act = 0.04110619725738691 +b_has_lil_sib_kid_act = 0.2122484291019568 +b_has_lil_sib_par_act = 0.2853222828743033 +b_log_density_kid_act = 0.17286906081998543 +b_log_density_par_act = 0.4015324798312105 +b_log_distance_kid_act = -1.6267339384045594 +b_log_distance_par_act = -1.719334888320281 +b_log_income_k_kid_act = -0.04717368063635171 +b_log_income_k_par_act = 0.06502762720790774 +b_non_work_dad_kid_ace = -0.1100864452280445 +b_non_work_dad_par_act = 0.20058747419927175 +b_non_work_mom_kid_act = -0.122970505094232 +b_non_work_mom_par_act = 0.4178274970572736 +b_veh_per_driver_kid_act = -0.19017869378955585 +b_veh_per_driver_par_act = -1.1217687635807188 +b_y2017_kid_act = -0.20304534528612922 +b_y2017_par_act = 2.6828766381360993 +mu_parent = 1.006189234591299 diff --git a/models/IATBR plan/3 alternatives/ind-nest/biogeme.toml b/models/IATBR plan/3 alternatives/ind-nest/biogeme.toml new file mode 100644 index 0000000..77c6d37 --- /dev/null +++ b/models/IATBR plan/3 alternatives/ind-nest/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on March 28, 2024. 12:40:51 + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 1000 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + diff --git a/models/IATBR plan/3 alternatives/ind-nest/ind_nests3.html b/models/IATBR plan/3 alternatives/ind-nest/ind_nests3.html new file mode 100644 index 0000000..4bfe67f --- /dev/null +++ b/models/IATBR plan/3 alternatives/ind-nest/ind_nests3.html @@ -0,0 +1,394 @@ + + + + +biogeme 3.2.13 [2024-04-04]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-04 17:05:46.075798
+Report file: | ind_nests3.html |
Database name: | est |
Number of estimated parameters: | 25 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -5394.186 |
Final log likelihood: | -3176.634 |
Likelihood ratio test for the init. model: | 4435.105 |
Rho-square for the init. model: | 0.411 |
Rho-square-bar for the init. model: | 0.406 |
Akaike Information Criterion: | 6403.268 |
Bayesian Information Criterion: | 6565.744 |
Final gradient norm: | 6.8852E-03 |
Nbr of threads: | 12 |
Relative gradient: | 1.5466572200918285e-06 |
Cause of termination: | Relative gradient = 1.5e-06 <= 6.1e-06 |
Number of function evaluations: | 30 |
Number of gradient evaluations: | 20 |
Number of hessian evaluations: | 19 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 29 |
Proportion of Hessian calculation: | 19/19 = 100.0% |
Optimization time: | 0:00:17.411154 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
asc_kid_act | -5.22 | 0.402 | -13 | 0 |
asc_par_act | -5.65 | 1.41 | -4.01 | 5.97e-05 |
b_age_kid_act | 0.243 | 0.0179 | 13.6 | 0 |
b_age_par_act | -0.249 | 0.0666 | -3.74 | 0.000184 |
b_female_kid_act | -0.316 | 0.0722 | -4.38 | 1.2e-05 |
b_female_par_act | -0.131 | 0.135 | -0.974 | 0.33 |
b_has_big_sib_kid_act | 0.338 | 0.0757 | 4.47 | 7.87e-06 |
b_has_big_sib_par_act | 0.0411 | 0.139 | 0.295 | 0.768 |
b_has_lil_sib_kid_act | 0.212 | 0.0758 | 2.8 | 0.0051 |
b_has_lil_sib_par_act | 0.285 | 0.155 | 1.84 | 0.0662 |
b_log_density_kid_act | 0.173 | 0.0298 | 5.8 | 6.55e-09 |
b_log_density_par_act | 0.402 | 0.108 | 3.7 | 0.000214 |
b_log_distance_kid_act | -1.63 | 0.0733 | -22.2 | 0 |
b_log_distance_par_act | -1.72 | 0.332 | -5.18 | 2.26e-07 |
b_log_income_k_kid_act | -0.0472 | 0.0424 | -1.11 | 0.266 |
b_log_income_k_par_act | 0.065 | 0.0737 | 0.882 | 0.378 |
b_non_work_dad_kid_ace | -0.11 | 0.115 | -0.955 | 0.339 |
b_non_work_dad_par_act | 0.201 | 0.193 | 1.04 | 0.298 |
b_non_work_mom_kid_act | -0.123 | 0.0774 | -1.59 | 0.112 |
b_non_work_mom_par_act | 0.418 | 0.164 | 2.55 | 0.0109 |
b_veh_per_driver_kid_act | -0.19 | 0.0877 | -2.17 | 0.0302 |
b_veh_per_driver_par_act | -1.12 | 0.276 | -4.06 | 4.82e-05 |
b_y2017_kid_act | -0.203 | 0.0875 | -2.32 | 0.0202 |
b_y2017_par_act | 2.68 | 0.584 | 4.59 | 4.37e-06 |
mu_parent | 1.01 | 0.231 | 4.36 | 1.3e-05 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_par_act | asc_kid_act | 0.0604 | 0.125 | -0.341 | 0.733 | 0.0576 | 0.102 | -0.3 | 0.764 |
b_age_kid_act | asc_kid_act | -0.00371 | -0.538 | 13.6 | 0 | -0.00374 | -0.521 | 13.3 | 0 |
b_age_kid_act | asc_par_act | 0.0017 | 0.0774 | 4.75 | 2.04e-06 | 0.00282 | 0.112 | 4.19 | 2.77e-05 |
b_age_par_act | asc_kid_act | -0.000966 | -0.0414 | 12.5 | 0 | -0.00111 | -0.0415 | 12.1 | 0 |
b_age_par_act | asc_par_act | 0.03 | 0.405 | 4.43 | 9.4e-06 | 0.0475 | 0.507 | 3.93 | 8.58e-05 |
b_age_par_act | b_age_kid_act | 0.000241 | 0.229 | -8.44 | 0 | 0.000308 | 0.259 | -7.64 | 2.15e-14 |
b_female_kid_act | asc_kid_act | -0.00157 | -0.0558 | 12.2 | 0 | -0.00158 | -0.0546 | 11.9 | 0 |
b_female_kid_act | asc_par_act | 0.00145 | 0.0162 | 4.29 | 1.77e-05 | 0.00089 | 0.00875 | 3.79 | 0.000153 |
b_female_kid_act | b_age_kid_act | 6.91e-06 | 0.00543 | -7.54 | 4.69e-14 | -1.31e-05 | -0.0101 | -7.49 | 6.71e-14 |
b_female_kid_act | b_age_par_act | 0.000111 | 0.0257 | -0.723 | 0.47 | -8.4e-06 | -0.00175 | -0.679 | 0.497 |
b_female_par_act | asc_kid_act | -0.000555 | -0.0106 | 12.3 | 0 | 0.000163 | 0.00301 | 12 | 0 |
b_female_par_act | asc_par_act | 0.0148 | 0.0885 | 4.46 | 8.19e-06 | 0.0153 | 0.0804 | 3.93 | 8.4e-05 |
b_female_par_act | b_age_kid_act | 8.45e-05 | 0.0356 | -2.77 | 0.00562 | 5.28e-05 | 0.0219 | -2.76 | 0.00583 |
b_female_par_act | b_age_par_act | 0.00108 | 0.135 | 0.843 | 0.399 | 0.00165 | 0.184 | 0.847 | 0.397 |
b_female_par_act | b_female_kid_act | 0.00184 | 0.19 | 1.32 | 0.187 | 0.00182 | 0.187 | 1.31 | 0.189 |
b_has_big_sib_kid_act | asc_kid_act | -0.00632 | -0.214 | 13.4 | 0 | -0.0061 | -0.2 | 13.1 | 0 |
b_has_big_sib_kid_act | asc_par_act | 0.000602 | 0.00642 | 4.81 | 1.47e-06 | 0.0062 | 0.0582 | 4.26 | 2.03e-05 |
b_has_big_sib_kid_act | b_age_kid_act | 0.000232 | 0.174 | 1.28 | 0.199 | 0.000211 | 0.156 | 1.27 | 0.203 |
b_has_big_sib_kid_act | b_age_par_act | 0.000192 | 0.0427 | 6.24 | 4.49e-10 | 0.000491 | 0.0973 | 6.13 | 8.87e-10 |
b_has_big_sib_kid_act | b_female_kid_act | -0.000166 | -0.0305 | 6.18 | 6.5e-10 | -0.000109 | -0.0199 | 6.19 | 5.89e-10 |
b_has_big_sib_kid_act | b_female_par_act | 2.92e-05 | 0.00288 | 3.05 | 0.0023 | 0.000111 | 0.0109 | 3.05 | 0.00228 |
b_has_big_sib_par_act | asc_kid_act | -0.00218 | -0.0401 | 12.5 | 0 | -0.00199 | -0.0355 | 12.2 | 0 |
b_has_big_sib_par_act | asc_par_act | -0.0107 | -0.062 | 4.52 | 6.09e-06 | 0.00764 | 0.039 | 4.04 | 5.37e-05 |
b_has_big_sib_par_act | b_age_kid_act | 9.02e-05 | 0.0368 | -1.44 | 0.149 | 0.000153 | 0.0614 | -1.45 | 0.148 |
b_has_big_sib_par_act | b_age_par_act | 0.00108 | 0.13 | 2.02 | 0.0438 | 0.00163 | 0.176 | 2.02 | 0.0429 |
b_has_big_sib_par_act | b_female_kid_act | -2.31e-05 | -0.0023 | 2.28 | 0.0227 | -3.12e-05 | -0.00311 | 2.27 | 0.0229 |
b_has_big_sib_par_act | b_female_par_act | -0.000165 | -0.0088 | 0.888 | 0.375 | -0.00055 | -0.0293 | 0.877 | 0.38 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 0.00204 | 0.194 | -2.05 | 0.0401 | 0.00221 | 0.209 | -2.07 | 0.0389 |
b_has_lil_sib_kid_act | asc_kid_act | -0.00518 | -0.176 | 13.2 | 0 | -0.00507 | -0.167 | 12.9 | 0 |
b_has_lil_sib_kid_act | asc_par_act | -0.00656 | -0.07 | 4.69 | 2.71e-06 | -0.00597 | -0.056 | 4.15 | 3.38e-05 |
b_has_lil_sib_kid_act | b_age_kid_act | 8.91e-06 | 0.00669 | -0.393 | 0.695 | -1.03e-05 | -0.00761 | -0.39 | 0.697 |
b_has_lil_sib_kid_act | b_age_par_act | -0.000207 | -0.0458 | 4.69 | 2.73e-06 | -0.000283 | -0.0561 | 4.45 | 8.57e-06 |
b_has_lil_sib_kid_act | b_female_kid_act | -6.3e-05 | -0.0116 | 5.03 | 4.84e-07 | -0.000119 | -0.0218 | 4.99 | 5.95e-07 |
b_has_lil_sib_kid_act | b_female_par_act | -0.00011 | -0.0108 | 2.22 | 0.0266 | -0.000177 | -0.0173 | 2.2 | 0.0275 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 0.00146 | 0.256 | -1.37 | 0.171 | 0.00146 | 0.255 | -1.36 | 0.173 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 0.000542 | 0.0516 | 1.11 | 0.269 | 0.000568 | 0.0538 | 1.1 | 0.269 |
b_has_lil_sib_par_act | asc_kid_act | -0.00237 | -0.0406 | 13 | 0 | -0.00178 | -0.0286 | 12.7 | 0 |
b_has_lil_sib_par_act | asc_par_act | -0.0693 | -0.373 | 4.55 | 5.42e-06 | -0.0955 | -0.437 | 4 | 6.21e-05 |
b_has_lil_sib_par_act | b_age_kid_act | -0.000163 | -0.0618 | 0.281 | 0.779 | -0.000299 | -0.108 | 0.27 | 0.787 |
b_has_lil_sib_par_act | b_age_par_act | -0.00249 | -0.279 | 3.04 | 0.00237 | -0.00342 | -0.33 | 2.84 | 0.00449 |
b_has_lil_sib_par_act | b_female_kid_act | -0.00013 | -0.012 | 3.61 | 0.000312 | -0.000141 | -0.0126 | 3.49 | 0.000475 |
b_has_lil_sib_par_act | b_female_par_act | -0.00157 | -0.0781 | 2 | 0.046 | -0.00218 | -0.104 | 1.93 | 0.0537 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 0.000429 | 0.038 | -0.321 | 0.748 | 0.000145 | 0.0123 | -0.308 | 0.758 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 0.00437 | 0.21 | 1.34 | 0.179 | 0.00325 | 0.15 | 1.27 | 0.204 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 0.00227 | 0.201 | 0.476 | 0.634 | 0.00233 | 0.198 | 0.46 | 0.645 |
b_log_density_kid_act | asc_kid_act | -0.007 | -0.632 | 13.2 | 0 | -0.00776 | -0.648 | 12.8 | 0 |
b_log_density_kid_act | asc_par_act | -0.0069 | -0.196 | 4.67 | 3.06e-06 | -0.00861 | -0.205 | 4.12 | 3.82e-05 |
b_log_density_kid_act | b_age_kid_act | 3.85e-06 | 0.00769 | -2.1 | 0.0361 | -8.53e-06 | -0.016 | -1.99 | 0.0461 |
b_log_density_kid_act | b_age_par_act | -0.000196 | -0.116 | 6.12 | 9.61e-10 | -0.000257 | -0.129 | 5.52 | 3.34e-08 |
b_log_density_kid_act | b_female_kid_act | -7.51e-05 | -0.0367 | 6.24 | 4.5e-10 | -5.39e-05 | -0.0251 | 6.2 | 5.48e-10 |
b_log_density_kid_act | b_female_par_act | -0.000135 | -0.0353 | 2.2 | 0.028 | -0.000126 | -0.0315 | 2.19 | 0.0286 |
b_log_density_kid_act | b_has_big_sib_kid_act | 4.17e-06 | 0.00195 | -2.05 | 0.0401 | -1.47e-05 | -0.00651 | -2.03 | 0.0425 |
b_log_density_kid_act | b_has_big_sib_par_act | -3.05e-05 | -0.00772 | 0.927 | 0.354 | -0.000145 | -0.0351 | 0.919 | 0.358 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 4.75e-05 | 0.0222 | -0.492 | 0.623 | 8.89e-05 | 0.0394 | -0.49 | 0.624 |
b_log_density_kid_act | b_has_lil_sib_par_act | 0.000276 | 0.065 | -0.748 | 0.455 | 0.000385 | 0.0833 | -0.722 | 0.47 |
b_log_density_par_act | asc_kid_act | -0.00291 | -0.0795 | 13.8 | 0 | -0.00337 | -0.0772 | 13.3 | 0 |
b_log_density_par_act | asc_par_act | -0.101 | -0.872 | 4.57 | 4.9e-06 | -0.135 | -0.884 | 4.02 | 5.75e-05 |
b_log_density_par_act | b_age_kid_act | -0.000208 | -0.126 | 1.63 | 0.103 | -0.000272 | -0.14 | 1.41 | 0.157 |
b_log_density_par_act | b_age_par_act | -0.00321 | -0.574 | 4.75 | 2.04e-06 | -0.00429 | -0.594 | 4.13 | 3.58e-05 |
b_log_density_par_act | b_female_kid_act | -0.000174 | -0.0257 | 6 | 2.02e-09 | -4.24e-05 | -0.00541 | 5.49 | 3.94e-08 |
b_log_density_par_act | b_female_par_act | -0.00169 | -0.134 | 3.06 | 0.00219 | -0.00223 | -0.152 | 2.87 | 0.00407 |
b_log_density_par_act | b_has_big_sib_kid_act | -0.000187 | -0.0264 | 0.519 | 0.604 | -0.000647 | -0.0788 | 0.462 | 0.644 |
b_log_density_par_act | b_has_big_sib_par_act | -0.000623 | -0.0478 | 2.1 | 0.0354 | -0.00159 | -0.105 | 1.94 | 0.0518 |
b_log_density_par_act | b_has_lil_sib_kid_act | 0.000346 | 0.0489 | 1.61 | 0.107 | 0.000359 | 0.0437 | 1.46 | 0.144 |
b_log_density_par_act | b_has_lil_sib_par_act | 0.00397 | 0.283 | 0.763 | 0.446 | 0.00509 | 0.302 | 0.725 | 0.469 |
b_log_density_par_act | b_log_density_kid_act | 0.000598 | 0.225 | 2.5 | 0.0126 | 0.000727 | 0.225 | 2.16 | 0.0307 |
b_log_distance_kid_act | asc_kid_act | 0.00692 | 0.25 | 9.48 | 0 | 0.00602 | 0.204 | 9.14 | 0 |
b_log_distance_kid_act | asc_par_act | 0.0338 | 0.385 | 3.31 | 0.000942 | 0.0402 | 0.389 | 2.91 | 0.00357 |
b_log_distance_kid_act | b_age_kid_act | -0.000161 | -0.129 | -24.9 | 0 | -0.000128 | -0.0976 | -24.2 | 0 |
b_log_distance_kid_act | b_age_par_act | 0.00138 | 0.326 | -18.1 | 0 | 0.00183 | 0.375 | -17.6 | 0 |
b_log_distance_kid_act | b_female_kid_act | 0.000357 | 0.07 | -13.5 | 0 | 0.000313 | 0.059 | -13.1 | 0 |
b_log_distance_kid_act | b_female_par_act | 0.000888 | 0.0933 | -10.2 | 0 | 0.00123 | 0.124 | -10.3 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -4.02e-06 | -0.000752 | -19 | 0 | 0.00017 | 0.0307 | -18.9 | 0 |
b_log_distance_kid_act | b_has_big_sib_par_act | 0.000258 | 0.0262 | -10.8 | 0 | 0.000728 | 0.0713 | -10.9 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -0.000318 | -0.0595 | -17.3 | 0 | -0.000455 | -0.0819 | -16.8 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -0.00196 | -0.185 | -10.8 | 0 | -0.00272 | -0.239 | -10.2 | 0 |
b_log_distance_kid_act | b_log_density_kid_act | -0.000221 | -0.11 | -22.7 | 0 | -0.000167 | -0.0764 | -22.1 | 0 |
b_log_distance_kid_act | b_log_density_par_act | -0.00225 | -0.338 | -15 | 0 | -0.00282 | -0.354 | -13.4 | 0 |
b_log_distance_par_act | asc_kid_act | 0.00448 | 0.0395 | 7.33 | 2.22e-13 | 0.00251 | 0.0188 | 6.78 | 1.2e-11 |
b_log_distance_par_act | asc_par_act | 0.274 | 0.76 | 3.78 | 0.000154 | 0.37 | 0.792 | 3.38 | 0.00072 |
b_log_distance_par_act | b_age_kid_act | 0.00076 | 0.148 | -6.8 | 1.03e-11 | 0.00112 | 0.189 | -5.96 | 2.53e-09 |
b_log_distance_par_act | b_age_par_act | 0.0122 | 0.706 | -5.83 | 5.38e-09 | 0.0169 | 0.765 | -5.17 | 2.35e-07 |
b_log_distance_par_act | b_female_kid_act | 0.000736 | 0.0352 | -4.73 | 2.28e-06 | 0.000653 | 0.0272 | -4.15 | 3.29e-05 |
b_log_distance_par_act | b_female_par_act | 0.00658 | 0.168 | -5.31 | 1.08e-07 | 0.00721 | 0.161 | -4.7 | 2.59e-06 |
b_log_distance_par_act | b_has_big_sib_kid_act | 0.000745 | 0.034 | -6.91 | 4.76e-12 | 0.0023 | 0.0916 | -6.16 | 7.1e-10 |
b_log_distance_par_act | b_has_big_sib_par_act | 0.00282 | 0.0698 | -5.62 | 1.9e-08 | 0.00715 | 0.155 | -5.18 | 2.19e-07 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -0.00143 | -0.065 | -6.34 | 2.36e-10 | -0.00156 | -0.0621 | -5.6 | 2.21e-08 |
b_log_distance_par_act | b_has_lil_sib_par_act | -0.0155 | -0.358 | -5.4 | 6.7e-08 | -0.023 | -0.447 | -4.72 | 2.38e-06 |
b_log_distance_par_act | b_log_density_kid_act | -0.00131 | -0.159 | -6.39 | 1.71e-10 | -0.00167 | -0.169 | -5.59 | 2.26e-08 |
b_log_distance_par_act | b_log_density_par_act | -0.0186 | -0.682 | -5.88 | 4.21e-09 | -0.0247 | -0.685 | -5.12 | 3.02e-07 |
b_log_distance_par_act | b_log_distance_kid_act | 0.0111 | 0.541 | -0.357 | 0.721 | 0.0132 | 0.541 | -0.31 | 0.757 |
b_log_income_k_kid_act | asc_kid_act | -0.00838 | -0.508 | 12.5 | 0 | -0.00892 | -0.523 | 12.2 | 0 |
b_log_income_k_kid_act | asc_par_act | -0.00272 | -0.0519 | 4.5 | 6.77e-06 | -0.00374 | -0.0626 | 3.97 | 7.15e-05 |
b_log_income_k_kid_act | b_age_kid_act | 4.27e-05 | 0.0573 | -6.47 | 1.01e-10 | 4.92e-05 | 0.0649 | -6.45 | 1.11e-10 |
b_log_income_k_kid_act | b_age_par_act | 2.8e-05 | 0.0111 | 2.78 | 0.00548 | -6.45e-05 | -0.0228 | 2.53 | 0.0113 |
b_log_income_k_kid_act | b_female_kid_act | -1.63e-05 | -0.00536 | 3.21 | 0.00132 | 2.04e-05 | 0.00667 | 3.22 | 0.00128 |
b_log_income_k_kid_act | b_female_par_act | -1.52e-06 | -0.000267 | 0.598 | 0.55 | -8.78e-05 | -0.0153 | 0.593 | 0.553 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 3.22e-05 | 0.0101 | -4.48 | 7.59e-06 | 7.84e-05 | 0.0244 | -4.49 | 7.14e-06 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 4.61e-05 | 0.00786 | -0.609 | 0.543 | -1.51e-08 | -2.56e-06 | -0.607 | 0.544 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 0.000152 | 0.0478 | -3.06 | 0.0022 | 0.000126 | 0.0394 | -3.04 | 0.00238 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 4.28e-05 | 0.00678 | -2.14 | 0.0321 | 0.000114 | 0.0174 | -2.07 | 0.038 |
b_log_income_k_kid_act | b_log_density_kid_act | 5.91e-05 | 0.0493 | -4.43 | 9.54e-06 | 0.000117 | 0.0923 | -4.44 | 8.83e-06 |
b_log_income_k_kid_act | b_log_density_par_act | -5.48e-07 | -0.000138 | -4.36 | 1.27e-05 | 0.000139 | 0.0302 | -3.89 | 9.91e-05 |
b_log_income_k_kid_act | b_log_distance_kid_act | -0.000187 | -0.0625 | 18.7 | 0 | -0.000233 | -0.075 | 18.1 | 0 |
b_log_income_k_kid_act | b_log_distance_par_act | 5.25e-05 | 0.00428 | 5.7 | 1.2e-08 | -0.000256 | -0.0182 | 4.98 | 6.27e-07 |
b_log_income_k_par_act | asc_kid_act | -0.00303 | -0.106 | 13.1 | 0 | -0.0024 | -0.0809 | 12.8 | 0 |
b_log_income_k_par_act | asc_par_act | -0.0262 | -0.287 | 4.52 | 6.24e-06 | -0.0207 | -0.199 | 4.01 | 5.99e-05 |
b_log_income_k_par_act | b_age_kid_act | 4.3e-06 | 0.00332 | -2.35 | 0.0186 | 1.6e-05 | 0.0121 | -2.35 | 0.0189 |
b_log_income_k_par_act | b_age_par_act | 0.000147 | 0.0335 | 3.38 | 0.000734 | 0.000102 | 0.0208 | 3.2 | 0.0014 |
b_log_income_k_par_act | b_female_kid_act | -1.54e-05 | -0.00291 | 3.7 | 0.000216 | -1.49e-05 | -0.00279 | 3.69 | 0.000227 |
b_log_income_k_par_act | b_female_par_act | -0.000275 | -0.0279 | 1.27 | 0.205 | -0.00032 | -0.0321 | 1.26 | 0.207 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 2.44e-05 | 0.0044 | -2.6 | 0.0093 | 6.9e-06 | 0.00124 | -2.59 | 0.00968 |
b_log_income_k_par_act | b_has_big_sib_par_act | 0.000667 | 0.0653 | 0.156 | 0.876 | 0.000135 | 0.0131 | 0.153 | 0.879 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 7.27e-05 | 0.0131 | -1.41 | 0.159 | -7.58e-06 | -0.00136 | -1.39 | 0.164 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 0.000348 | 0.0317 | -1.34 | 0.181 | 0.000524 | 0.0458 | -1.3 | 0.192 |
b_log_income_k_par_act | b_log_density_kid_act | 3.26e-05 | 0.0156 | -1.38 | 0.168 | 1.26e-05 | 0.00575 | -1.36 | 0.174 |
b_log_income_k_par_act | b_log_density_par_act | 0.000329 | 0.0477 | -2.89 | 0.0038 | -0.000132 | -0.0165 | -2.55 | 0.0109 |
b_log_income_k_par_act | b_log_distance_kid_act | -0.000102 | -0.0197 | 16.4 | 0 | 0.000257 | 0.0475 | 16.7 | 0 |
b_log_income_k_par_act | b_log_distance_par_act | -0.00111 | -0.0522 | 5.88 | 4.04e-09 | -0.00036 | -0.0147 | 5.23 | 1.71e-07 |
b_log_income_k_par_act | b_log_income_k_kid_act | 0.000645 | 0.208 | 1.46 | 0.144 | 0.000573 | 0.183 | 1.44 | 0.151 |
b_non_work_dad_kid_ace | asc_kid_act | -0.00419 | -0.0925 | 12.2 | 0 | -0.00578 | -0.125 | 11.8 | 0 |
b_non_work_dad_kid_ace | asc_par_act | -0.000793 | -0.0055 | 4.44 | 9.03e-06 | -3.79e-07 | -2.34e-06 | 3.92 | 8.76e-05 |
b_non_work_dad_kid_ace | b_age_kid_act | -0.000124 | -0.0603 | -2.98 | 0.0029 | -0.000104 | -0.0506 | -3 | 0.00268 |
b_non_work_dad_kid_ace | b_age_par_act | 1.47e-05 | 0.00211 | 1.07 | 0.286 | 0.000169 | 0.0221 | 1.06 | 0.291 |
b_non_work_dad_kid_ace | b_female_kid_act | 0.000107 | 0.0128 | 1.52 | 0.129 | 1.46e-05 | 0.00175 | 1.52 | 0.129 |
b_non_work_dad_kid_ace | b_female_par_act | 0.000184 | 0.0118 | 0.121 | 0.904 | 0.000242 | 0.0156 | 0.121 | 0.903 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | 5.97e-05 | 0.00682 | -3.25 | 0.00116 | 0.000215 | 0.0246 | -3.29 | 0.001 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 5.64e-05 | 0.00349 | -0.836 | 0.403 | 0.000137 | 0.00854 | -0.84 | 0.401 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 0.000562 | 0.0641 | -2.4 | 0.0164 | 0.000612 | 0.0701 | -2.42 | 0.0157 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 0.000152 | 0.00876 | -2.1 | 0.036 | -7.07e-05 | -0.00395 | -2.04 | 0.0413 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 1.36e-05 | 0.00413 | -2.37 | 0.0178 | 0.00014 | 0.0408 | -2.4 | 0.0163 |
b_non_work_dad_kid_ace | b_log_density_par_act | -5.91e-05 | -0.00544 | -3.42 | 0.000626 | -9.13e-05 | -0.0073 | -3.22 | 0.00128 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | 7.49e-05 | 0.00912 | 11.2 | 0 | 7.56e-05 | 0.00895 | 11.1 | 0 |
b_non_work_dad_kid_ace | b_log_distance_par_act | 0.00026 | 0.00771 | 5.16 | 2.5e-07 | 0.000635 | 0.0166 | 4.6 | 4.2e-06 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 0.000749 | 0.153 | -0.536 | 0.592 | 0.0008 | 0.164 | -0.542 | 0.588 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 0.000304 | 0.0357 | -1.3 | 0.195 | 0.000243 | 0.0286 | -1.3 | 0.195 |
b_non_work_dad_par_act | asc_kid_act | -0.00191 | -0.0241 | 12.2 | 0 | -0.00186 | -0.024 | 12.1 | 0 |
b_non_work_dad_par_act | asc_par_act | -0.0174 | -0.0693 | 4.6 | 4.25e-06 | -7.69e-05 | -0.000284 | 4.12 | 3.82e-05 |
b_non_work_dad_par_act | b_age_kid_act | -5.65e-05 | -0.0158 | -0.206 | 0.837 | 5.45e-05 | 0.0158 | -0.218 | 0.828 |
b_non_work_dad_par_act | b_age_par_act | -0.000563 | -0.0465 | 2.1 | 0.0356 | -0.000125 | -0.00972 | 2.2 | 0.0277 |
b_non_work_dad_par_act | b_female_kid_act | 0.000137 | 0.00941 | 2.41 | 0.0161 | 0.000213 | 0.0153 | 2.53 | 0.0116 |
b_non_work_dad_par_act | b_female_par_act | 0.000517 | 0.0189 | 1.38 | 0.169 | 0.000482 | 0.0185 | 1.42 | 0.154 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 6.48e-06 | 0.000423 | -0.636 | 0.525 | 0.00014 | 0.00961 | -0.668 | 0.504 |
b_non_work_dad_par_act | b_has_big_sib_par_act | -4.51e-05 | -0.0016 | 0.648 | 0.517 | 0.000528 | 0.0197 | 0.677 | 0.498 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 0.000235 | 0.0154 | -0.0541 | 0.957 | -1.06e-05 | -0.000726 | -0.0563 | 0.955 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 0.00122 | 0.0403 | -0.343 | 0.732 | 0.00142 | 0.0476 | -0.351 | 0.726 |
b_non_work_dad_par_act | b_log_density_kid_act | 2.67e-05 | 0.00463 | 0.135 | 0.892 | 1.9e-06 | 0.000332 | 0.142 | 0.887 |
b_non_work_dad_par_act | b_log_density_par_act | 8.42e-05 | 0.00443 | -0.901 | 0.368 | -0.000967 | -0.0463 | -0.892 | 0.373 |
b_non_work_dad_par_act | b_log_distance_kid_act | -0.00022 | -0.0153 | 8.47 | 0 | 0.000504 | 0.0356 | 8.97 | 0 |
b_non_work_dad_par_act | b_log_distance_par_act | -0.00238 | -0.0404 | 5.32 | 1.04e-07 | 0.0031 | 0.0484 | 5.11 | 3.23e-07 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 0.000318 | 0.0371 | 1.2 | 0.228 | 0.000199 | 0.0244 | 1.26 | 0.207 |
b_non_work_dad_par_act | b_log_income_k_par_act | 0.00175 | 0.118 | 0.653 | 0.513 | 0.0025 | 0.176 | 0.7 | 0.484 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 0.00466 | 0.198 | 1.46 | 0.144 | 0.004 | 0.18 | 1.51 | 0.131 |
b_non_work_mom_kid_act | asc_kid_act | -0.00437 | -0.144 | 12.5 | 0 | -0.00356 | -0.114 | 12.2 | 0 |
b_non_work_mom_kid_act | asc_par_act | -0.00839 | -0.0871 | 4.42 | 9.97e-06 | -0.00909 | -0.0835 | 3.9 | 9.51e-05 |
b_non_work_mom_kid_act | b_age_kid_act | 5.35e-05 | 0.0391 | -4.64 | 3.52e-06 | 3.27e-05 | 0.0237 | -4.63 | 3.7e-06 |
b_non_work_mom_kid_act | b_age_par_act | -0.000274 | -0.0592 | 1.26 | 0.209 | -0.000335 | -0.065 | 1.2 | 0.231 |
b_non_work_mom_kid_act | b_female_kid_act | -0.000119 | -0.0213 | 1.81 | 0.071 | -0.000336 | -0.0602 | 1.77 | 0.0764 |
b_non_work_mom_kid_act | b_female_par_act | -0.000201 | -0.0192 | 0.0542 | 0.957 | -0.000243 | -0.0232 | 0.054 | 0.957 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -5.29e-05 | -0.00904 | -4.24 | 2.2e-05 | -6.31e-05 | -0.0108 | -4.24 | 2.26e-05 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | -0.000149 | -0.0138 | -1.02 | 0.306 | -1.17e-05 | -0.00109 | -1.03 | 0.303 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -0.000339 | -0.058 | -3.01 | 0.0026 | -0.000331 | -0.0564 | -3.01 | 0.0026 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | 0.000257 | 0.0222 | -2.45 | 0.0145 | 0.000458 | 0.0381 | -2.39 | 0.0169 |
b_non_work_mom_kid_act | b_log_density_kid_act | -9.41e-05 | -0.0428 | -3.53 | 0.000408 | -0.000102 | -0.0444 | -3.52 | 0.000439 |
b_non_work_mom_kid_act | b_log_density_par_act | 0.000461 | 0.0634 | -4.45 | 8.46e-06 | 0.000472 | 0.0562 | -4.05 | 5.22e-05 |
b_non_work_mom_kid_act | b_log_distance_kid_act | -7.1e-05 | -0.0129 | 14.2 | 0 | -1.6e-05 | -0.00282 | 14.1 | 0 |
b_non_work_mom_kid_act | b_log_distance_par_act | -0.00194 | -0.0863 | 5.2 | 2.01e-07 | -0.0022 | -0.0858 | 4.59 | 4.33e-06 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 0.000628 | 0.192 | -0.937 | 0.349 | 0.000505 | 0.154 | -0.921 | 0.357 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 0.000188 | 0.033 | -1.79 | 0.0734 | 0.000118 | 0.0206 | -1.78 | 0.0756 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -0.000283 | -0.0315 | -0.091 | 0.928 | 1.03e-05 | 0.00116 | -0.0929 | 0.926 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -0.000156 | -0.00992 | -1.49 | 0.138 | 2.55e-05 | 0.00171 | -1.56 | 0.119 |
b_non_work_mom_par_act | asc_kid_act | -0.00197 | -0.032 | 13.2 | 0 | -0.00144 | -0.0219 | 12.9 | 0 |
b_non_work_mom_par_act | asc_par_act | -0.0867 | -0.442 | 4.6 | 4.24e-06 | -0.106 | -0.459 | 4.07 | 4.66e-05 |
b_non_work_mom_par_act | b_age_kid_act | -0.000186 | -0.0669 | 1.09 | 0.274 | -0.00029 | -0.0988 | 1.05 | 0.294 |
b_non_work_mom_par_act | b_age_par_act | -0.00331 | -0.351 | 3.56 | 0.000369 | -0.00496 | -0.453 | 3.28 | 0.00103 |
b_non_work_mom_par_act | b_female_kid_act | -0.000197 | -0.0173 | 4.2 | 2.64e-05 | -0.000168 | -0.0142 | 4.07 | 4.67e-05 |
b_non_work_mom_par_act | b_female_par_act | -0.0026 | -0.122 | 2.5 | 0.0124 | -0.00195 | -0.0881 | 2.48 | 0.0131 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | -0.000289 | -0.0243 | 0.451 | 0.652 | -0.000511 | -0.0411 | 0.434 | 0.665 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -0.00102 | -0.0467 | 1.75 | 0.08 | -0.00167 | -0.073 | 1.69 | 0.0909 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | 0.000206 | 0.0172 | 1.18 | 0.237 | 0.000329 | 0.0264 | 1.15 | 0.251 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | 0.00195 | 0.0827 | 0.636 | 0.525 | 0.00456 | 0.179 | 0.647 | 0.518 |
b_non_work_mom_par_act | b_log_density_kid_act | 0.000299 | 0.0669 | 1.55 | 0.122 | 0.000366 | 0.0748 | 1.49 | 0.137 |
b_non_work_mom_par_act | b_log_density_par_act | 0.00461 | 0.312 | 0.104 | 0.917 | 0.00556 | 0.312 | 0.0981 | 0.922 |
b_non_work_mom_par_act | b_log_distance_kid_act | -0.00242 | -0.217 | 11 | 0 | -0.00302 | -0.251 | 10.4 | 0 |
b_non_work_mom_par_act | b_log_distance_par_act | -0.0207 | -0.452 | 5.5 | 3.72e-08 | -0.0283 | -0.519 | 4.85 | 1.21e-06 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 0.000144 | 0.0216 | 2.86 | 0.00421 | 0.000237 | 0.0341 | 2.77 | 0.00567 |
b_non_work_mom_par_act | b_log_income_k_par_act | 0.00236 | 0.203 | 2.21 | 0.0274 | 0.00163 | 0.135 | 2.07 | 0.0387 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -0.000285 | -0.0156 | 2.67 | 0.00748 | -6.3e-05 | -0.00333 | 2.63 | 0.00858 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -0.000472 | -0.0148 | 0.839 | 0.401 | 0.000131 | 0.00414 | 0.86 | 0.39 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 0.00253 | 0.207 | 3.36 | 0.00077 | 0.00265 | 0.209 | 3.25 | 0.00114 |
b_veh_per_driver_kid_act | asc_kid_act | -0.00569 | -0.176 | 12.2 | 0 | -0.00634 | -0.18 | 11.8 | 0 |
b_veh_per_driver_kid_act | asc_par_act | 0.0124 | 0.121 | 4.42 | 9.78e-06 | 0.0189 | 0.153 | 3.91 | 9.29e-05 |
b_veh_per_driver_kid_act | b_age_kid_act | 9.43e-07 | 0.000648 | -5.13 | 2.9e-07 | 4.65e-05 | 0.0296 | -4.86 | 1.15e-06 |
b_veh_per_driver_kid_act | b_age_par_act | 0.000623 | 0.126 | 0.618 | 0.536 | 0.000999 | 0.171 | 0.587 | 0.557 |
b_veh_per_driver_kid_act | b_female_kid_act | 0.000116 | 0.0196 | 1.16 | 0.246 | 5.95e-05 | 0.00939 | 1.11 | 0.266 |
b_veh_per_driver_kid_act | b_female_par_act | 0.000436 | 0.0393 | -0.379 | 0.705 | 0.000505 | 0.0427 | -0.372 | 0.71 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 0.000186 | 0.0299 | -4.8 | 1.61e-06 | 0.000125 | 0.0188 | -4.6 | 4.15e-06 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | 0.000172 | 0.015 | -1.44 | 0.15 | 0.00049 | 0.0401 | -1.43 | 0.152 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | -0.000127 | -0.0203 | -3.56 | 0.000368 | -0.000297 | -0.0447 | -3.4 | 0.000681 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | -0.000858 | -0.0695 | -2.7 | 0.00683 | -0.00133 | -0.098 | -2.56 | 0.0105 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 8.12e-05 | 0.0347 | -4.21 | 2.6e-05 | 2.81e-05 | 0.0108 | -3.93 | 8.43e-05 |
b_veh_per_driver_kid_act | b_log_density_par_act | -0.000993 | -0.128 | -4.46 | 8.09e-06 | -0.00144 | -0.151 | -3.96 | 7.53e-05 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 0.000561 | 0.096 | 13.9 | 0 | 0.000769 | 0.12 | 13.4 | 0 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 0.00429 | 0.179 | 5.32 | 1.04e-07 | 0.00615 | 0.211 | 4.7 | 2.56e-06 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -0.000531 | -0.153 | -1.46 | 0.146 | -0.000577 | -0.155 | -1.39 | 0.166 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -0.00018 | -0.0298 | -2.28 | 0.0228 | -0.000171 | -0.0264 | -2.2 | 0.0279 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 0.000418 | 0.0436 | -0.574 | 0.566 | 0.000354 | 0.0351 | -0.563 | 0.574 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 0.000148 | 0.00886 | -1.79 | 0.0735 | 0.000177 | 0.0105 | -1.85 | 0.0637 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | 3.85e-05 | 0.00602 | -0.595 | 0.552 | 0.00023 | 0.0339 | -0.584 | 0.559 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | -0.00103 | -0.079 | -3.31 | 0.000939 | -0.0015 | -0.104 | -3.13 | 0.00172 |
b_veh_per_driver_par_act | asc_kid_act | -0.00112 | -0.0116 | 8.82 | 0 | -0.00167 | -0.015 | 8.35 | 0 |
b_veh_per_driver_par_act | asc_par_act | 0.118 | 0.385 | 3.87 | 0.000107 | 0.113 | 0.292 | 3.35 | 0.000818 |
b_veh_per_driver_par_act | b_age_kid_act | 0.000454 | 0.104 | -5.53 | 3.13e-08 | 0.000591 | 0.12 | -4.97 | 6.63e-07 |
b_veh_per_driver_par_act | b_age_par_act | 0.00753 | 0.509 | -3.91 | 9.36e-05 | 0.00957 | 0.52 | -3.52 | 0.000433 |
b_veh_per_driver_par_act | b_female_kid_act | 0.000447 | 0.025 | -3.14 | 0.00167 | 0.000112 | 0.00562 | -2.83 | 0.00468 |
b_veh_per_driver_par_act | b_female_par_act | 0.00452 | 0.136 | -3.73 | 0.000191 | 0.00486 | 0.13 | -3.4 | 0.000665 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | 0.000484 | 0.0259 | -5.68 | 1.36e-08 | 0.00148 | 0.0708 | -5.2 | 2.03e-07 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | 0.00146 | 0.0424 | -4.17 | 3.06e-05 | 0.0045 | 0.117 | -3.95 | 7.74e-05 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | -0.000761 | -0.0407 | -5.09 | 3.52e-07 | -0.000615 | -0.0294 | -4.63 | 3.72e-06 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -0.00956 | -0.258 | -4.39 | 1.15e-05 | -0.0106 | -0.247 | -4.04 | 5.41e-05 |
b_veh_per_driver_par_act | b_log_density_kid_act | -0.000703 | -0.1 | -5.13 | 2.84e-07 | -0.000729 | -0.0886 | -4.62 | 3.83e-06 |
b_veh_per_driver_par_act | b_log_density_par_act | -0.00955 | -0.411 | -5.1 | 3.42e-07 | -0.00997 | -0.333 | -4.64 | 3.52e-06 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.00532 | 0.304 | 2.14 | 0.0325 | 0.00531 | 0.262 | 1.9 | 0.058 |
b_veh_per_driver_par_act | b_log_distance_par_act | 0.0427 | 0.593 | 2.43 | 0.0151 | 0.0475 | 0.518 | 1.98 | 0.0482 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -4.58e-05 | -0.00438 | -4.27 | 1.93e-05 | -0.000525 | -0.0449 | -3.82 | 0.000132 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -0.00424 | -0.233 | -4.33 | 1.52e-05 | -0.00473 | -0.232 | -3.93 | 8.4e-05 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 0.000422 | 0.0147 | -3.72 | 0.0002 | 0.000337 | 0.0106 | -3.4 | 0.000685 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 0.00235 | 0.0469 | -4.23 | 2.36e-05 | 0.000458 | 0.00861 | -3.95 | 7.97e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | -0.00106 | -0.0551 | -3.79 | 0.000152 | -0.00089 | -0.0417 | -3.45 | 0.000566 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | -0.0108 | -0.275 | -4.69 | 2.74e-06 | -0.0124 | -0.275 | -4.3 | 1.68e-05 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 0.00488 | 0.239 | -3.85 | 0.000116 | 0.00533 | 0.22 | -3.44 | 0.000576 |
b_y2017_kid_act | asc_kid_act | -0.00316 | -0.0939 | 12.3 | 0 | -0.00451 | -0.128 | 11.9 | 0 |
b_y2017_kid_act | asc_par_act | -0.0433 | -0.405 | 4.26 | 2.06e-05 | -0.0528 | -0.429 | 3.76 | 0.000167 |
b_y2017_kid_act | b_age_kid_act | -0.000106 | -0.0697 | -5 | 5.81e-07 | -1.73e-05 | -0.0111 | -4.98 | 6.28e-07 |
b_y2017_kid_act | b_age_par_act | -0.00181 | -0.351 | 0.382 | 0.702 | -0.00252 | -0.432 | 0.353 | 0.724 |
b_y2017_kid_act | b_female_kid_act | 1.49e-05 | 0.00239 | 1.01 | 0.314 | -9.37e-05 | -0.0148 | 0.99 | 0.322 |
b_y2017_kid_act | b_female_par_act | -0.00108 | -0.0931 | -0.43 | 0.667 | -0.00125 | -0.106 | -0.425 | 0.671 |
b_y2017_kid_act | b_has_big_sib_kid_act | 0.000191 | 0.0294 | -4.8 | 1.62e-06 | 0.000145 | 0.022 | -4.73 | 2.23e-06 |
b_y2017_kid_act | b_has_big_sib_par_act | -0.000244 | -0.0204 | -1.48 | 0.139 | -0.000868 | -0.0713 | -1.44 | 0.15 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 0.000887 | 0.136 | -3.9 | 9.76e-05 | 0.000827 | 0.125 | -3.83 | 0.000127 |
b_y2017_kid_act | b_has_lil_sib_par_act | 0.00266 | 0.206 | -3.12 | 0.00181 | 0.0036 | 0.265 | -3.12 | 0.00184 |
b_y2017_kid_act | b_log_density_kid_act | 0.000147 | 0.06 | -4.22 | 2.46e-05 | 0.000215 | 0.0826 | -4.18 | 2.97e-05 |
b_y2017_kid_act | b_log_density_par_act | 0.0029 | 0.359 | -5.92 | 3.13e-09 | 0.00359 | 0.379 | -5.47 | 4.59e-08 |
b_y2017_kid_act | b_log_distance_kid_act | -0.00188 | -0.308 | 11.2 | 0 | -0.00208 | -0.324 | 10.9 | 0 |
b_y2017_kid_act | b_log_distance_par_act | -0.0124 | -0.494 | 4.44 | 8.94e-06 | -0.0152 | -0.524 | 3.94 | 8.27e-05 |
b_y2017_kid_act | b_log_income_k_kid_act | -1.25e-05 | -0.00342 | -1.62 | 0.105 | 3.82e-05 | 0.0103 | -1.61 | 0.107 |
b_y2017_kid_act | b_log_income_k_par_act | 5.55e-05 | 0.00876 | -2.38 | 0.0174 | -0.000204 | -0.0316 | -2.31 | 0.021 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 9.8e-06 | 0.00098 | -0.643 | 0.52 | 5.27e-06 | 0.000523 | -0.643 | 0.52 |
b_y2017_kid_act | b_non_work_dad_par_act | 0.000161 | 0.00922 | -1.84 | 0.0661 | -0.000978 | -0.0581 | -1.87 | 0.0618 |
b_y2017_kid_act | b_non_work_mom_kid_act | 0.000455 | 0.0681 | -0.715 | 0.474 | 0.000329 | 0.0486 | -0.703 | 0.482 |
b_y2017_kid_act | b_non_work_mom_par_act | 0.00313 | 0.23 | -3.85 | 0.00012 | 0.00419 | 0.292 | -3.83 | 0.000126 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -0.000687 | -0.0965 | -0.103 | 0.918 | -0.000887 | -0.116 | -0.0983 | 0.922 |
b_y2017_kid_act | b_veh_per_driver_par_act | -0.00677 | -0.317 | 3.2 | 0.00137 | -0.00711 | -0.295 | 2.93 | 0.00335 |
b_y2017_par_act | asc_kid_act | -0.00482 | -0.0246 | 12.3 | 0 | -0.00196 | -0.00833 | 11.1 | 0 |
b_y2017_par_act | asc_par_act | -0.475 | -0.763 | 5.03 | 4.88e-07 | -0.647 | -0.787 | 4.38 | 1.18e-05 |
b_y2017_par_act | b_age_kid_act | -0.00132 | -0.149 | 4.84 | 1.29e-06 | -0.002 | -0.192 | 4.15 | 3.31e-05 |
b_y2017_par_act | b_age_par_act | -0.0219 | -0.733 | 5.37 | 8.03e-08 | -0.0313 | -0.804 | 4.59 | 4.46e-06 |
b_y2017_par_act | b_female_kid_act | -0.00108 | -0.0298 | 5.9 | 3.66e-09 | -0.000673 | -0.016 | 5.09 | 3.67e-07 |
b_y2017_par_act | b_female_par_act | -0.0104 | -0.155 | 5.23 | 1.74e-07 | -0.00996 | -0.126 | 4.57 | 4.89e-06 |
b_y2017_par_act | b_has_big_sib_kid_act | -0.00121 | -0.0321 | 4.6 | 4.13e-06 | -0.00389 | -0.0879 | 3.94 | 8.27e-05 |
b_y2017_par_act | b_has_big_sib_par_act | -0.00364 | -0.0523 | 5.01 | 5.36e-07 | -0.0118 | -0.145 | 4.26 | 2.03e-05 |
b_y2017_par_act | b_has_lil_sib_kid_act | 0.00241 | 0.0636 | 4.92 | 8.58e-07 | 0.00245 | 0.0554 | 4.22 | 2.4e-05 |
b_y2017_par_act | b_has_lil_sib_par_act | 0.0286 | 0.382 | 5.16 | 2.52e-07 | 0.0415 | 0.458 | 4.51 | 6.4e-06 |
b_y2017_par_act | b_log_density_kid_act | 0.00205 | 0.144 | 5.04 | 4.61e-07 | 0.0027 | 0.155 | 4.33 | 1.52e-05 |
b_y2017_par_act | b_log_density_par_act | 0.0324 | 0.689 | 5.16 | 2.41e-07 | 0.0423 | 0.668 | 4.4 | 1.06e-05 |
b_y2017_par_act | b_log_distance_kid_act | -0.0155 | -0.437 | 8.04 | 8.88e-16 | -0.0191 | -0.446 | 6.95 | 3.73e-12 |
b_y2017_par_act | b_log_distance_par_act | -0.13 | -0.892 | 5.71 | 1.16e-08 | -0.179 | -0.923 | 4.89 | 9.99e-07 |
b_y2017_par_act | b_log_income_k_kid_act | -0.000201 | -0.00948 | 5.42 | 5.81e-08 | 0.000533 | 0.0215 | 4.67 | 3.03e-06 |
b_y2017_par_act | b_log_income_k_par_act | 0.000561 | 0.0152 | 5.18 | 2.22e-07 | 0.00155 | 0.0361 | 4.47 | 7.96e-06 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.000685 | -0.0118 | 5.42 | 6.1e-08 | -0.00181 | -0.0269 | 4.67 | 3.05e-06 |
b_y2017_par_act | b_non_work_dad_par_act | 0.00361 | 0.0355 | 4.65 | 3.33e-06 | -0.00328 | -0.0292 | 4 | 6.3e-05 |
b_y2017_par_act | b_non_work_mom_kid_act | 0.00323 | 0.0831 | 5.6 | 2.09e-08 | 0.00385 | 0.0851 | 4.82 | 1.47e-06 |
b_y2017_par_act | b_non_work_mom_par_act | 0.0358 | 0.453 | 5.01 | 5.44e-07 | 0.0523 | 0.546 | 4.41 | 1.02e-05 |
b_y2017_par_act | b_veh_per_driver_kid_act | -0.00681 | -0.165 | 5.51 | 3.52e-08 | -0.0102 | -0.198 | 4.73 | 2.27e-06 |
b_y2017_par_act | b_veh_per_driver_par_act | -0.0742 | -0.598 | 5.6 | 2.09e-08 | -0.0848 | -0.526 | 4.97 | 6.84e-07 |
b_y2017_par_act | b_y2017_kid_act | 0.022 | 0.509 | 6.23 | 4.65e-10 | 0.0279 | 0.547 | 5.33 | 9.75e-08 |
mu_parent | asc_kid_act | 0.00157 | 0.0208 | 14.4 | 0 | 0.000746 | 0.00804 | 13.5 | 0 |
mu_parent | asc_par_act | 0.183 | 0.759 | 6.04 | 1.53e-09 | 0.251 | 0.772 | 5.38 | 7.63e-08 |
mu_parent | b_age_kid_act | 0.000572 | 0.167 | 3.98 | 6.88e-05 | 0.00086 | 0.208 | 3.35 | 0.000799 |
mu_parent | b_age_par_act | 0.00895 | 0.773 | 8.23 | 2.22e-16 | 0.013 | 0.846 | 7.05 | 1.73e-12 |
mu_parent | b_female_kid_act | 0.000459 | 0.0328 | 6.46 | 1.05e-10 | 0.0002 | 0.012 | 5.49 | 4.08e-08 |
mu_parent | b_female_par_act | 0.00439 | 0.168 | 5.25 | 1.52e-07 | 0.00522 | 0.168 | 4.61 | 4.1e-06 |
mu_parent | b_has_big_sib_kid_act | 0.000533 | 0.0364 | 3.25 | 0.00116 | 0.00168 | 0.0962 | 2.83 | 0.00462 |
mu_parent | b_has_big_sib_par_act | 0.0022 | 0.0816 | 4.21 | 2.56e-05 | 0.005 | 0.156 | 3.86 | 0.000115 |
mu_parent | b_has_lil_sib_kid_act | -0.000937 | -0.064 | 3.73 | 0.000188 | -0.000991 | -0.0566 | 3.22 | 0.0013 |
mu_parent | b_has_lil_sib_par_act | -0.0108 | -0.372 | 2.52 | 0.0116 | -0.0162 | -0.452 | 2.18 | 0.0296 |
mu_parent | b_log_density_kid_act | -0.000892 | -0.162 | 4.16 | 3.25e-05 | -0.00115 | -0.167 | 3.51 | 0.000452 |
mu_parent | b_log_density_par_act | -0.0132 | -0.725 | 2.24 | 0.025 | -0.0179 | -0.714 | 1.91 | 0.0568 |
mu_parent | b_log_distance_kid_act | 0.00641 | 0.467 | 15.2 | 0 | 0.008 | 0.472 | 12.8 | 0 |
mu_parent | b_log_distance_par_act | 0.0522 | 0.927 | 20.6 | 0 | 0.0721 | 0.941 | 19.6 | 0 |
mu_parent | b_log_income_k_kid_act | 8.42e-05 | 0.0103 | 5.32 | 1.05e-07 | -0.0003 | -0.0306 | 4.47 | 7.99e-06 |
mu_parent | b_log_income_k_par_act | -0.000368 | -0.0258 | 4.5 | 6.81e-06 | 0.00034 | 0.02 | 3.91 | 9.32e-05 |
mu_parent | b_non_work_dad_kid_ace | 0.000244 | 0.0108 | 4.96 | 6.99e-07 | 0.000466 | 0.0175 | 4.36 | 1.31e-05 |
mu_parent | b_non_work_dad_par_act | -0.000988 | -0.0251 | 2.83 | 0.00458 | 0.00197 | 0.0443 | 2.74 | 0.00613 |
mu_parent | b_non_work_mom_kid_act | -0.00136 | -0.0902 | 5.24 | 1.57e-07 | -0.00162 | -0.0905 | 4.52 | 6.25e-06 |
mu_parent | b_non_work_mom_par_act | -0.0145 | -0.473 | 1.95 | 0.0518 | -0.0206 | -0.543 | 1.69 | 0.0912 |
mu_parent | b_veh_per_driver_kid_act | 0.00286 | 0.178 | 6.08 | 1.21e-09 | 0.00425 | 0.21 | 5.22 | 1.75e-07 |
mu_parent | b_veh_per_driver_par_act | 0.0306 | 0.637 | 10.9 | 0 | 0.0366 | 0.574 | 8.97 | 0 |
mu_parent | b_y2017_kid_act | -0.00818 | -0.489 | 4.88 | 1.06e-06 | -0.0107 | -0.53 | 4.22 | 2.5e-05 |
mu_parent | b_y2017_par_act | -0.09 | -0.925 | -2.45 | 0.0143 | -0.128 | -0.947 | -2.08 | 0.0375 |
Smallest eigenvalue: 0.552219
+Largest eigenvalue: 163797
+Condition number: 296616
+ \ No newline at end of file diff --git a/models/IATBR plan/3 alternatives/ind-nest/ind_nests3.pickle b/models/IATBR plan/3 alternatives/ind-nest/ind_nests3.pickle new file mode 100644 index 0000000..c084b6d Binary files /dev/null and b/models/IATBR plan/3 alternatives/ind-nest/ind_nests3.pickle differ diff --git a/models/IATBR plan/3 alternatives/ind-nest/model-mode-nest3.py b/models/IATBR plan/3 alternatives/ind-nest/model-mode-nest3.py new file mode 100644 index 0000000..c94c53f --- /dev/null +++ b/models/IATBR plan/3 alternatives/ind-nest/model-mode-nest3.py @@ -0,0 +1,179 @@ +# Model predicts the choice among four alternatives: +# * Car with a parent +# * Car without a parent (presumably a carpool) +# * Active with a parent +# * Active without a parent + +# In this model, the alternatives are independent + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable +from biogeme.nests import OneNestForNestedLogit, NestsForNestedLogit + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips3.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +y2017 = Variable('y2017') +veh_per_driver = Variable('veh_per_driver') +non_work_mom = Variable('non_work_mom') +non_work_dad = Variable('non_work_dad') +age = Variable('age') +female = Variable('female') +has_lil_sib = Variable('has_lil_sib') +has_big_sib = Variable('has_big_sib') +log_income_k = Variable('log_inc_k') +log_distance = Variable('log_distance') +log_density = Variable('log_density') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car is reference case) +asc_car = Beta('asc_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_car = Beta('b_log_income_k_car', 0, None, None, 1) +b_veh_per_driver_car = Beta('b_veh_per_driver_car', 0, None, None, 1) +b_non_work_mom_car = Beta('b_non_work_mom_car', 0, None, None, 1) +b_non_work_dad_car = Beta('b_non_work_dad_car', 0, None, None, 1) + +b_age_car = Beta('b_age_car', 0, None, None, 1) +b_female_car = Beta('b_female_car', 0, None, None, 1) +b_has_lil_sib_car = Beta('b_has_lil_sib_car', 0, None, None, 1) +b_has_big_sib_car = Beta('b_has_big_sib_car', 0, None, None, 1) + +b_log_distance_car = Beta('b_log_distance_car', 0, None, None, 1) +b_log_density_car = Beta('b_log_density_car', 0, None, None, 1) + +b_y2017_car = Beta('b_y2017_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) + +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) + +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# Definition of utility functions +V_car = ( + asc_car + + b_log_income_k_car * log_income_k + + b_veh_per_driver_car * veh_per_driver + + b_non_work_mom_car * non_work_mom + + b_non_work_dad_car * non_work_dad + + b_age_car * age + + b_female_car * female + + b_has_lil_sib_car * has_lil_sib + + b_has_big_sib_car * has_big_sib + + b_log_distance_car * log_distance + + b_log_density_car * log_density + + b_y2017_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_income_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_income_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {7: V_car, + 18: V_par_act, + 28: V_kid_act} + +# associate availability conditions with alternatives: +# Note: the names don't really make sense with what we're doing, +# but they're all 1s - all alternatives are available to everyone + +av = {7: av_par_car, + 18: av_par_act, + 28: av_kid_act} + +# Define nests based on mode +mu_parent = Beta('mu_parent', 1, 1.0, None, 0) + +parent_nest = OneNestForNestedLogit( + nest_param=mu_parent, + list_of_alternatives=[7,18], + name='parent_nest' +) + +ind_nests = NestsForNestedLogit( + choice_set=list(V), + tuple_of_nests=(parent_nest,) +) + +# Define model +my_model = models.lognested(V, av, ind_nests, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, my_model) +the_biogeme.modelName = 'ind_nests3' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/3 alternatives/mode-nest/__mode_nests3.iter b/models/IATBR plan/3 alternatives/mode-nest/__mode_nests3.iter new file mode 100644 index 0000000..6bc7248 --- /dev/null +++ b/models/IATBR plan/3 alternatives/mode-nest/__mode_nests3.iter @@ -0,0 +1,25 @@ +asc_kid_act = -4.831679247713486 +asc_par_act = -4.689622386757982 +b_age_kid_act = 0.19046234631983613 +b_age_par_act = 0.056912561206050455 +b_female_kid_act = -0.2888775704175782 +b_female_par_act = -0.2348195778292662 +b_has_big_sib_kid_act = 0.2932372472209577 +b_has_big_sib_par_act = 0.18954114412415152 +b_has_lil_sib_kid_act = 0.22069286021660456 +b_has_lil_sib_par_act = 0.2563146862120498 +b_log_density_kid_act = 0.19470610827912127 +b_log_density_par_act = 0.24787656049879173 +b_log_distance_kid_act = -1.628314114916669 +b_log_distance_par_act = -1.6201296134695613 +b_log_income_k_kid_act = -0.027026255573797592 +b_log_income_k_par_act = -0.024016529514573805 +b_non_work_dad_kid_ace = -0.048355735746346086 +b_non_work_dad_par_act = -0.026217314233073483 +b_non_work_mom_kid_act = -0.046544316906533455 +b_non_work_mom_par_act = 0.08532439852748361 +b_veh_per_driver_kid_act = -0.29580392999673044 +b_veh_per_driver_par_act = -0.4600361400657044 +b_y2017_kid_act = 0.11382622084206152 +b_y2017_par_act = 0.8319810295374044 +mu_active = 4.454673409219249 diff --git a/models/IATBR plan/3 alternatives/mode-nest/biogeme.toml b/models/IATBR plan/3 alternatives/mode-nest/biogeme.toml new file mode 100644 index 0000000..0f35af2 --- /dev/null +++ b/models/IATBR plan/3 alternatives/mode-nest/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on March 28, 2024. 12:31:43 + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 1000 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + diff --git a/models/IATBR plan/3 alternatives/mode-nest/mode_nests3.html b/models/IATBR plan/3 alternatives/mode-nest/mode_nests3.html new file mode 100644 index 0000000..8519c2f --- /dev/null +++ b/models/IATBR plan/3 alternatives/mode-nest/mode_nests3.html @@ -0,0 +1,394 @@ + + + + +biogeme 3.2.13 [2024-04-04]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-04 17:03:26.638006
+Report file: | mode_nests3.html |
Database name: | est |
Number of estimated parameters: | 25 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -5394.186 |
Final log likelihood: | -3167.405 |
Likelihood ratio test for the init. model: | 4453.564 |
Rho-square for the init. model: | 0.413 |
Rho-square-bar for the init. model: | 0.408 |
Akaike Information Criterion: | 6384.809 |
Bayesian Information Criterion: | 6547.285 |
Final gradient norm: | 5.2434E-02 |
Nbr of threads: | 12 |
Relative gradient: | 5.54409621354043e-06 |
Cause of termination: | Relative gradient = 5.5e-06 <= 6.1e-06 |
Number of function evaluations: | 32 |
Number of gradient evaluations: | 31 |
Number of hessian evaluations: | 30 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 31 |
Proportion of Hessian calculation: | 30/30 = 100.0% |
Optimization time: | 0:00:25.026812 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
asc_kid_act | -4.83 | 0.403 | -12 | 0 |
asc_par_act | -4.69 | 0.433 | -10.8 | 0 |
b_age_kid_act | 0.19 | 0.0236 | 8.06 | 8.88e-16 |
b_age_par_act | 0.0569 | 0.0924 | 0.616 | 0.538 |
b_female_kid_act | -0.289 | 0.0685 | -4.22 | 2.47e-05 |
b_female_par_act | -0.235 | 0.0813 | -2.89 | 0.00388 |
b_has_big_sib_kid_act | 0.293 | 0.0729 | 4.02 | 5.8e-05 |
b_has_big_sib_par_act | 0.19 | 0.0968 | 1.96 | 0.0503 |
b_has_lil_sib_kid_act | 0.221 | 0.0716 | 3.08 | 0.00204 |
b_has_lil_sib_par_act | 0.256 | 0.0784 | 3.27 | 0.00108 |
b_log_density_kid_act | 0.195 | 0.0291 | 6.68 | 2.4e-11 |
b_log_density_par_act | 0.248 | 0.052 | 4.77 | 1.85e-06 |
b_log_distance_kid_act | -1.63 | 0.0623 | -26.1 | 0 |
b_log_distance_par_act | -1.62 | 0.0674 | -24.1 | 0 |
b_log_income_k_kid_act | -0.027 | 0.0395 | -0.684 | 0.494 |
b_log_income_k_par_act | -0.024 | 0.0423 | -0.568 | 0.57 |
b_non_work_dad_kid_ace | -0.0484 | 0.107 | -0.453 | 0.65 |
b_non_work_dad_par_act | -0.0262 | 0.119 | -0.22 | 0.826 |
b_non_work_mom_kid_act | -0.0465 | 0.0755 | -0.617 | 0.538 |
b_non_work_mom_par_act | 0.0853 | 0.121 | 0.704 | 0.482 |
b_veh_per_driver_kid_act | -0.296 | 0.0883 | -3.35 | 0.000813 |
b_veh_per_driver_par_act | -0.46 | 0.17 | -2.71 | 0.00669 |
b_y2017_kid_act | 0.114 | 0.117 | 0.973 | 0.331 |
b_y2017_par_act | 0.832 | 0.502 | 1.66 | 0.0972 |
mu_active | 4.45 | 3.72 | 1.2 | 0.232 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_par_act | asc_kid_act | 0.138 | 0.865 | 0.68 | 0.497 | 0.153 | 0.879 | 0.683 | 0.495 |
b_age_kid_act | asc_kid_act | -0.00476 | -0.583 | 12.6 | 0 | -0.00557 | -0.585 | 12 | 0 |
b_age_kid_act | asc_par_act | -0.0039 | -0.449 | 11.6 | 0 | -0.0048 | -0.469 | 11 | 0 |
b_age_par_act | asc_kid_act | 0.0053 | 0.181 | 12.8 | 0 | 0.00909 | 0.244 | 12.5 | 0 |
b_age_par_act | asc_par_act | 0.000822 | 0.0264 | 11.4 | 0 | 0.00497 | 0.124 | 11 | 0 |
b_age_par_act | b_age_kid_act | -0.000743 | -0.465 | -1.52 | 0.128 | -0.0013 | -0.596 | -1.23 | 0.217 |
b_female_kid_act | asc_kid_act | -0.000684 | -0.0259 | 11.5 | 0 | 5.17e-06 | 0.000187 | 11.1 | 0 |
b_female_kid_act | asc_par_act | -0.00103 | -0.0367 | 10.5 | 0 | -0.000124 | -0.00418 | 10 | 0 |
b_female_kid_act | b_age_kid_act | -9.21e-05 | -0.064 | -6.59 | 4.36e-11 | -0.000187 | -0.115 | -6.39 | 1.63e-10 |
b_female_kid_act | b_age_par_act | 0.000562 | 0.108 | -3.59 | 0.000333 | 0.00088 | 0.139 | -3.23 | 0.00124 |
b_female_par_act | asc_kid_act | -0.00463 | -0.152 | 11.3 | 0 | -0.00569 | -0.174 | 10.8 | 0 |
b_female_par_act | asc_par_act | -0.00348 | -0.108 | 10.4 | 0 | -0.00464 | -0.132 | 9.88 | 0 |
b_female_par_act | b_age_kid_act | 0.000382 | 0.231 | -5.57 | 2.58e-08 | 0.000579 | 0.301 | -5.48 | 4.15e-08 |
b_female_par_act | b_age_par_act | -0.00202 | -0.339 | -2.31 | 0.0208 | -0.00313 | -0.416 | -1.99 | 0.0462 |
b_female_par_act | b_female_kid_act | 0.00416 | 0.777 | 1.08 | 0.279 | 0.00402 | 0.721 | 0.946 | 0.344 |
b_has_big_sib_kid_act | asc_kid_act | -0.00717 | -0.256 | 12.5 | 0 | -0.00754 | -0.257 | 12 | 0 |
b_has_big_sib_kid_act | asc_par_act | -0.00611 | -0.205 | 11.5 | 0 | -0.00651 | -0.206 | 11 | 0 |
b_has_big_sib_kid_act | b_age_kid_act | 0.000369 | 0.242 | 1.46 | 0.144 | 0.00044 | 0.255 | 1.45 | 0.146 |
b_has_big_sib_kid_act | b_age_par_act | -0.00086 | -0.157 | 2.1 | 0.0361 | -0.00135 | -0.2 | 1.84 | 0.0663 |
b_has_big_sib_kid_act | b_female_kid_act | -0.000237 | -0.048 | 5.71 | 1.1e-08 | -0.000271 | -0.0542 | 5.67 | 1.45e-08 |
b_has_big_sib_kid_act | b_female_par_act | 0.000257 | 0.0452 | 5.06 | 4.16e-07 | 0.000429 | 0.0724 | 5.02 | 5.21e-07 |
b_has_big_sib_par_act | asc_kid_act | 0.000285 | 0.00808 | 12.7 | 0 | 0.00302 | 0.0775 | 12.3 | 0 |
b_has_big_sib_par_act | asc_par_act | -0.00361 | -0.0963 | 11.4 | 0 | -0.000377 | -0.00899 | 11 | 0 |
b_has_big_sib_par_act | b_age_kid_act | -0.000492 | -0.256 | -0.00934 | 0.993 | -0.000867 | -0.379 | -0.00853 | 0.993 |
b_has_big_sib_par_act | b_age_par_act | 0.0038 | 0.551 | 1.65 | 0.0984 | 0.00555 | 0.62 | 1.61 | 0.108 |
b_has_big_sib_par_act | b_female_kid_act | 0.000237 | 0.0381 | 4.28 | 1.85e-05 | 0.000442 | 0.0667 | 4.17 | 3.08e-05 |
b_has_big_sib_par_act | b_female_par_act | -0.00148 | -0.207 | 3.22 | 0.0013 | -0.00224 | -0.285 | 2.97 | 0.00302 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 0.00411 | 0.623 | -1.42 | 0.155 | 0.00381 | 0.54 | -1.23 | 0.217 |
b_has_lil_sib_kid_act | asc_kid_act | -0.00408 | -0.148 | 12.5 | 0 | -0.00338 | -0.117 | 12.1 | 0 |
b_has_lil_sib_kid_act | asc_par_act | -0.00411 | -0.14 | 11.5 | 0 | -0.00354 | -0.114 | 11 | 0 |
b_has_lil_sib_kid_act | b_age_kid_act | -3.99e-05 | -0.0265 | 0.404 | 0.686 | -0.000132 | -0.0781 | 0.392 | 0.695 |
b_has_lil_sib_kid_act | b_age_par_act | 0.00036 | 0.0667 | 1.63 | 0.103 | 0.000743 | 0.112 | 1.48 | 0.138 |
b_has_lil_sib_kid_act | b_female_kid_act | -5.68e-06 | -0.00117 | 5.16 | 2.46e-07 | -2.7e-05 | -0.0055 | 5.13 | 2.89e-07 |
b_has_lil_sib_kid_act | b_female_par_act | -0.000173 | -0.0309 | 4.23 | 2.3e-05 | -0.0004 | -0.0687 | 4.07 | 4.72e-05 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 0.00127 | 0.245 | -0.822 | 0.411 | 0.00123 | 0.235 | -0.812 | 0.417 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 0.00149 | 0.23 | 0.306 | 0.76 | 0.00178 | 0.256 | 0.298 | 0.766 |
b_has_lil_sib_par_act | asc_kid_act | -0.0062 | -0.204 | 12.4 | 0 | -0.00655 | -0.207 | 11.9 | 0 |
b_has_lil_sib_par_act | asc_par_act | -0.00636 | -0.197 | 11.4 | 0 | -0.00727 | -0.214 | 10.8 | 0 |
b_has_lil_sib_par_act | b_age_kid_act | 0.000236 | 0.142 | 0.839 | 0.401 | 0.000284 | 0.153 | 0.84 | 0.401 |
b_has_lil_sib_par_act | b_age_par_act | -0.00115 | -0.193 | 1.67 | 0.0947 | -0.00141 | -0.195 | 1.51 | 0.132 |
b_has_lil_sib_par_act | b_female_kid_act | -0.000165 | -0.0308 | 5.16 | 2.51e-07 | -0.000279 | -0.052 | 5.11 | 3.29e-07 |
b_has_lil_sib_par_act | b_female_par_act | 0.000411 | 0.0666 | 4.58 | 4.73e-06 | 0.000516 | 0.081 | 4.53 | 5.77e-06 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 0.00149 | 0.261 | -0.402 | 0.688 | 0.00155 | 0.271 | -0.404 | 0.687 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 0.000775 | 0.108 | 0.587 | 0.557 | 0.000572 | 0.0754 | 0.557 | 0.578 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 0.00473 | 0.843 | 0.837 | 0.403 | 0.00466 | 0.83 | 0.805 | 0.421 |
b_log_density_kid_act | asc_kid_act | -0.00594 | -0.56 | 12.5 | 0 | -0.00645 | -0.549 | 12 | 0 |
b_log_density_kid_act | asc_par_act | -0.00591 | -0.524 | 11.5 | 0 | -0.00671 | -0.532 | 10.9 | 0 |
b_log_density_kid_act | b_age_kid_act | -4.81e-05 | -0.0832 | 0.118 | 0.906 | -9.25e-05 | -0.134 | 0.106 | 0.915 |
b_log_density_kid_act | b_age_par_act | 0.000371 | 0.178 | 1.82 | 0.0694 | 0.000591 | 0.219 | 1.52 | 0.128 |
b_log_density_kid_act | b_female_kid_act | -2.19e-05 | -0.0117 | 6.55 | 5.84e-11 | 1.52e-05 | 0.00763 | 6.51 | 7.28e-11 |
b_log_density_kid_act | b_female_par_act | -0.000186 | -0.0867 | 5.03 | 4.78e-07 | -0.000274 | -0.116 | 4.8 | 1.59e-06 |
b_log_density_kid_act | b_has_big_sib_kid_act | -4.34e-05 | -0.0219 | -1.26 | 0.206 | -8.78e-05 | -0.0413 | -1.24 | 0.216 |
b_log_density_kid_act | b_has_big_sib_par_act | 0.000258 | 0.103 | 0.0559 | 0.955 | 0.000383 | 0.136 | 0.0531 | 0.958 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 5.06e-05 | 0.0259 | -0.343 | 0.731 | 0.000105 | 0.0502 | -0.342 | 0.732 |
b_log_density_kid_act | b_has_lil_sib_par_act | -4.95e-05 | -0.023 | -0.735 | 0.463 | -5.57e-05 | -0.0243 | -0.73 | 0.465 |
b_log_density_par_act | asc_kid_act | -0.00979 | -0.577 | 12.3 | 0 | -0.0127 | -0.606 | 11.6 | 0 |
b_log_density_par_act | asc_par_act | -0.0102 | -0.565 | 11.3 | 0 | -0.0136 | -0.606 | 10.6 | 0 |
b_log_density_par_act | b_age_kid_act | 0.000442 | 0.478 | 1.49 | 0.136 | 0.000706 | 0.575 | 1.34 | 0.182 |
b_log_density_par_act | b_age_par_act | -0.00232 | -0.697 | 1.72 | 0.0851 | -0.00359 | -0.747 | 1.41 | 0.159 |
b_log_density_par_act | b_female_kid_act | -0.000289 | -0.0966 | 6.34 | 2.25e-10 | -0.000447 | -0.125 | 5.9 | 3.7e-09 |
b_log_density_par_act | b_female_par_act | 0.000796 | 0.232 | 5.99 | 2.04e-09 | 0.00124 | 0.293 | 5.84 | 5.26e-09 |
b_log_density_par_act | b_has_big_sib_kid_act | 0.000462 | 0.145 | -0.574 | 0.566 | 0.000661 | 0.174 | -0.554 | 0.579 |
b_log_density_par_act | b_has_big_sib_par_act | -0.0015 | -0.376 | 0.507 | 0.612 | -0.0023 | -0.457 | 0.452 | 0.651 |
b_log_density_par_act | b_has_lil_sib_kid_act | -0.000118 | -0.0378 | 0.32 | 0.749 | -0.00028 | -0.0752 | 0.297 | 0.767 |
b_log_density_par_act | b_has_lil_sib_par_act | 0.000549 | 0.159 | -0.101 | 0.92 | 0.000665 | 0.163 | -0.0973 | 0.923 |
b_log_density_par_act | b_log_density_kid_act | 0.000544 | 0.453 | 1.34 | 0.182 | 0.00056 | 0.37 | 1.08 | 0.281 |
b_log_distance_kid_act | asc_kid_act | 0.00606 | 0.259 | 8.52 | 0 | 0.00531 | 0.212 | 8.12 | 4.44e-16 |
b_log_distance_kid_act | asc_par_act | 0.00567 | 0.228 | 7.62 | 2.51e-14 | 0.00553 | 0.205 | 7.21 | 5.45e-13 |
b_log_distance_kid_act | b_age_kid_act | -0.00024 | -0.189 | -26.9 | 0 | -0.000231 | -0.157 | -26 | 0 |
b_log_distance_kid_act | b_age_par_act | -3.11e-05 | -0.00679 | -17.3 | 0 | -6.95e-05 | -0.0121 | -15 | 0 |
b_log_distance_kid_act | b_female_kid_act | 0.000256 | 0.0622 | -15.2 | 0 | 0.000329 | 0.077 | -15.1 | 0 |
b_log_distance_kid_act | b_female_par_act | 0.000161 | 0.0339 | -14.3 | 0 | 0.000309 | 0.061 | -14 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -0.000121 | -0.0276 | -20.1 | 0 | -0.00012 | -0.0263 | -19.8 | 0 |
b_log_distance_kid_act | b_has_big_sib_par_act | 2.78e-05 | 0.00506 | -16.7 | 0 | 3.45e-05 | 0.00572 | -15.8 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -0.000155 | -0.0361 | -19.4 | 0 | -0.00033 | -0.074 | -18.8 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -0.000196 | -0.0413 | -18.6 | 0 | -0.000342 | -0.07 | -18.2 | 0 |
b_log_distance_kid_act | b_log_density_kid_act | -5.75e-05 | -0.0347 | -27.1 | 0 | -2.44e-05 | -0.0134 | -26.4 | 0 |
b_log_distance_kid_act | b_log_density_par_act | -0.000138 | -0.052 | -24.5 | 0 | -0.00015 | -0.0464 | -22.6 | 0 |
b_log_distance_par_act | asc_kid_act | 0.00587 | 0.235 | 8.52 | 0 | 0.0061 | 0.225 | 8.16 | 2.22e-16 |
b_log_distance_par_act | asc_par_act | 0.00674 | 0.254 | 7.68 | 1.58e-14 | 0.00768 | 0.263 | 7.31 | 2.73e-13 |
b_log_distance_par_act | b_age_kid_act | -0.000237 | -0.174 | -25.4 | 0 | -0.000324 | -0.204 | -23.9 | 0 |
b_log_distance_par_act | b_age_par_act | 3.29e-05 | 0.00672 | -16.9 | 0 | 0.000401 | 0.0645 | -15.1 | 0 |
b_log_distance_par_act | b_female_kid_act | 0.000246 | 0.0559 | -14.6 | 0 | 0.00041 | 0.0889 | -14.5 | 0 |
b_log_distance_par_act | b_female_par_act | 0.000177 | 0.035 | -13.9 | 0 | 0.000125 | 0.0228 | -13.3 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_act | -0.00012 | -0.0257 | -19.5 | 0 | -0.000173 | -0.0352 | -18.9 | 0 |
b_log_distance_par_act | b_has_big_sib_par_act | 4.57e-05 | 0.00779 | -16.3 | 0 | 0.000364 | 0.0558 | -15.8 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -0.000146 | -0.0317 | -18.9 | 0 | -0.000265 | -0.055 | -18.2 | 0 |
b_log_distance_par_act | b_has_lil_sib_par_act | -0.000262 | -0.0516 | -18 | 0 | -0.000559 | -0.106 | -17.3 | 0 |
b_log_distance_par_act | b_log_density_kid_act | -5.34e-05 | -0.0302 | -25.6 | 0 | -2.23e-05 | -0.0113 | -24.6 | 0 |
b_log_distance_par_act | b_log_density_par_act | -0.000172 | -0.0609 | -23.3 | 0 | -0.000359 | -0.103 | -20.9 | 0 |
b_log_distance_par_act | b_log_distance_kid_act | 0.00354 | 0.908 | 0.303 | 0.762 | 0.00377 | 0.898 | 0.276 | 0.782 |
b_log_income_k_kid_act | asc_kid_act | -0.00714 | -0.466 | 11.8 | 0 | -0.00692 | -0.435 | 11.4 | 0 |
b_log_income_k_kid_act | asc_par_act | -0.0069 | -0.424 | 10.9 | 0 | -0.00648 | -0.379 | 10.4 | 0 |
b_log_income_k_kid_act | b_age_kid_act | 1.46e-05 | 0.0175 | -4.88 | 1.05e-06 | -1.91e-05 | -0.0204 | -4.68 | 2.82e-06 |
b_log_income_k_kid_act | b_age_par_act | 0.000181 | 0.0603 | -1.01 | 0.314 | 0.000381 | 0.105 | -0.869 | 0.385 |
b_log_income_k_kid_act | b_female_kid_act | -7.05e-06 | -0.00261 | 3.31 | 0.000919 | 4.89e-05 | 0.0181 | 3.34 | 0.000842 |
b_log_income_k_kid_act | b_female_par_act | -7.3e-05 | -0.0235 | 2.34 | 0.0192 | -0.000151 | -0.0471 | 2.26 | 0.024 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 2.72e-05 | 0.00948 | -3.9 | 9.79e-05 | 1.1e-05 | 0.00381 | -3.87 | 0.00011 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 0.000152 | 0.0422 | -2.21 | 0.0268 | 0.000276 | 0.0721 | -2.13 | 0.0335 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 0.000138 | 0.049 | -3.1 | 0.00191 | 0.00013 | 0.0461 | -3.09 | 0.00199 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 9.43e-05 | 0.0303 | -3.26 | 0.00112 | 5.86e-05 | 0.0189 | -3.25 | 0.00115 |
b_log_income_k_kid_act | b_log_density_kid_act | 6.35e-05 | 0.0585 | -4.74 | 2.18e-06 | 0.000109 | 0.0944 | -4.74 | 2.17e-06 |
b_log_income_k_kid_act | b_log_density_par_act | -9.13e-06 | -0.00526 | -4.64 | 3.47e-06 | -8.01e-05 | -0.039 | -4.13 | 3.55e-05 |
b_log_income_k_kid_act | b_log_distance_kid_act | -0.000164 | -0.0684 | 21.5 | 0 | -8.52e-05 | -0.0346 | 21.4 | 0 |
b_log_income_k_kid_act | b_log_distance_par_act | -0.000152 | -0.0594 | 20.5 | 0 | -4.43e-05 | -0.0166 | 20.3 | 0 |
b_log_income_k_par_act | asc_kid_act | -0.00763 | -0.464 | 11.8 | 0 | -0.00828 | -0.486 | 11.3 | 0 |
b_log_income_k_par_act | asc_par_act | -0.00864 | -0.495 | 10.8 | 0 | -0.00867 | -0.474 | 10.3 | 0 |
b_log_income_k_par_act | b_age_kid_act | 0.000111 | 0.124 | -4.77 | 1.88e-06 | 0.000213 | 0.213 | -4.89 | 1.01e-06 |
b_log_income_k_par_act | b_age_par_act | -0.000349 | -0.108 | -0.891 | 0.373 | -0.000909 | -0.233 | -0.734 | 0.463 |
b_log_income_k_par_act | b_female_kid_act | -6.08e-05 | -0.021 | 3.26 | 0.0011 | -0.000115 | -0.0396 | 3.23 | 0.00122 |
b_log_income_k_par_act | b_female_par_act | 0.000113 | 0.0339 | 2.4 | 0.0165 | 0.000302 | 0.0877 | 2.39 | 0.017 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 0.000131 | 0.0425 | -3.85 | 0.000117 | 0.000231 | 0.0749 | -3.89 | 9.97e-05 |
b_log_income_k_par_act | b_has_big_sib_par_act | -0.000172 | -0.0446 | -2.09 | 0.0367 | -0.000594 | -0.145 | -1.92 | 0.0547 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 0.0001 | 0.0331 | -2.99 | 0.00275 | 3.88e-05 | 0.0128 | -2.96 | 0.00308 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 0.000212 | 0.0636 | -3.22 | 0.00127 | 0.000333 | 0.1 | -3.29 | 0.00102 |
b_log_income_k_par_act | b_log_density_kid_act | 2.58e-05 | 0.0221 | -4.37 | 1.23e-05 | 1.02e-05 | 0.00825 | -4.27 | 1.93e-05 |
b_log_income_k_par_act | b_log_density_par_act | 0.000233 | 0.125 | -4.76 | 1.9e-06 | 0.000462 | 0.21 | -4.55 | 5.3e-06 |
b_log_income_k_par_act | b_log_distance_kid_act | -0.000169 | -0.0659 | 21.1 | 0 | -9.23e-05 | -0.035 | 21 | 0 |
b_log_income_k_par_act | b_log_distance_par_act | -0.000203 | -0.074 | 20 | 0 | -0.000202 | -0.0708 | 19.5 | 0 |
b_log_income_k_par_act | b_log_income_k_kid_act | 0.00148 | 0.88 | 0.148 | 0.882 | 0.00141 | 0.846 | 0.132 | 0.895 |
b_non_work_dad_kid_ace | asc_kid_act | -0.00307 | -0.073 | 11.7 | 0 | -0.00374 | -0.0869 | 11.2 | 0 |
b_non_work_dad_kid_ace | asc_par_act | -0.00332 | -0.0744 | 10.7 | 0 | -0.00374 | -0.0809 | 10.2 | 0 |
b_non_work_dad_kid_ace | b_age_kid_act | -0.000194 | -0.0849 | -2.13 | 0.0336 | -0.000246 | -0.0977 | -2.14 | 0.0322 |
b_non_work_dad_kid_ace | b_age_par_act | 0.000437 | 0.0531 | -0.815 | 0.415 | 0.000845 | 0.0857 | -0.779 | 0.436 |
b_non_work_dad_kid_ace | b_female_kid_act | 0.000178 | 0.024 | 1.9 | 0.058 | 0.00016 | 0.0219 | 1.92 | 0.0554 |
b_non_work_dad_kid_ace | b_female_par_act | -7.9e-05 | -0.00927 | 1.39 | 0.166 | -0.000277 | -0.0319 | 1.37 | 0.171 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | -4.37e-05 | -0.00556 | -2.61 | 0.00905 | 9.05e-06 | 0.00116 | -2.64 | 0.00819 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 0.000418 | 0.0423 | -1.71 | 0.0865 | 0.000828 | 0.0801 | -1.72 | 0.0852 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 0.000511 | 0.0661 | -2.14 | 0.0326 | 0.000597 | 0.0782 | -2.17 | 0.0297 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 0.000347 | 0.0406 | -2.32 | 0.0205 | 0.000333 | 0.0398 | -2.35 | 0.019 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 4.32e-05 | 0.0145 | -2.18 | 0.0294 | 0.000188 | 0.0604 | -2.23 | 0.0256 |
b_non_work_dad_kid_ace | b_log_density_par_act | -0.000213 | -0.0448 | -2.49 | 0.0127 | -0.000278 | -0.0502 | -2.45 | 0.0144 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | -1.37e-05 | -0.00208 | 12.7 | 0 | -6.77e-06 | -0.00102 | 12.8 | 0 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -5.79e-06 | -0.000827 | 12.4 | 0 | 0.000119 | 0.0165 | 12.5 | 0 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 0.000668 | 0.155 | -0.194 | 0.846 | 0.000696 | 0.165 | -0.198 | 0.843 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 0.000592 | 0.128 | -0.218 | 0.827 | 0.000549 | 0.122 | -0.221 | 0.825 |
b_non_work_dad_par_act | asc_kid_act | -0.00601 | -0.131 | 11.5 | 0 | -0.00891 | -0.186 | 10.9 | 0 |
b_non_work_dad_par_act | asc_par_act | -0.00536 | -0.11 | 10.6 | 0 | -0.00701 | -0.136 | 10 | 0 |
b_non_work_dad_par_act | b_age_kid_act | 0.000173 | 0.069 | -1.82 | 0.0686 | 0.000466 | 0.166 | -1.84 | 0.0651 |
b_non_work_dad_par_act | b_age_par_act | -0.00155 | -0.173 | -0.549 | 0.583 | -0.00297 | -0.27 | -0.491 | 0.623 |
b_non_work_dad_par_act | b_female_kid_act | -2.74e-05 | -0.00338 | 1.92 | 0.0552 | -0.000231 | -0.0284 | 1.89 | 0.0588 |
b_non_work_dad_par_act | b_female_par_act | 0.000732 | 0.0787 | 1.52 | 0.128 | 0.0013 | 0.134 | 1.55 | 0.122 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 0.000338 | 0.0394 | -2.34 | 0.0192 | 0.000759 | 0.0874 | -2.38 | 0.0172 |
b_non_work_dad_par_act | b_has_big_sib_par_act | -0.000951 | -0.088 | -1.39 | 0.166 | -0.00175 | -0.152 | -1.31 | 0.189 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 0.000372 | 0.044 | -1.82 | 0.0686 | 0.000264 | 0.031 | -1.8 | 0.0715 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 0.000786 | 0.0843 | -2.07 | 0.0387 | 0.00117 | 0.126 | -2.11 | 0.0351 |
b_non_work_dad_par_act | b_log_density_kid_act | -8.28e-05 | -0.0255 | -1.81 | 0.071 | -7.22e-05 | -0.0208 | -1.79 | 0.0728 |
b_non_work_dad_par_act | b_log_density_par_act | 0.000586 | 0.113 | -2.25 | 0.0243 | 0.00126 | 0.204 | -2.29 | 0.0221 |
b_non_work_dad_par_act | b_log_distance_kid_act | -7.88e-05 | -0.011 | 12 | 0 | 2.15e-06 | 0.00029 | 11.9 | 0 |
b_non_work_dad_par_act | b_log_distance_par_act | -0.000156 | -0.0204 | 11.7 | 0 | -8.42e-05 | -0.0105 | 11.6 | 0 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 0.000594 | 0.127 | 0.00673 | 0.995 | 0.000512 | 0.109 | 0.00667 | 0.995 |
b_non_work_dad_par_act | b_log_income_k_par_act | 0.000798 | 0.159 | -0.0184 | 0.985 | 0.00104 | 0.207 | -0.0187 | 0.985 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 0.011 | 0.856 | 0.359 | 0.719 | 0.0104 | 0.819 | 0.321 | 0.748 |
b_non_work_mom_kid_act | asc_kid_act | -0.00193 | -0.0668 | 12 | 0 | -0.000161 | -0.00531 | 11.7 | 0 |
b_non_work_mom_kid_act | asc_par_act | -0.00263 | -0.0858 | 10.9 | 0 | -0.000622 | -0.019 | 10.5 | 0 |
b_non_work_mom_kid_act | b_age_kid_act | -0.000162 | -0.103 | -2.98 | 0.00289 | -0.000329 | -0.185 | -2.85 | 0.00438 |
b_non_work_mom_kid_act | b_age_par_act | 0.00142 | 0.252 | -1.12 | 0.261 | 0.00217 | 0.31 | -1.04 | 0.299 |
b_non_work_mom_kid_act | b_female_kid_act | 2.94e-05 | 0.00577 | 2.4 | 0.0162 | -4.2e-05 | -0.00813 | 2.37 | 0.0179 |
b_non_work_mom_kid_act | b_female_par_act | -0.000608 | -0.104 | 1.66 | 0.0978 | -0.000996 | -0.162 | 1.57 | 0.115 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -0.000286 | -0.053 | -3.19 | 0.00144 | -0.000331 | -0.0602 | -3.14 | 0.00167 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | 0.00085 | 0.125 | -2.14 | 0.0323 | 0.00147 | 0.202 | -2.14 | 0.032 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -0.00028 | -0.0527 | -2.53 | 0.0116 | -0.00011 | -0.0204 | -2.54 | 0.011 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | -0.000637 | -0.109 | -2.65 | 0.00795 | -0.000635 | -0.107 | -2.64 | 0.0082 |
b_non_work_mom_kid_act | b_log_density_kid_act | -2.62e-05 | -0.0128 | -3.02 | 0.00249 | 9.09e-06 | 0.00413 | -2.99 | 0.00283 |
b_non_work_mom_kid_act | b_log_density_par_act | -0.000681 | -0.208 | -3.13 | 0.00174 | -0.00109 | -0.277 | -2.86 | 0.0042 |
b_non_work_mom_kid_act | b_log_distance_kid_act | 0.000131 | 0.029 | 16.7 | 0 | 0.000189 | 0.0402 | 16.5 | 0 |
b_non_work_mom_kid_act | b_log_distance_par_act | 0.000141 | 0.0293 | 16.2 | 0 | 0.000321 | 0.0632 | 16.1 | 0 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 0.000584 | 0.198 | -0.253 | 0.8 | 0.000518 | 0.174 | -0.247 | 0.805 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 0.000413 | 0.131 | -0.279 | 0.781 | 0.000159 | 0.0498 | -0.266 | 0.79 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -0.000167 | -0.0206 | 0.0136 | 0.989 | 0.000254 | 0.0315 | 0.0141 | 0.989 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -0.000644 | -0.0729 | -0.141 | 0.888 | -0.000593 | -0.066 | -0.14 | 0.889 |
b_non_work_mom_par_act | asc_kid_act | -0.012 | -0.291 | 11.4 | 0 | -0.0154 | -0.316 | 10.8 | 0 |
b_non_work_mom_par_act | asc_par_act | -0.00945 | -0.215 | 10.7 | 0 | -0.0125 | -0.239 | 10 | 0 |
b_non_work_mom_par_act | b_age_kid_act | 0.00106 | 0.47 | -1.07 | 0.286 | 0.00166 | 0.578 | -0.962 | 0.336 |
b_non_work_mom_par_act | b_age_par_act | -0.00525 | -0.649 | 0.171 | 0.864 | -0.00836 | -0.746 | 0.142 | 0.887 |
b_non_work_mom_par_act | b_female_kid_act | -0.000648 | -0.0889 | 2.84 | 0.00449 | -0.00112 | -0.135 | 2.54 | 0.011 |
b_non_work_mom_par_act | b_female_par_act | 0.00184 | 0.22 | 2.72 | 0.00653 | 0.00316 | 0.32 | 2.61 | 0.00897 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | 0.000972 | 0.126 | -1.72 | 0.0862 | 0.00164 | 0.185 | -1.61 | 0.108 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -0.00356 | -0.367 | -0.636 | 0.524 | -0.00538 | -0.458 | -0.558 | 0.577 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -0.000681 | -0.0895 | -1.01 | 0.311 | -0.001 | -0.116 | -0.916 | 0.36 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | 0.000669 | 0.0798 | -1.34 | 0.18 | 0.00114 | 0.12 | -1.25 | 0.21 |
b_non_work_mom_par_act | b_log_density_kid_act | -0.000456 | -0.156 | -0.957 | 0.338 | -0.000743 | -0.21 | -0.838 | 0.402 |
b_non_work_mom_par_act | b_log_density_par_act | 0.00215 | 0.46 | -1.71 | 0.0867 | 0.00342 | 0.543 | -1.58 | 0.114 |
b_non_work_mom_par_act | b_log_distance_kid_act | -8.07e-05 | -0.0125 | 13.9 | 0 | 1.53e-05 | 0.00202 | 12.6 | 0 |
b_non_work_mom_par_act | b_log_distance_par_act | -0.000209 | -0.0304 | 13.5 | 0 | -0.000585 | -0.0716 | 11.9 | 0 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 0.000372 | 0.0879 | 1.02 | 0.309 | 4.48e-05 | 0.00936 | 0.883 | 0.377 |
b_non_work_mom_par_act | b_log_income_k_par_act | 0.00106 | 0.235 | 1.04 | 0.299 | 0.00149 | 0.29 | 0.94 | 0.347 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -0.00081 | -0.0699 | 0.849 | 0.396 | -0.000817 | -0.0631 | 0.803 | 0.422 |
b_non_work_mom_par_act | b_non_work_dad_par_act | 0.00107 | 0.0842 | 0.731 | 0.465 | 0.00313 | 0.217 | 0.742 | 0.458 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 0.00362 | 0.455 | 1.34 | 0.181 | 0.00273 | 0.298 | 1.08 | 0.281 |
b_veh_per_driver_kid_act | asc_kid_act | -0.00752 | -0.238 | 11 | 0 | -0.00954 | -0.268 | 10.4 | 0 |
b_veh_per_driver_kid_act | asc_par_act | -0.00632 | -0.188 | 10.1 | 0 | -0.00858 | -0.224 | 9.54 | 0 |
b_veh_per_driver_kid_act | b_age_kid_act | 0.000212 | 0.123 | -5.95 | 2.64e-09 | 0.000417 | 0.2 | -5.6 | 2.09e-08 |
b_veh_per_driver_kid_act | b_age_par_act | -0.00153 | -0.247 | -2.84 | 0.00455 | -0.00237 | -0.29 | -2.43 | 0.0151 |
b_veh_per_driver_kid_act | b_female_kid_act | -4.17e-05 | -0.00749 | -0.0649 | 0.948 | -0.000198 | -0.0328 | -0.061 | 0.951 |
b_veh_per_driver_kid_act | b_female_par_act | 0.000659 | 0.103 | -0.569 | 0.569 | 0.000952 | 0.133 | -0.545 | 0.586 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 0.000358 | 0.0606 | -5.57 | 2.53e-08 | 0.000392 | 0.0609 | -5.3 | 1.14e-07 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | -0.000897 | -0.121 | -3.75 | 0.000176 | -0.00151 | -0.176 | -3.42 | 0.000636 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | -0.000156 | -0.0268 | -4.71 | 2.51e-06 | -0.000397 | -0.0628 | -4.41 | 1.04e-05 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | 0.000258 | 0.0403 | -4.97 | 6.55e-07 | 0.000304 | 0.0438 | -4.78 | 1.76e-06 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 4.8e-05 | 0.0215 | -5.74 | 9.55e-09 | -3.14e-05 | -0.0122 | -5.25 | 1.49e-07 |
b_veh_per_driver_kid_act | b_log_density_par_act | 0.000765 | 0.214 | -6.48 | 9.26e-11 | 0.00116 | 0.254 | -6.01 | 1.83e-09 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 7.17e-05 | 0.0146 | 13.2 | 0 | 8.53e-05 | 0.0155 | 12.4 | 0 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 5.63e-05 | 0.0107 | 12.8 | 0 | -7.12e-05 | -0.012 | 11.9 | 0 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -0.000554 | -0.171 | -2.78 | 0.00539 | -0.00067 | -0.192 | -2.6 | 0.00937 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -0.000376 | -0.109 | -2.83 | 0.00462 | -0.000279 | -0.0745 | -2.7 | 0.00699 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 0.000289 | 0.0326 | -1.85 | 0.0642 | 3.7e-05 | 0.00393 | -1.79 | 0.0735 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 0.000801 | 0.0828 | -1.95 | 0.0511 | 0.000864 | 0.0821 | -1.89 | 0.0581 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | -0.000197 | -0.0324 | -2.22 | 0.0264 | -0.000243 | -0.0365 | -2.11 | 0.0351 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | 0.00162 | 0.186 | -3.13 | 0.00174 | 0.00275 | 0.257 | -2.92 | 0.00348 |
b_veh_per_driver_par_act | asc_kid_act | 0.00656 | 0.125 | 11.1 | 0 | 0.0129 | 0.189 | 10.8 | 0 |
b_veh_per_driver_par_act | asc_par_act | 0.000312 | 0.00561 | 9.79 | 0 | 0.0056 | 0.0763 | 9.35 | 0 |
b_veh_per_driver_par_act | b_age_kid_act | -0.00144 | -0.506 | -4.42 | 9.74e-06 | -0.00244 | -0.608 | -3.52 | 0.000436 |
b_veh_per_driver_par_act | b_age_par_act | 0.00754 | 0.735 | -5.46 | 4.82e-08 | 0.0129 | 0.821 | -4.8 | 1.56e-06 |
b_veh_per_driver_par_act | b_female_kid_act | 0.00088 | 0.0952 | -1.18 | 0.24 | 0.00146 | 0.126 | -0.979 | 0.327 |
b_veh_per_driver_par_act | b_female_par_act | -0.00269 | -0.254 | -1.3 | 0.192 | -0.00483 | -0.35 | -1.06 | 0.289 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | -0.00135 | -0.138 | -4.65 | 3.34e-06 | -0.00231 | -0.187 | -3.83 | 0.000129 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | 0.00505 | 0.41 | -5.06 | 4.28e-07 | 0.00845 | 0.514 | -4.46 | 8.34e-06 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | 0.000416 | 0.0431 | -4.53 | 5.8e-06 | 0.000988 | 0.0814 | -3.81 | 0.000139 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -0.00176 | -0.166 | -4.28 | 1.87e-05 | -0.00243 | -0.183 | -3.59 | 0.000329 |
b_veh_per_driver_par_act | b_log_density_kid_act | 0.000631 | 0.17 | -4.91 | 9.16e-07 | 0.00102 | 0.206 | -3.94 | 8.08e-05 |
b_veh_per_driver_par_act | b_log_density_par_act | -0.00306 | -0.516 | -4.36 | 1.29e-05 | -0.0054 | -0.613 | -3.44 | 0.000576 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.000344 | 0.0421 | 8.01 | 1.11e-15 | 0.000319 | 0.0302 | 6.53 | 6.61e-11 |
b_veh_per_driver_par_act | b_log_distance_par_act | 0.000491 | 0.0563 | 7.92 | 2.44e-15 | 0.00112 | 0.0978 | 6.58 | 4.67e-11 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -0.000277 | -0.0517 | -3.03 | 0.00245 | 3.16e-06 | 0.000471 | -2.49 | 0.0129 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -0.00128 | -0.222 | -2.9 | 0.00377 | -0.00221 | -0.308 | -2.33 | 0.0198 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 0.00114 | 0.0778 | -2.47 | 0.0136 | 0.00145 | 0.0801 | -2.13 | 0.0329 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | -0.00139 | -0.0864 | -2.31 | 0.0206 | -0.00439 | -0.217 | -1.91 | 0.0565 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | 0.00204 | 0.203 | -2.94 | 0.00328 | 0.00362 | 0.283 | -2.51 | 0.0122 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | -0.0073 | -0.505 | -2.59 | 0.00955 | -0.0128 | -0.624 | -2.07 | 0.0381 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 0.00396 | 0.359 | -1.26 | 0.208 | 0.00325 | 0.217 | -0.947 | 0.344 |
b_y2017_kid_act | asc_kid_act | 0.00502 | 0.127 | 12.8 | 0 | 0.0087 | 0.184 | 12.4 | 0 |
b_y2017_kid_act | asc_par_act | 0.0011 | 0.0262 | 11.4 | 0 | 0.00547 | 0.108 | 11 | 0 |
b_y2017_kid_act | b_age_kid_act | -0.000912 | -0.425 | -0.682 | 0.495 | -0.00147 | -0.531 | -0.585 | 0.559 |
b_y2017_kid_act | b_age_par_act | 0.00559 | 0.724 | 0.811 | 0.418 | 0.00872 | 0.806 | 0.822 | 0.411 |
b_y2017_kid_act | b_female_kid_act | 0.000595 | 0.0857 | 3.42 | 0.000617 | 0.000866 | 0.108 | 3.12 | 0.0018 |
b_y2017_kid_act | b_female_par_act | -0.00204 | -0.255 | 2.43 | 0.0151 | -0.00331 | -0.348 | 2.12 | 0.0336 |
b_y2017_kid_act | b_has_big_sib_kid_act | -0.000691 | -0.0937 | -1.38 | 0.169 | -0.0011 | -0.129 | -1.23 | 0.218 |
b_y2017_kid_act | b_has_big_sib_par_act | 0.00399 | 0.43 | -0.733 | 0.464 | 0.00599 | 0.529 | -0.719 | 0.472 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 0.000948 | 0.131 | -0.918 | 0.358 | 0.00133 | 0.159 | -0.841 | 0.4 |
b_y2017_kid_act | b_has_lil_sib_par_act | -0.000611 | -0.0763 | -1.07 | 0.285 | -0.000982 | -0.107 | -0.965 | 0.335 |
b_y2017_kid_act | b_log_density_kid_act | 0.000307 | 0.11 | -0.789 | 0.43 | 0.000554 | 0.162 | -0.698 | 0.485 |
b_y2017_kid_act | b_log_density_par_act | -0.0024 | -0.538 | -1.03 | 0.305 | -0.00384 | -0.632 | -0.864 | 0.388 |
b_y2017_kid_act | b_log_distance_kid_act | -0.000405 | -0.0659 | 14.3 | 0 | -0.000351 | -0.0481 | 12.9 | 0 |
b_y2017_kid_act | b_log_distance_par_act | -0.000369 | -0.0563 | 14 | 0 | 0.000207 | 0.0263 | 13 | 0 |
b_y2017_kid_act | b_log_income_k_kid_act | 0.00012 | 0.0299 | 1.3 | 0.193 | 0.000324 | 0.0702 | 1.17 | 0.244 |
b_y2017_kid_act | b_log_income_k_par_act | -0.00043 | -0.0995 | 1.21 | 0.227 | -0.000967 | -0.195 | 1.04 | 0.296 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 0.000522 | 0.0472 | 1.12 | 0.264 | 0.000901 | 0.0721 | 1.06 | 0.288 |
b_y2017_kid_act | b_non_work_dad_par_act | -0.00148 | -0.122 | 0.846 | 0.397 | -0.00307 | -0.22 | 0.759 | 0.448 |
b_y2017_kid_act | b_non_work_mom_kid_act | 0.00141 | 0.185 | 1.4 | 0.161 | 0.00222 | 0.251 | 1.31 | 0.19 |
b_y2017_kid_act | b_non_work_mom_par_act | -0.00538 | -0.495 | 0.158 | 0.874 | -0.00873 | -0.615 | 0.133 | 0.894 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -0.00145 | -0.175 | 2.9 | 0.0037 | -0.00241 | -0.233 | 2.52 | 0.0116 |
b_y2017_kid_act | b_veh_per_driver_par_act | 0.0077 | 0.559 | 4.98 | 6.25e-07 | 0.0135 | 0.679 | 4.61 | 4.03e-06 |
b_y2017_par_act | asc_kid_act | -0.0489 | -0.31 | 8.8 | 0 | -0.0705 | -0.349 | 7.6 | 2.91e-14 |
b_y2017_par_act | asc_par_act | -0.0304 | -0.181 | 8.77 | 0 | -0.0539 | -0.248 | 7.47 | 8.1e-14 |
b_y2017_par_act | b_age_kid_act | 0.0055 | 0.639 | 1.62 | 0.104 | 0.00862 | 0.727 | 1.32 | 0.186 |
b_y2017_par_act | b_age_par_act | -0.0294 | -0.95 | 1.61 | 0.107 | -0.0448 | -0.967 | 1.31 | 0.19 |
b_y2017_par_act | b_female_kid_act | -0.00297 | -0.107 | 2.66 | 0.00777 | -0.00493 | -0.144 | 2.17 | 0.0298 |
b_y2017_par_act | b_female_par_act | 0.0111 | 0.345 | 2.75 | 0.006 | 0.0175 | 0.428 | 2.26 | 0.024 |
b_y2017_par_act | b_has_big_sib_kid_act | 0.00592 | 0.2 | 1.35 | 0.178 | 0.00857 | 0.234 | 1.1 | 0.271 |
b_y2017_par_act | b_has_big_sib_par_act | -0.0191 | -0.514 | 1.39 | 0.164 | -0.029 | -0.596 | 1.14 | 0.255 |
b_y2017_par_act | b_has_lil_sib_kid_act | -0.00127 | -0.0436 | 1.46 | 0.143 | -0.00348 | -0.0971 | 1.19 | 0.234 |
b_y2017_par_act | b_has_lil_sib_par_act | 0.00713 | 0.222 | 1.45 | 0.148 | 0.00873 | 0.222 | 1.17 | 0.24 |
b_y2017_par_act | b_log_density_kid_act | -0.00198 | -0.177 | 1.54 | 0.124 | -0.00317 | -0.217 | 1.25 | 0.21 |
b_y2017_par_act | b_log_density_par_act | 0.0126 | 0.706 | 1.54 | 0.123 | 0.0196 | 0.751 | 1.26 | 0.208 |
b_y2017_par_act | b_log_distance_kid_act | -0.00148 | -0.06 | 5.91 | 3.42e-09 | -0.0012 | -0.0383 | 4.84 | 1.27e-06 |
b_y2017_par_act | b_log_distance_par_act | -0.00216 | -0.0822 | 5.86 | 4.66e-09 | -0.00444 | -0.132 | 4.76 | 1.91e-06 |
b_y2017_par_act | b_log_income_k_kid_act | -0.000801 | -0.0495 | 2.08 | 0.0371 | -0.00188 | -0.0949 | 1.69 | 0.0901 |
b_y2017_par_act | b_log_income_k_par_act | 0.00215 | 0.124 | 2.11 | 0.0346 | 0.00536 | 0.253 | 1.74 | 0.0823 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.0029 | -0.0655 | 2.05 | 0.0403 | -0.00511 | -0.0955 | 1.68 | 0.0921 |
b_y2017_par_act | b_non_work_dad_par_act | 0.0079 | 0.163 | 2.11 | 0.0346 | 0.0155 | 0.26 | 1.77 | 0.0765 |
b_y2017_par_act | b_non_work_mom_kid_act | -0.00728 | -0.239 | 2.03 | 0.0421 | -0.0114 | -0.302 | 1.66 | 0.097 |
b_y2017_par_act | b_non_work_mom_par_act | 0.0292 | 0.671 | 2.16 | 0.0308 | 0.0466 | 0.766 | 1.79 | 0.0728 |
b_y2017_par_act | b_veh_per_driver_kid_act | 0.00802 | 0.241 | 2.84 | 0.00446 | 0.0129 | 0.292 | 2.33 | 0.0196 |
b_y2017_par_act | b_veh_per_driver_par_act | -0.0413 | -0.748 | 2.5 | 0.0125 | -0.0701 | -0.824 | 1.99 | 0.0463 |
b_y2017_par_act | b_y2017_kid_act | -0.0252 | -0.606 | 1.51 | 0.132 | -0.0423 | -0.722 | 1.21 | 0.225 |
mu_active | asc_kid_act | 0.339 | 0.293 | 3.21 | 0.00134 | 0.5 | 0.333 | 2.57 | 0.0101 |
mu_active | asc_par_act | 0.191 | 0.155 | 3.1 | 0.00193 | 0.367 | 0.227 | 2.5 | 0.0123 |
mu_active | b_age_kid_act | -0.0402 | -0.639 | 1.42 | 0.155 | -0.0637 | -0.723 | 1.14 | 0.254 |
mu_active | b_age_par_act | 0.219 | 0.97 | 1.51 | 0.131 | 0.337 | 0.98 | 1.21 | 0.226 |
mu_active | b_female_kid_act | 0.0223 | 0.109 | 1.59 | 0.111 | 0.037 | 0.145 | 1.28 | 0.202 |
mu_active | b_female_par_act | -0.0819 | -0.35 | 1.56 | 0.12 | -0.129 | -0.425 | 1.25 | 0.212 |
mu_active | b_has_big_sib_kid_act | -0.0415 | -0.192 | 1.39 | 0.165 | -0.0616 | -0.227 | 1.11 | 0.266 |
mu_active | b_has_big_sib_par_act | 0.145 | 0.534 | 1.45 | 0.146 | 0.219 | 0.608 | 1.16 | 0.245 |
mu_active | b_has_lil_sib_kid_act | 0.0137 | 0.0642 | 1.42 | 0.156 | 0.03 | 0.113 | 1.14 | 0.255 |
mu_active | b_has_lil_sib_par_act | -0.0475 | -0.202 | 1.4 | 0.162 | -0.0606 | -0.207 | 1.12 | 0.262 |
mu_active | b_log_density_kid_act | 0.0143 | 0.175 | 1.43 | 0.153 | 0.0232 | 0.214 | 1.15 | 0.252 |
mu_active | b_log_density_par_act | -0.0942 | -0.72 | 1.39 | 0.163 | -0.148 | -0.767 | 1.12 | 0.264 |
mu_active | b_log_distance_kid_act | 0.00684 | 0.0379 | 2.04 | 0.0414 | 0.00582 | 0.0251 | 1.63 | 0.102 |
mu_active | b_log_distance_par_act | 0.0104 | 0.054 | 2.04 | 0.0416 | 0.0287 | 0.114 | 1.63 | 0.102 |
mu_active | b_log_income_k_kid_act | 0.00585 | 0.0495 | 1.5 | 0.133 | 0.0146 | 0.0994 | 1.2 | 0.228 |
mu_active | b_log_income_k_par_act | -0.0166 | -0.131 | 1.5 | 0.134 | -0.0386 | -0.245 | 1.2 | 0.231 |
mu_active | b_non_work_dad_kid_ace | 0.0215 | 0.0664 | 1.51 | 0.131 | 0.0374 | 0.0942 | 1.21 | 0.226 |
mu_active | b_non_work_dad_par_act | -0.0589 | -0.167 | 1.49 | 0.136 | -0.117 | -0.264 | 1.19 | 0.233 |
mu_active | b_non_work_mom_kid_act | 0.0544 | 0.244 | 1.52 | 0.129 | 0.0863 | 0.307 | 1.22 | 0.224 |
mu_active | b_non_work_mom_par_act | -0.217 | -0.681 | 1.43 | 0.153 | -0.347 | -0.767 | 1.14 | 0.253 |
mu_active | b_veh_per_driver_kid_act | -0.0595 | -0.244 | 1.58 | 0.114 | -0.0963 | -0.293 | 1.27 | 0.205 |
mu_active | b_veh_per_driver_par_act | 0.308 | 0.762 | 1.7 | 0.0882 | 0.529 | 0.837 | 1.37 | 0.17 |
mu_active | b_y2017_kid_act | 0.222 | 0.731 | 1.49 | 0.136 | 0.352 | 0.808 | 1.2 | 0.232 |
mu_active | b_y2017_par_act | -1.19 | -0.98 | 1.07 | 0.285 | -1.84 | -0.987 | 0.858 | 0.391 |
Smallest eigenvalue: 0.109665
+Largest eigenvalue: 1.2092e+06
+Condition number: 1.10264e+07
+ \ No newline at end of file diff --git a/models/IATBR plan/3 alternatives/mode-nest/mode_nests3.pickle b/models/IATBR plan/3 alternatives/mode-nest/mode_nests3.pickle new file mode 100644 index 0000000..ea72b5c Binary files /dev/null and b/models/IATBR plan/3 alternatives/mode-nest/mode_nests3.pickle differ diff --git a/models/IATBR plan/3 alternatives/mode-nest/model-mode-nest3.py b/models/IATBR plan/3 alternatives/mode-nest/model-mode-nest3.py new file mode 100644 index 0000000..2717dcd --- /dev/null +++ b/models/IATBR plan/3 alternatives/mode-nest/model-mode-nest3.py @@ -0,0 +1,179 @@ +# Model predicts the choice among four alternatives: +# * Car with a parent +# * Car without a parent (presumably a carpool) +# * Active with a parent +# * Active without a parent + +# In this model, the alternatives are independent + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable +from biogeme.nests import OneNestForNestedLogit, NestsForNestedLogit + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips3.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +y2017 = Variable('y2017') +veh_per_driver = Variable('veh_per_driver') +non_work_mom = Variable('non_work_mom') +non_work_dad = Variable('non_work_dad') +age = Variable('age') +female = Variable('female') +has_lil_sib = Variable('has_lil_sib') +has_big_sib = Variable('has_big_sib') +log_income_k = Variable('log_inc_k') +log_distance = Variable('log_distance') +log_density = Variable('log_density') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car is reference case) +asc_car = Beta('asc_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_car = Beta('b_log_income_k_car', 0, None, None, 1) +b_veh_per_driver_car = Beta('b_veh_per_driver_car', 0, None, None, 1) +b_non_work_mom_car = Beta('b_non_work_mom_car', 0, None, None, 1) +b_non_work_dad_car = Beta('b_non_work_dad_car', 0, None, None, 1) + +b_age_car = Beta('b_age_car', 0, None, None, 1) +b_female_car = Beta('b_female_car', 0, None, None, 1) +b_has_lil_sib_car = Beta('b_has_lil_sib_car', 0, None, None, 1) +b_has_big_sib_car = Beta('b_has_big_sib_car', 0, None, None, 1) + +b_log_distance_car = Beta('b_log_distance_car', 0, None, None, 1) +b_log_density_car = Beta('b_log_density_car', 0, None, None, 1) + +b_y2017_car = Beta('b_y2017_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) + +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) + +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# Definition of utility functions +V_car = ( + asc_car + + b_log_income_k_car * log_income_k + + b_veh_per_driver_car * veh_per_driver + + b_non_work_mom_car * non_work_mom + + b_non_work_dad_car * non_work_dad + + b_age_car * age + + b_female_car * female + + b_has_lil_sib_car * has_lil_sib + + b_has_big_sib_car * has_big_sib + + b_log_distance_car * log_distance + + b_log_density_car * log_density + + b_y2017_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_income_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_income_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {7: V_car, + 18: V_par_act, + 28: V_kid_act} + +# associate availability conditions with alternatives: +# Note: the names don't really make sense with what we're doing, +# but they're all 1s - all alternatives are available to everyone + +av = {7: av_par_car, + 18: av_par_act, + 28: av_kid_act} + +# Define nests based on mode +mu_active = Beta('mu_active', 1, 1.0, None, 0) + +active_nest = OneNestForNestedLogit( + nest_param=mu_active, + list_of_alternatives=[18,28], + name='active_nest' +) + +mode_nests = NestsForNestedLogit( + choice_set=list(V), + tuple_of_nests=(active_nest,) +) + +# Define model +my_model = models.lognested(V, av, mode_nests, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, my_model) +the_biogeme.modelName = 'mode_nests3' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/3 alternatives/no-nest/biogeme.toml b/models/IATBR plan/3 alternatives/no-nest/biogeme.toml new file mode 100644 index 0000000..33217b0 --- /dev/null +++ b/models/IATBR plan/3 alternatives/no-nest/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on March 28, 2024. 12:21:45 + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 100 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + diff --git a/models/IATBR plan/3 alternatives/no-nest/model-no-nest3.py b/models/IATBR plan/3 alternatives/no-nest/model-no-nest3.py new file mode 100644 index 0000000..7ca9be6 --- /dev/null +++ b/models/IATBR plan/3 alternatives/no-nest/model-no-nest3.py @@ -0,0 +1,164 @@ +# Model predicts the choice among four alternatives: +# * Car with a parent +# * Car without a parent (presumably a carpool) +# * Active with a parent +# * Active without a parent + +# In this model, the alternatives are independent + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips3.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +y2017 = Variable('y2017') +veh_per_driver = Variable('veh_per_driver') +non_work_mom = Variable('non_work_mom') +non_work_dad = Variable('non_work_dad') +age = Variable('age') +female = Variable('female') +has_lil_sib = Variable('has_lil_sib') +has_big_sib = Variable('has_big_sib') +log_income_k = Variable('log_inc_k') +log_distance = Variable('log_distance') +log_density = Variable('log_density') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car is reference case) +asc_car = Beta('asc_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_car = Beta('b_log_income_k_car', 0, None, None, 1) +b_veh_per_driver_car = Beta('b_veh_per_driver_car', 0, None, None, 1) +b_non_work_mom_car = Beta('b_non_work_mom_car', 0, None, None, 1) +b_non_work_dad_car = Beta('b_non_work_dad_car', 0, None, None, 1) + +b_age_car = Beta('b_age_car', 0, None, None, 1) +b_female_car = Beta('b_female_car', 0, None, None, 1) +b_has_lil_sib_car = Beta('b_has_lil_sib_car', 0, None, None, 1) +b_has_big_sib_car = Beta('b_has_big_sib_car', 0, None, None, 1) + +b_log_distance_car = Beta('b_log_distance_car', 0, None, None, 1) +b_log_density_car = Beta('b_log_density_car', 0, None, None, 1) + +b_y2017_car = Beta('b_y2017_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) + +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) + +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# Definition of utility functions +V_car = ( + asc_car + + b_log_income_k_car * log_income_k + + b_veh_per_driver_car * veh_per_driver + + b_non_work_mom_car * non_work_mom + + b_non_work_dad_car * non_work_dad + + b_age_car * age + + b_female_car * female + + b_has_lil_sib_car * has_lil_sib + + b_has_big_sib_car * has_big_sib + + b_log_distance_car * log_distance + + b_log_density_car * log_density + + b_y2017_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_income_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_income_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {7: V_car, + 18: V_par_act, + 28: V_kid_act} + +# associate availability conditions with alternatives: +# Note: the names don't really make sense with what we're doing, +# but they're all 1s - all alternatives are available to everyone + +av = {7: av_par_car, + 18: av_par_act, + 28: av_kid_act} + +# Define model +my_model = models.loglogit(V, av, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, my_model) +the_biogeme.modelName = 'no_nests3' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/3 alternatives/no-nest/no_nests3.html b/models/IATBR plan/3 alternatives/no-nest/no_nests3.html new file mode 100644 index 0000000..5d42f7a --- /dev/null +++ b/models/IATBR plan/3 alternatives/no-nest/no_nests3.html @@ -0,0 +1,369 @@ + + + + +biogeme 3.2.13 [2024-04-04]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-04 16:57:46.805033
+Report file: | no_nests3~00.html |
Database name: | est |
Number of estimated parameters: | 24 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -55038.07 |
Final log likelihood: | -3176.634 |
Likelihood ratio test for the init. model: | 103722.9 |
Rho-square for the init. model: | 0.942 |
Rho-square-bar for the init. model: | 0.942 |
Akaike Information Criterion: | 6401.269 |
Bayesian Information Criterion: | 6557.246 |
Final gradient norm: | 1.6144E-02 |
Nbr of threads: | 12 |
Relative gradient: | 1.3127396587196186e-07 |
Cause of termination: | Relative gradient = 1.3e-07 <= 6.1e-06 |
Number of function evaluations: | 47 |
Number of gradient evaluations: | 33 |
Number of hessian evaluations: | 32 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 46 |
Proportion of Hessian calculation: | 32/32 = 100.0% |
Optimization time: | 0:00:09.456681 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
asc_kid_act | -5.22 | 0.402 | -13 | 0 |
asc_par_act | -5.68 | 0.9 | -6.31 | 2.82e-10 |
b_age_kid_act | 0.243 | 0.0175 | 13.9 | 0 |
b_age_par_act | -0.251 | 0.0358 | -7.01 | 2.41e-12 |
b_female_kid_act | -0.316 | 0.0722 | -4.38 | 1.21e-05 |
b_female_par_act | -0.132 | 0.134 | -0.988 | 0.323 |
b_has_big_sib_kid_act | 0.338 | 0.0755 | 4.48 | 7.44e-06 |
b_has_big_sib_par_act | 0.0407 | 0.139 | 0.294 | 0.769 |
b_has_lil_sib_kid_act | 0.212 | 0.0757 | 2.81 | 0.00502 |
b_has_lil_sib_par_act | 0.287 | 0.139 | 2.06 | 0.0394 |
b_log_density_kid_act | 0.173 | 0.0294 | 5.89 | 3.92e-09 |
b_log_density_par_act | 0.404 | 0.0765 | 5.28 | 1.31e-07 |
b_log_distance_kid_act | -1.63 | 0.0648 | -25.1 | 0 |
b_log_distance_par_act | -1.73 | 0.113 | -15.3 | 0 |
b_log_income_k_kid_act | -0.0472 | 0.0424 | -1.11 | 0.266 |
b_log_income_k_par_act | 0.0651 | 0.0742 | 0.877 | 0.38 |
b_non_work_dad_kid_ace | -0.11 | 0.115 | -0.955 | 0.34 |
b_non_work_dad_par_act | 0.201 | 0.194 | 1.04 | 0.3 |
b_non_work_mom_kid_act | -0.123 | 0.0771 | -1.59 | 0.111 |
b_non_work_mom_par_act | 0.42 | 0.139 | 3.03 | 0.00244 |
b_veh_per_driver_kid_act | -0.191 | 0.0858 | -2.22 | 0.0263 |
b_veh_per_driver_par_act | -1.13 | 0.229 | -4.92 | 8.48e-07 |
b_y2017_kid_act | -0.202 | 0.0743 | -2.72 | 0.00661 |
b_y2017_par_act | 2.7 | 0.189 | 14.2 | 0 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_par_act | asc_kid_act | 0.0533 | 0.168 | -0.544 | 0.586 | 0.0549 | 0.152 | -0.493 | 0.622 |
b_age_kid_act | asc_kid_act | -0.00373 | -0.549 | 13.6 | 0 | -0.00376 | -0.534 | 13.3 | 0 |
b_age_kid_act | asc_par_act | -0.0011 | -0.0777 | 7.28 | 3.44e-13 | -0.00125 | -0.0792 | 6.57 | 5.15e-11 |
b_age_par_act | asc_kid_act | -0.00136 | -0.091 | 12.6 | 0 | -0.00132 | -0.0916 | 12.2 | 0 |
b_age_par_act | asc_par_act | -0.0137 | -0.441 | 6.54 | 6.1e-11 | -0.0139 | -0.433 | 5.92 | 3.13e-09 |
b_age_par_act | b_age_kid_act | 0.000106 | 0.16 | -12.6 | 0 | 9.93e-05 | 0.159 | -13.2 | 0 |
b_female_kid_act | asc_kid_act | -0.00159 | -0.0565 | 12.2 | 0 | -0.00157 | -0.0542 | 11.9 | 0 |
b_female_kid_act | asc_par_act | -0.000786 | -0.0134 | 6.57 | 5.09e-11 | 1.35e-05 | 0.000207 | 5.94 | 2.88e-09 |
b_female_kid_act | b_age_kid_act | -4.28e-08 | -3.42e-05 | -7.54 | 4.75e-14 | -1.68e-05 | -0.0133 | -7.49 | 6.71e-14 |
b_female_kid_act | b_age_par_act | 1.64e-06 | 0.000598 | -0.802 | 0.422 | -6.04e-05 | -0.0234 | -0.804 | 0.422 |
b_female_par_act | asc_kid_act | -0.000746 | -0.0143 | 12.3 | 0 | 0.000117 | 0.00217 | 12 | 0 |
b_female_par_act | asc_par_act | -0.00662 | -0.0611 | 6.67 | 2.5e-11 | -0.00928 | -0.077 | 6.03 | 1.66e-09 |
b_female_par_act | b_age_kid_act | 1.8e-05 | 0.00775 | -2.79 | 0.00529 | -3.25e-05 | -0.0139 | -2.77 | 0.00557 |
b_female_par_act | b_age_par_act | 3.77e-05 | 0.0074 | 0.856 | 0.392 | 0.000372 | 0.0777 | 0.873 | 0.383 |
b_female_par_act | b_female_kid_act | 0.00181 | 0.188 | 1.32 | 0.186 | 0.00183 | 0.189 | 1.32 | 0.187 |
b_has_big_sib_kid_act | asc_kid_act | -0.00635 | -0.215 | 13.4 | 0 | -0.00615 | -0.203 | 13.1 | 0 |
b_has_big_sib_kid_act | asc_par_act | -0.00201 | -0.0329 | 7.35 | 1.93e-13 | -0.00187 | -0.0275 | 6.65 | 3.02e-11 |
b_has_big_sib_kid_act | b_age_kid_act | 0.000224 | 0.171 | 1.28 | 0.199 | 0.000185 | 0.14 | 1.27 | 0.203 |
b_has_big_sib_kid_act | b_age_par_act | 6.64e-05 | 0.0231 | 7.03 | 2.01e-12 | 8.71e-05 | 0.0323 | 7.14 | 9.28e-13 |
b_has_big_sib_kid_act | b_female_kid_act | -0.000172 | -0.0317 | 6.18 | 6.58e-10 | -0.000123 | -0.0226 | 6.19 | 5.9e-10 |
b_has_big_sib_kid_act | b_female_par_act | -3.34e-05 | -0.00332 | 3.06 | 0.00218 | -7.16e-05 | -0.00709 | 3.05 | 0.00227 |
b_has_big_sib_par_act | asc_kid_act | -0.00229 | -0.0421 | 12.5 | 0 | -0.00213 | -0.0382 | 12.2 | 0 |
b_has_big_sib_par_act | asc_par_act | -0.0217 | -0.191 | 6.73 | 1.71e-11 | -0.0164 | -0.131 | 6.16 | 7.3e-10 |
b_has_big_sib_par_act | b_age_kid_act | 5.75e-05 | 0.0237 | -1.44 | 0.15 | 7.46e-05 | 0.0308 | -1.45 | 0.147 |
b_has_big_sib_par_act | b_age_par_act | 0.000563 | 0.106 | 2.07 | 0.0381 | 0.000426 | 0.086 | 2.08 | 0.0375 |
b_has_big_sib_par_act | b_female_kid_act | -5.05e-05 | -0.00503 | 2.27 | 0.0232 | -6.68e-05 | -0.00667 | 2.28 | 0.0228 |
b_has_big_sib_par_act | b_female_par_act | -0.000425 | -0.0229 | 0.886 | 0.375 | -0.00108 | -0.0585 | 0.873 | 0.383 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 0.00203 | 0.193 | -2.05 | 0.0404 | 0.0021 | 0.201 | -2.07 | 0.0387 |
b_has_lil_sib_kid_act | asc_kid_act | -0.00515 | -0.175 | 13.2 | 0 | -0.00507 | -0.167 | 12.9 | 0 |
b_has_lil_sib_kid_act | asc_par_act | -0.00203 | -0.0331 | 7.2 | 6.04e-13 | -0.00137 | -0.0202 | 6.51 | 7.49e-11 |
b_has_lil_sib_kid_act | b_age_kid_act | 2.32e-05 | 0.0177 | -0.391 | 0.696 | 5.91e-06 | 0.00447 | -0.388 | 0.698 |
b_has_lil_sib_kid_act | b_age_par_act | 1.66e-05 | 0.00576 | 5.5 | 3.89e-08 | -3.9e-05 | -0.0144 | 5.5 | 3.78e-08 |
b_has_lil_sib_kid_act | b_female_kid_act | -5.15e-05 | -0.00948 | 5.05 | 4.53e-07 | -0.000118 | -0.0216 | 5 | 5.82e-07 |
b_has_lil_sib_kid_act | b_female_par_act | -9.78e-07 | -9.73e-05 | 2.25 | 0.0245 | -8.69e-05 | -0.00858 | 2.23 | 0.0255 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 0.00147 | 0.259 | -1.37 | 0.171 | 0.0015 | 0.263 | -1.37 | 0.171 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 0.000603 | 0.0574 | 1.11 | 0.267 | 0.000679 | 0.0647 | 1.12 | 0.264 |
b_has_lil_sib_par_act | asc_kid_act | -0.00194 | -0.0356 | 13.1 | 0 | -0.00155 | -0.0277 | 12.8 | 0 |
b_has_lil_sib_par_act | asc_par_act | -0.017 | -0.15 | 7.06 | 1.62e-12 | -0.0193 | -0.154 | 6.4 | 1.53e-10 |
b_has_lil_sib_par_act | b_age_kid_act | 8.85e-07 | 0.000364 | 0.317 | 0.751 | -3.85e-05 | -0.0158 | 0.317 | 0.751 |
b_has_lil_sib_par_act | b_age_par_act | 7.32e-05 | 0.0138 | 3.73 | 0.000193 | 0.000545 | 0.109 | 3.84 | 0.000123 |
b_has_lil_sib_par_act | b_female_kid_act | 1.56e-06 | 0.000155 | 3.84 | 0.000123 | -7.33e-05 | -0.00728 | 3.83 | 0.000127 |
b_has_lil_sib_par_act | b_female_par_act | -0.000317 | -0.017 | 2.15 | 0.0313 | -0.000574 | -0.0308 | 2.14 | 0.0325 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 0.000588 | 0.0558 | -0.329 | 0.742 | 0.000645 | 0.0613 | -0.33 | 0.741 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 0.00505 | 0.26 | 1.45 | 0.147 | 0.0048 | 0.248 | 1.45 | 0.148 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 0.00202 | 0.192 | 0.514 | 0.607 | 0.00204 | 0.193 | 0.515 | 0.607 |
b_log_density_kid_act | asc_kid_act | -0.00697 | -0.637 | 13.2 | 0 | -0.00775 | -0.656 | 12.8 | 0 |
b_log_density_kid_act | asc_par_act | -0.00259 | -0.114 | 7.17 | 7.4e-13 | -0.00324 | -0.122 | 6.47 | 9.7e-11 |
b_log_density_kid_act | b_age_kid_act | 1.74e-05 | 0.0357 | -2.14 | 0.032 | 1.02e-05 | 0.0198 | -2.05 | 0.0402 |
b_log_density_kid_act | b_age_par_act | 1.64e-05 | 0.0153 | 9.02 | 0 | 2.54e-05 | 0.0241 | 9.26 | 0 |
b_log_density_kid_act | b_female_kid_act | -6.43e-05 | -0.0319 | 6.26 | 3.81e-10 | -5.07e-05 | -0.0239 | 6.22 | 4.97e-10 |
b_log_density_kid_act | b_female_par_act | -3.12e-05 | -0.00835 | 2.24 | 0.0254 | -1.59e-05 | -0.00405 | 2.23 | 0.026 |
b_log_density_kid_act | b_has_big_sib_kid_act | 1.68e-05 | 0.00797 | -2.06 | 0.0396 | 2.35e-05 | 0.0106 | -2.05 | 0.0407 |
b_log_density_kid_act | b_has_big_sib_par_act | 2.2e-05 | 0.00563 | 0.932 | 0.352 | -3.37e-05 | -0.00827 | 0.932 | 0.351 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 2.54e-05 | 0.012 | -0.492 | 0.623 | 6.84e-05 | 0.0307 | -0.49 | 0.624 |
b_log_density_kid_act | b_has_lil_sib_par_act | 2.05e-05 | 0.00525 | -0.802 | 0.423 | 3.34e-05 | 0.00816 | -0.802 | 0.422 |
b_log_density_par_act | asc_kid_act | -0.00238 | -0.094 | 14 | 0 | -0.00317 | -0.103 | 13.5 | 0 |
b_log_density_par_act | asc_par_act | -0.0379 | -0.718 | 7.07 | 1.53e-12 | -0.0515 | -0.748 | 6.34 | 2.23e-10 |
b_log_density_par_act | b_age_kid_act | -7.36e-06 | -0.00651 | 2.39 | 0.0167 | 1.7e-05 | 0.0127 | 2.06 | 0.0395 |
b_log_density_par_act | b_age_par_act | -7.89e-05 | -0.0318 | 8.57 | 0 | 7.67e-05 | 0.028 | 7.83 | 4.66e-15 |
b_log_density_par_act | b_female_kid_act | -1.33e-05 | -0.00285 | 7.41 | 1.26e-13 | 1.8e-05 | 0.00326 | 6.85 | 7.28e-12 |
b_log_density_par_act | b_female_par_act | -0.000156 | -0.018 | 3.59 | 0.000335 | -0.000499 | -0.0488 | 3.41 | 0.00066 |
b_log_density_par_act | b_has_big_sib_kid_act | 2.26e-07 | 4.61e-05 | 0.658 | 0.51 | -7.08e-05 | -0.0123 | 0.606 | 0.544 |
b_log_density_par_act | b_has_big_sib_par_act | 0.000149 | 0.0165 | 2.38 | 0.0175 | 0.000114 | 0.0107 | 2.3 | 0.0213 |
b_log_density_par_act | b_has_lil_sib_kid_act | 1.82e-05 | 0.00371 | 1.93 | 0.0541 | 3.2e-05 | 0.00552 | 1.78 | 0.0747 |
b_log_density_par_act | b_has_lil_sib_par_act | 0.000202 | 0.0223 | 0.763 | 0.445 | -0.000366 | -0.0344 | 0.723 | 0.47 |
b_log_density_par_act | b_log_density_kid_act | 0.000289 | 0.159 | 3.47 | 0.000524 | 0.000347 | 0.154 | 2.97 | 0.00296 |
b_log_distance_kid_act | asc_kid_act | 0.00666 | 0.272 | 9.5 | 0 | 0.00594 | 0.228 | 9.16 | 0 |
b_log_distance_kid_act | asc_par_act | 0.00268 | 0.0527 | 4.99 | 5.95e-07 | 0.00268 | 0.0459 | 4.5 | 6.68e-06 |
b_log_distance_kid_act | b_age_kid_act | -0.000258 | -0.237 | -27.2 | 0 | -0.000258 | -0.228 | -26.4 | 0 |
b_log_distance_kid_act | b_age_par_act | -0.000148 | -0.0622 | -18.3 | 0 | -0.000129 | -0.0554 | -18.2 | 0 |
b_log_distance_kid_act | b_female_kid_act | 0.000279 | 0.0619 | -14.2 | 0 | 0.000292 | 0.0624 | -14 | 0 |
b_log_distance_kid_act | b_female_par_act | 0.000143 | 0.0171 | -10.2 | 0 | 0.000469 | 0.054 | -10.3 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -9.48e-05 | -0.0201 | -19.9 | 0 | -0.0001 | -0.0205 | -19.6 | 0 |
b_log_distance_kid_act | b_has_big_sib_par_act | -0.000118 | -0.0135 | -10.9 | 0 | -6.07e-05 | -0.00675 | -10.9 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -0.000159 | -0.0337 | -18.5 | 0 | -0.000314 | -0.0639 | -17.9 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -0.000123 | -0.014 | -12.4 | 0 | -0.00027 | -0.0299 | -12.3 | 0 |
b_log_distance_kid_act | b_log_density_kid_act | -6.99e-05 | -0.0398 | -25.9 | 0 | 3.27e-06 | 0.00172 | -25.3 | 0 |
b_log_distance_kid_act | b_log_density_par_act | -9.83e-07 | -0.000242 | -22.5 | 0 | -0.000152 | -0.0307 | -20 | 0 |
b_log_distance_par_act | asc_kid_act | 0.00231 | 0.0541 | 8.74 | 0 | 0.00156 | 0.0344 | 8.44 | 0 |
b_log_distance_par_act | asc_par_act | 0.0203 | 0.228 | 4.97 | 6.59e-07 | 0.0313 | 0.307 | 4.53 | 5.88e-06 |
b_log_distance_par_act | b_age_kid_act | -3.51e-05 | -0.0184 | -17.7 | 0 | -4.55e-05 | -0.023 | -17.1 | 0 |
b_log_distance_par_act | b_age_par_act | -0.000189 | -0.0453 | -12.6 | 0 | -0.000701 | -0.173 | -11.9 | 0 |
b_log_distance_par_act | b_female_kid_act | 0.0001 | 0.0127 | -10.8 | 0 | 0.000399 | 0.0488 | -10.8 | 0 |
b_log_distance_par_act | b_female_par_act | 0.000494 | 0.0338 | -9.41 | 0 | 0.00016 | 0.0106 | -9.15 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_act | 4.15e-06 | 0.000503 | -15.5 | 0 | -3.06e-06 | -0.000358 | -15.2 | 0 |
b_log_distance_par_act | b_has_big_sib_par_act | -0.000235 | -0.0154 | -9.91 | 0 | 0.000324 | 0.0207 | -9.99 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -0.000126 | -0.0153 | -14.5 | 0 | -0.000233 | -0.0272 | -14.1 | 0 |
b_log_distance_par_act | b_has_lil_sib_par_act | -0.000581 | -0.038 | -11.2 | 0 | -0.00108 | -0.0685 | -10.9 | 0 |
b_log_distance_par_act | b_log_density_kid_act | -6.9e-05 | -0.0225 | -16.7 | 0 | -0.000115 | -0.0345 | -16.1 | 0 |
b_log_distance_par_act | b_log_density_par_act | -0.000273 | -0.0384 | -16.5 | 0 | -0.000507 | -0.0585 | -15.2 | 0 |
b_log_distance_par_act | b_log_distance_kid_act | 0.00224 | 0.327 | -0.937 | 0.349 | 0.00241 | 0.328 | -0.906 | 0.365 |
b_log_income_k_kid_act | asc_kid_act | -0.00839 | -0.508 | 12.5 | 0 | -0.0089 | -0.522 | 12.2 | 0 |
b_log_income_k_kid_act | asc_par_act | -0.00316 | -0.092 | 6.89 | 5.55e-12 | -0.00228 | -0.0597 | 6.23 | 4.61e-10 |
b_log_income_k_kid_act | b_age_kid_act | 4.14e-05 | 0.0564 | -6.47 | 9.63e-11 | 5.37e-05 | 0.0724 | -6.48 | 9.02e-11 |
b_log_income_k_kid_act | b_age_par_act | 8.07e-06 | 0.00501 | 3.59 | 0.000335 | 6.09e-06 | 0.00402 | 3.68 | 0.000237 |
b_log_income_k_kid_act | b_female_kid_act | -1.74e-05 | -0.00571 | 3.21 | 0.00132 | 2.49e-05 | 0.00812 | 3.22 | 0.00128 |
b_log_income_k_kid_act | b_female_par_act | -1.15e-05 | -0.00203 | 0.607 | 0.544 | -5.14e-05 | -0.00905 | 0.604 | 0.546 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 3.1e-05 | 0.00974 | -4.48 | 7.6e-06 | 8.06e-05 | 0.0252 | -4.5 | 6.81e-06 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 4.15e-05 | 0.00704 | -0.605 | 0.545 | 1.33e-05 | 0.00225 | -0.607 | 0.544 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 0.000155 | 0.0486 | -3.07 | 0.00215 | 0.000119 | 0.0369 | -3.04 | 0.00237 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 6.76e-05 | 0.0115 | -2.3 | 0.0215 | 3.15e-05 | 0.00533 | -2.3 | 0.0216 |
b_log_income_k_kid_act | b_log_density_kid_act | 6.11e-05 | 0.0517 | -4.45 | 8.49e-06 | 0.000109 | 0.0877 | -4.45 | 8.43e-06 |
b_log_income_k_kid_act | b_log_density_par_act | 2.9e-05 | 0.0106 | -5.85 | 4.98e-09 | 3.19e-05 | 0.00982 | -5.18 | 2.27e-07 |
b_log_income_k_kid_act | b_log_distance_kid_act | -0.000201 | -0.0761 | 20.2 | 0 | -0.00018 | -0.0655 | 19.8 | 0 |
b_log_income_k_kid_act | b_log_distance_par_act | -6.47e-05 | -0.014 | 14.3 | 0 | 0.000164 | 0.0341 | 14.1 | 0 |
b_log_income_k_par_act | asc_kid_act | -0.00305 | -0.106 | 13.1 | 0 | -0.00245 | -0.082 | 12.7 | 0 |
b_log_income_k_par_act | asc_par_act | -0.0246 | -0.411 | 6.8 | 1.08e-11 | -0.0226 | -0.339 | 6.19 | 6.02e-10 |
b_log_income_k_par_act | b_age_kid_act | 1.01e-05 | 0.00783 | -2.35 | 0.019 | 1.15e-05 | 0.00884 | -2.33 | 0.0197 |
b_log_income_k_par_act | b_age_par_act | 0.000238 | 0.0845 | 3.94 | 8.1e-05 | 2.68e-05 | 0.0101 | 3.85 | 0.000118 |
b_log_income_k_par_act | b_female_kid_act | -1.1e-05 | -0.00206 | 3.69 | 0.000221 | -2.38e-05 | -0.00444 | 3.67 | 0.00024 |
b_log_income_k_par_act | b_female_par_act | -0.000235 | -0.0239 | 1.28 | 0.2 | -0.000371 | -0.0374 | 1.27 | 0.204 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 2.99e-05 | 0.00537 | -2.59 | 0.00946 | 1.11e-05 | 0.00199 | -2.58 | 0.00981 |
b_log_income_k_par_act | b_has_big_sib_par_act | 0.000695 | 0.0676 | 0.159 | 0.874 | 0.000135 | 0.0131 | 0.156 | 0.876 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 6.41e-05 | 0.0115 | -1.4 | 0.16 | 4.63e-06 | 0.000824 | -1.39 | 0.165 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 0.000246 | 0.0239 | -1.42 | 0.156 | 0.000621 | 0.0601 | -1.44 | 0.149 |
b_log_income_k_par_act | b_log_density_kid_act | 2.4e-05 | 0.0116 | -1.37 | 0.17 | 2.16e-05 | 0.00992 | -1.36 | 0.175 |
b_log_income_k_par_act | b_log_density_par_act | 0.000201 | 0.0419 | -3.52 | 0.000434 | -7.08e-06 | -0.00125 | -3.17 | 0.0015 |
b_log_income_k_par_act | b_log_distance_kid_act | -3.97e-05 | -0.0086 | 17.4 | 0 | 0.00019 | 0.0394 | 17.5 | 0 |
b_log_income_k_par_act | b_log_distance_par_act | -0.000608 | -0.0753 | 13.1 | 0 | -0.000862 | -0.103 | 12.7 | 0 |
b_log_income_k_par_act | b_log_income_k_kid_act | 0.000652 | 0.209 | 1.46 | 0.145 | 0.000573 | 0.182 | 1.43 | 0.152 |
b_non_work_dad_kid_ace | asc_kid_act | -0.00421 | -0.0928 | 12.2 | 0 | -0.0058 | -0.125 | 11.8 | 0 |
b_non_work_dad_kid_ace | asc_par_act | -0.00199 | -0.0211 | 6.77 | 1.32e-11 | -0.00222 | -0.0214 | 6.12 | 9.37e-10 |
b_non_work_dad_kid_ace | b_age_kid_act | -0.000127 | -0.063 | -2.98 | 0.00292 | -0.000112 | -0.0554 | -3 | 0.00269 |
b_non_work_dad_kid_ace | b_age_par_act | -4.37e-05 | -0.00987 | 1.15 | 0.251 | 5.63e-05 | 0.0137 | 1.17 | 0.242 |
b_non_work_dad_kid_ace | b_female_kid_act | 0.000104 | 0.0124 | 1.52 | 0.129 | 1.21e-05 | 0.00145 | 1.52 | 0.129 |
b_non_work_dad_kid_ace | b_female_par_act | 0.000157 | 0.0101 | 0.126 | 0.9 | 0.000195 | 0.0126 | 0.126 | 0.9 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | 5.64e-05 | 0.00644 | -3.25 | 0.00117 | 0.000203 | 0.0233 | -3.29 | 0.001 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 4.23e-05 | 0.00261 | -0.832 | 0.405 | 9.89e-05 | 0.0062 | -0.839 | 0.401 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 0.000568 | 0.0649 | -2.4 | 0.0163 | 0.000622 | 0.0714 | -2.42 | 0.0155 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 0.000224 | 0.0138 | -2.2 | 0.0277 | 7.01e-05 | 0.00436 | -2.2 | 0.0277 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 1.95e-05 | 0.00599 | -2.37 | 0.0176 | 0.00015 | 0.0444 | -2.41 | 0.0161 |
b_non_work_dad_kid_ace | b_log_density_par_act | 2.61e-05 | 0.00346 | -3.87 | 0.00011 | 6.65e-05 | 0.00755 | -3.73 | 0.000193 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | 3.35e-05 | 0.0046 | 11.5 | 0 | 2.69e-06 | 0.00036 | 11.5 | 0 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -7.84e-05 | -0.00617 | 10.1 | 0 | -3.69e-07 | -2.83e-05 | 10 | 0 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 0.000749 | 0.153 | -0.536 | 0.592 | 0.000802 | 0.164 | -0.542 | 0.588 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 0.00031 | 0.0362 | -1.29 | 0.195 | 0.000245 | 0.0287 | -1.3 | 0.195 |
b_non_work_dad_par_act | asc_kid_act | -0.00188 | -0.0236 | 12.2 | 0 | -0.002 | -0.0256 | 12 | 0 |
b_non_work_dad_par_act | asc_par_act | -0.0127 | -0.0769 | 6.9 | 5.32e-12 | -0.00991 | -0.0567 | 6.31 | 2.76e-10 |
b_non_work_dad_par_act | b_age_kid_act | -4.18e-05 | -0.0118 | -0.203 | 0.839 | 2.6e-05 | 0.00768 | -0.213 | 0.831 |
b_non_work_dad_par_act | b_age_par_act | -0.00033 | -0.0425 | 2.16 | 0.0306 | -0.00059 | -0.085 | 2.26 | 0.0241 |
b_non_work_dad_par_act | b_female_kid_act | 0.000151 | 0.0103 | 2.4 | 0.0164 | 0.000178 | 0.0127 | 2.51 | 0.0121 |
b_non_work_dad_par_act | b_female_par_act | 0.000638 | 0.0234 | 1.38 | 0.167 | 0.000229 | 0.00884 | 1.42 | 0.156 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 2.05e-05 | 0.00133 | -0.631 | 0.528 | 0.000138 | 0.00942 | -0.661 | 0.509 |
b_non_work_dad_par_act | b_has_big_sib_par_act | 1.13e-05 | 0.000396 | 0.649 | 0.516 | 0.000468 | 0.0174 | 0.678 | 0.498 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 0.000212 | 0.0138 | -0.0525 | 0.958 | 4.75e-05 | 0.00323 | -0.0546 | 0.956 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 0.000947 | 0.0333 | -0.354 | 0.723 | 0.00198 | 0.0733 | -0.374 | 0.709 |
b_non_work_dad_par_act | b_log_density_kid_act | 2.99e-06 | 0.000524 | 0.136 | 0.892 | 5.13e-05 | 0.00899 | 0.143 | 0.886 |
b_non_work_dad_par_act | b_log_density_par_act | -0.000267 | -0.0202 | -0.942 | 0.346 | -0.000265 | -0.0178 | -0.966 | 0.334 |
b_non_work_dad_par_act | b_log_distance_kid_act | -5.05e-05 | -0.00395 | 8.56 | 0 | 0.000143 | 0.0114 | 8.97 | 0 |
b_non_work_dad_par_act | b_log_distance_par_act | -0.00101 | -0.0453 | 8.18 | 2.22e-16 | 0.000328 | 0.0149 | 8.64 | 0 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 0.000323 | 0.0375 | 1.2 | 0.23 | 0.000186 | 0.0226 | 1.26 | 0.209 |
b_non_work_dad_par_act | b_log_income_k_par_act | 0.00176 | 0.117 | 0.652 | 0.515 | 0.00257 | 0.178 | 0.697 | 0.486 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 0.00472 | 0.199 | 1.46 | 0.145 | 0.00403 | 0.18 | 1.5 | 0.133 |
b_non_work_mom_kid_act | asc_kid_act | -0.00431 | -0.143 | 12.5 | 0 | -0.00355 | -0.114 | 12.2 | 0 |
b_non_work_mom_kid_act | asc_par_act | -0.00181 | -0.0289 | 6.79 | 1.11e-11 | -0.00154 | -0.0221 | 6.14 | 8.35e-10 |
b_non_work_mom_kid_act | b_age_kid_act | 7.42e-05 | 0.0552 | -4.67 | 3e-06 | 5.92e-05 | 0.0439 | -4.67 | 3.08e-06 |
b_non_work_mom_kid_act | b_age_par_act | 4.9e-05 | 0.0167 | 1.5 | 0.135 | 6.23e-05 | 0.0226 | 1.52 | 0.129 |
b_non_work_mom_kid_act | b_female_kid_act | -0.000103 | -0.0184 | 1.81 | 0.0696 | -0.000333 | -0.0598 | 1.78 | 0.0754 |
b_non_work_mom_kid_act | b_female_par_act | -4.28e-05 | -0.00416 | 0.061 | 0.951 | -8.95e-05 | -0.00867 | 0.0607 | 0.952 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -3.38e-05 | -0.0058 | -4.26 | 2.07e-05 | -6.69e-06 | -0.00115 | -4.27 | 1.96e-05 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | -6.96e-05 | -0.00646 | -1.02 | 0.306 | 0.000152 | 0.0142 | -1.04 | 0.3 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -0.000373 | -0.0641 | -3.01 | 0.0026 | -0.000359 | -0.0615 | -3.01 | 0.0026 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | -0.000133 | -0.0124 | -2.56 | 0.0106 | -4.09e-05 | -0.0038 | -2.57 | 0.0102 |
b_non_work_mom_kid_act | b_log_density_kid_act | -0.000126 | -0.0584 | -3.54 | 0.000408 | -0.000137 | -0.0604 | -3.52 | 0.00044 |
b_non_work_mom_kid_act | b_log_density_par_act | -1.44e-05 | -0.00287 | -5.21 | 1.89e-07 | -6.72e-05 | -0.0114 | -4.82 | 1.44e-06 |
b_non_work_mom_kid_act | b_log_distance_kid_act | 0.00016 | 0.033 | 15.4 | 0 | 0.000221 | 0.0442 | 15.3 | 0 |
b_non_work_mom_kid_act | b_log_distance_par_act | -6e-05 | -0.0071 | 11.9 | 0 | -2.29e-05 | -0.00263 | 11.7 | 0 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 0.000631 | 0.193 | -0.938 | 0.348 | 0.000494 | 0.151 | -0.92 | 0.358 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 0.000177 | 0.031 | -1.79 | 0.0739 | 0.000135 | 0.0235 | -1.78 | 0.0756 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -0.000275 | -0.0307 | -0.09 | 0.928 | 2.53e-05 | 0.00285 | -0.0919 | 0.927 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -0.000193 | -0.0123 | -1.48 | 0.139 | 0.000106 | 0.00708 | -1.55 | 0.12 |
b_non_work_mom_par_act | asc_kid_act | -0.00138 | -0.0253 | 13.5 | 0 | -0.00116 | -0.0208 | 13.2 | 0 |
b_non_work_mom_par_act | asc_par_act | -0.0165 | -0.145 | 7.23 | 4.96e-13 | -0.00937 | -0.0751 | 6.62 | 3.55e-11 |
b_non_work_mom_par_act | b_age_kid_act | 3.45e-05 | 0.0142 | 1.26 | 0.207 | 4.25e-05 | 0.0175 | 1.27 | 0.203 |
b_non_work_mom_par_act | b_age_par_act | 0.00014 | 0.0262 | 4.66 | 3.17e-06 | 6.51e-05 | 0.0131 | 4.7 | 2.59e-06 |
b_non_work_mom_par_act | b_female_kid_act | -2.08e-05 | -0.00207 | 4.68 | 2.92e-06 | -9.01e-05 | -0.009 | 4.69 | 2.7e-06 |
b_non_work_mom_par_act | b_female_par_act | -0.000917 | -0.0491 | 2.79 | 0.00527 | 7.23e-05 | 0.0039 | 2.87 | 0.00408 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | -8.44e-05 | -0.008 | 0.514 | 0.607 | 0.000138 | 0.0132 | 0.522 | 0.601 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -0.000176 | -0.00901 | 1.91 | 0.0557 | 0.000266 | 0.0139 | 1.95 | 0.0513 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -0.000157 | -0.0149 | 1.3 | 0.194 | -5.55e-05 | -0.00529 | 1.31 | 0.189 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | -0.00222 | -0.114 | 0.638 | 0.524 | -0.00172 | -0.0888 | 0.649 | 0.517 |
b_non_work_mom_par_act | b_log_density_kid_act | -4.44e-05 | -0.0113 | 1.73 | 0.0838 | -7.99e-05 | -0.0196 | 1.74 | 0.0824 |
b_non_work_mom_par_act | b_log_density_par_act | -0.000465 | -0.0512 | 0.105 | 0.917 | -0.00135 | -0.127 | 0.0988 | 0.921 |
b_non_work_mom_par_act | b_log_distance_kid_act | 4.46e-05 | 0.00509 | 13.4 | 0 | 7.52e-05 | 0.00836 | 13.4 | 0 |
b_non_work_mom_par_act | b_log_distance_par_act | -0.000652 | -0.0426 | 11.9 | 0 | -0.000452 | -0.0288 | 11.8 | 0 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 0.000178 | 0.0302 | 3.23 | 0.00125 | 0.000124 | 0.021 | 3.24 | 0.00118 |
b_non_work_mom_par_act | b_log_income_k_par_act | 0.00224 | 0.217 | 2.48 | 0.0132 | 0.00179 | 0.174 | 2.44 | 0.0146 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -0.000193 | -0.0119 | 2.9 | 0.00373 | 0.000119 | 0.00743 | 2.95 | 0.00316 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -0.000856 | -0.03 | 0.874 | 0.382 | 0.000902 | 0.0335 | 0.934 | 0.35 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 0.00203 | 0.188 | 3.71 | 0.00021 | 0.00205 | 0.191 | 3.74 | 0.000184 |
b_veh_per_driver_kid_act | asc_kid_act | -0.00581 | -0.183 | 12.2 | 0 | -0.0064 | -0.186 | 11.8 | 0 |
b_veh_per_driver_kid_act | asc_par_act | -0.00154 | -0.0234 | 6.71 | 1.98e-11 | -0.00118 | -0.0152 | 6.06 | 1.36e-09 |
b_veh_per_driver_kid_act | b_age_kid_act | -4.25e-05 | -0.0301 | -5.18 | 2.18e-07 | -2.19e-05 | -0.0146 | -4.93 | 8.11e-07 |
b_veh_per_driver_kid_act | b_age_par_act | -5.73e-05 | -0.0185 | 0.666 | 0.506 | -3.81e-05 | -0.0124 | 0.644 | 0.52 |
b_veh_per_driver_kid_act | b_female_kid_act | 8.17e-05 | 0.014 | 1.16 | 0.244 | 4.2e-05 | 0.00677 | 1.12 | 0.262 |
b_veh_per_driver_kid_act | b_female_par_act | 0.000104 | 0.00959 | -0.376 | 0.707 | 8.48e-05 | 0.00739 | -0.369 | 0.712 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 0.000145 | 0.0237 | -4.83 | 1.38e-06 | -5.87e-06 | -0.000906 | -4.63 | 3.74e-06 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | 5.06e-06 | 0.000447 | -1.43 | 0.151 | 9.95e-05 | 0.00837 | -1.42 | 0.154 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | -5.57e-05 | -0.0091 | -3.62 | 0.000294 | -0.000218 | -0.0335 | -3.47 | 0.00053 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | -3.99e-05 | -0.00352 | -2.95 | 0.00315 | -4.64e-05 | -0.00388 | -2.91 | 0.00357 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 0.000149 | 0.0654 | -4.32 | 1.55e-05 | 0.00012 | 0.0477 | -4.07 | 4.72e-05 |
b_veh_per_driver_kid_act | b_log_density_par_act | 7.66e-06 | 0.00145 | -5.72 | 1.07e-08 | -1.22e-05 | -0.00185 | -5.17 | 2.4e-07 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 7.56e-05 | 0.0149 | 14.1 | 0 | 0.000129 | 0.0231 | 13.5 | 0 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 0.000325 | 0.0366 | 11.5 | 0 | 0.000396 | 0.0408 | 11 | 0 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -0.000538 | -0.157 | -1.47 | 0.14 | -0.000555 | -0.153 | -1.42 | 0.157 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -0.000154 | -0.0257 | -2.3 | 0.0214 | -0.000196 | -0.0308 | -2.22 | 0.0264 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 0.000399 | 0.0423 | -0.58 | 0.562 | 0.000318 | 0.0321 | -0.57 | 0.569 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 0.000225 | 0.0136 | -1.79 | 0.073 | 3.26e-05 | 0.00196 | -1.85 | 0.0647 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | 0.000141 | 0.0225 | -0.612 | 0.54 | 0.000361 | 0.0545 | -0.605 | 0.545 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | 7.11e-05 | 0.00626 | -3.79 | 0.000152 | 0.000139 | 0.0117 | -3.77 | 0.000166 |
b_veh_per_driver_par_act | asc_kid_act | -0.00243 | -0.0324 | 9.29 | 0 | -0.00202 | -0.022 | 8.77 | 0 |
b_veh_per_driver_par_act | asc_par_act | -0.0307 | -0.197 | 5.23 | 1.71e-07 | -0.0583 | -0.283 | 4.6 | 4.23e-06 |
b_veh_per_driver_par_act | b_age_kid_act | -1.2e-05 | -0.00361 | -7.1 | 1.21e-12 | -6.22e-06 | -0.00155 | -5.97 | 2.44e-09 |
b_veh_per_driver_par_act | b_age_par_act | 0.000252 | 0.0344 | -4.51 | 6.57e-06 | 0.000597 | 0.0729 | -3.83 | 0.000131 |
b_veh_per_driver_par_act | b_female_kid_act | 7.36e-05 | 0.00533 | -3.96 | 7.44e-05 | 3.04e-05 | 0.00184 | -3.38 | 0.000725 |
b_veh_per_driver_par_act | b_female_par_act | 0.000956 | 0.0374 | -4.33 | 1.48e-05 | 0.0014 | 0.0457 | -3.83 | 0.000129 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | 5.08e-05 | 0.00351 | -7.11 | 1.14e-12 | 0.000209 | 0.0121 | -6.1 | 1.05e-09 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | -0.000335 | -0.0125 | -4.89 | 9.9e-07 | 0.000826 | 0.026 | -4.42 | 1.01e-05 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | 1.26e-06 | 8.68e-05 | -6.5 | 8.29e-11 | 2.38e-05 | 0.00138 | -5.56 | 2.73e-08 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -0.000793 | -0.0296 | -5.88 | 4.22e-09 | 0.00066 | 0.0207 | -5.33 | 1e-07 |
b_veh_per_driver_par_act | b_log_density_kid_act | 2.35e-05 | 0.00437 | -6.71 | 2e-11 | 4.9e-05 | 0.00728 | -5.64 | 1.71e-08 |
b_veh_per_driver_par_act | b_log_density_par_act | 0.00118 | 0.0949 | -7.78 | 7.11e-15 | 0.00222 | 0.127 | -6.6 | 4.14e-11 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.000108 | 0.00899 | 2.49 | 0.0129 | -4.84e-05 | -0.00326 | 2.1 | 0.0354 |
b_veh_per_driver_par_act | b_log_distance_par_act | 0.00017 | 0.00808 | 2.73 | 0.00634 | -0.0018 | -0.0695 | 2.29 | 0.0219 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -0.000116 | -0.0143 | -5.48 | 4.31e-08 | -0.000269 | -0.0277 | -4.62 | 3.91e-06 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -0.00399 | -0.282 | -5.32 | 1.05e-07 | -0.00512 | -0.301 | -4.57 | 4.95e-06 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 0.000225 | 0.0101 | -4.55 | 5.27e-06 | -2.67e-06 | -0.000101 | -3.97 | 7.24e-05 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 0.00319 | 0.0814 | -4.95 | 7.51e-07 | -0.00135 | -0.0304 | -4.36 | 1.29e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | 4.56e-05 | 0.00308 | -4.86 | 1.18e-06 | 0.000183 | 0.0104 | -4.17 | 3.03e-05 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | 0.00103 | 0.0384 | -6.64 | 3.2e-11 | 0.0017 | 0.0536 | -5.92 | 3.14e-09 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 0.00258 | 0.165 | -4.79 | 1.71e-06 | 0.00241 | 0.123 | -4 | 6.47e-05 |
b_y2017_kid_act | asc_kid_act | -0.00282 | -0.0961 | 12.4 | 0 | -0.00439 | -0.147 | 12 | 0 |
b_y2017_kid_act | asc_par_act | -0.00359 | -0.0588 | 6.68 | 2.42e-11 | -0.00251 | -0.0376 | 6.05 | 1.49e-09 |
b_y2017_kid_act | b_age_kid_act | 1.85e-05 | 0.0141 | -5.77 | 7.79e-09 | 0.000156 | 0.12 | -5.99 | 2.15e-09 |
b_y2017_kid_act | b_age_par_act | 0.000141 | 0.0493 | 0.594 | 0.552 | 0.000105 | 0.0396 | 0.605 | 0.545 |
b_y2017_kid_act | b_female_kid_act | 0.000114 | 0.0211 | 1.11 | 0.267 | -6.11e-05 | -0.0114 | 1.1 | 0.272 |
b_y2017_kid_act | b_female_par_act | -0.000127 | -0.0127 | -0.451 | 0.652 | -0.000215 | -0.0216 | -0.45 | 0.653 |
b_y2017_kid_act | b_has_big_sib_kid_act | 0.000307 | 0.0542 | -5.21 | 1.88e-07 | 0.000498 | 0.0889 | -5.34 | 9.21e-08 |
b_y2017_kid_act | b_has_big_sib_par_act | 0.000237 | 0.0226 | -1.55 | 0.122 | 0.000168 | 0.0163 | -1.55 | 0.121 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 0.000684 | 0.121 | -4.15 | 3.37e-05 | 0.000634 | 0.113 | -4.15 | 3.39e-05 |
b_y2017_kid_act | b_has_lil_sib_par_act | 0.000314 | 0.0299 | -3.12 | 0.0018 | 0.000329 | 0.0318 | -3.14 | 0.00171 |
b_y2017_kid_act | b_log_density_kid_act | -4.7e-05 | -0.0223 | -4.64 | 3.57e-06 | -1.39e-05 | -0.00638 | -4.68 | 2.85e-06 |
b_y2017_kid_act | b_log_density_par_act | 3.63e-05 | 0.00744 | -6.11 | 9.68e-10 | 1.32e-05 | 0.00233 | -5.68 | 1.31e-08 |
b_y2017_kid_act | b_log_distance_kid_act | -0.000489 | -0.104 | 13.9 | 0 | -0.000493 | -0.102 | 13.8 | 0 |
b_y2017_kid_act | b_log_distance_par_act | -0.00101 | -0.123 | 10.9 | 0 | -0.000746 | -0.0888 | 10.8 | 0 |
b_y2017_kid_act | b_log_income_k_kid_act | 5.84e-06 | 0.00184 | -1.79 | 0.0731 | -2.87e-05 | -0.0091 | -1.8 | 0.072 |
b_y2017_kid_act | b_log_income_k_par_act | -2.49e-05 | -0.00449 | -2.53 | 0.0115 | -0.000122 | -0.0221 | -2.51 | 0.012 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 6.26e-05 | 0.00716 | -0.664 | 0.506 | 0.000101 | 0.0118 | -0.672 | 0.502 |
b_y2017_kid_act | b_non_work_dad_par_act | -5.54e-05 | -0.00361 | -1.85 | 0.0642 | -0.000532 | -0.0369 | -1.91 | 0.0555 |
b_y2017_kid_act | b_non_work_mom_kid_act | 0.00016 | 0.0276 | -0.742 | 0.458 | 9.42e-06 | 0.00164 | -0.738 | 0.461 |
b_y2017_kid_act | b_non_work_mom_par_act | -1.35e-05 | -0.00128 | -3.91 | 9.08e-05 | 5.16e-05 | 0.00501 | -3.96 | 7.43e-05 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -6.65e-05 | -0.0109 | -0.0993 | 0.921 | -3.16e-05 | -0.00495 | -0.0971 | 0.923 |
b_y2017_kid_act | b_veh_per_driver_par_act | -0.000114 | -0.00787 | 4.48 | 7.59e-06 | 0.000133 | 0.00781 | 3.85 | 0.000116 |
b_y2017_par_act | asc_kid_act | -0.00106 | -0.0142 | 18.1 | 0 | -0.000168 | -0.00221 | 17.8 | 0 |
b_y2017_par_act | asc_par_act | -0.038 | -0.245 | 9.53 | 0 | -0.0467 | -0.274 | 8.64 | 0 |
b_y2017_par_act | b_age_kid_act | 5.2e-05 | 0.0157 | 12.8 | 0 | 6.05e-05 | 0.0183 | 12.9 | 0 |
b_y2017_par_act | b_age_par_act | -0.000533 | -0.0732 | 14.9 | 0 | -0.000152 | -0.0224 | 15.2 | 0 |
b_y2017_par_act | b_female_kid_act | 2.04e-05 | 0.00148 | 14.8 | 0 | -0.00019 | -0.0139 | 14.8 | 0 |
b_y2017_par_act | b_female_par_act | 5.62e-05 | 0.00221 | 12.2 | 0 | 0.0026 | 0.103 | 12.8 | 0 |
b_y2017_par_act | b_has_big_sib_kid_act | 6.28e-05 | 0.00436 | 11.5 | 0 | 0.000132 | 0.00926 | 11.6 | 0 |
b_y2017_par_act | b_has_big_sib_par_act | 0.00163 | 0.0614 | 11.6 | 0 | 0.000158 | 0.00602 | 11.4 | 0 |
b_y2017_par_act | b_has_lil_sib_kid_act | 0.000169 | 0.0117 | 12.2 | 0 | 7.66e-05 | 0.00534 | 12.2 | 0 |
b_y2017_par_act | b_has_lil_sib_par_act | 0.00289 | 0.108 | 10.8 | 0 | 0.00275 | 0.104 | 10.8 | 0 |
b_y2017_par_act | b_log_density_kid_act | -8.85e-05 | -0.0166 | 13.1 | 0 | -6.3e-05 | -0.0113 | 13.1 | 0 |
b_y2017_par_act | b_log_density_par_act | 0.000895 | 0.0722 | 11.6 | 0 | -0.000482 | -0.0332 | 11.1 | 0 |
b_y2017_par_act | b_log_distance_kid_act | -0.000173 | -0.0145 | 21.4 | 0 | 6.73e-05 | 0.00548 | 21.6 | 0 |
b_y2017_par_act | b_log_distance_par_act | -0.00499 | -0.239 | 18.3 | 0 | -0.00637 | -0.297 | 17.9 | 0 |
b_y2017_par_act | b_log_income_k_kid_act | 4.28e-07 | 5.31e-05 | 14 | 0 | -0.000182 | -0.0226 | 14.1 | 0 |
b_y2017_par_act | b_log_income_k_par_act | -0.000323 | -0.0229 | 12.8 | 0 | 0.00239 | 0.17 | 13.8 | 0 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.000103 | -0.00466 | 12.5 | 0 | -0.000695 | -0.0318 | 12.5 | 0 |
b_y2017_par_act | b_non_work_dad_par_act | 0.00126 | 0.0323 | 9.09 | 0 | 0.00143 | 0.0389 | 9.39 | 0 |
b_y2017_par_act | b_non_work_mom_kid_act | -1.61e-05 | -0.00109 | 13.7 | 0 | -3.09e-05 | -0.00212 | 13.8 | 0 |
b_y2017_par_act | b_non_work_mom_par_act | 0.00122 | 0.0458 | 9.84 | 0 | 0.00312 | 0.119 | 10.3 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_act | 1.56e-05 | 0.001 | 13.9 | 0 | 1.02e-05 | 0.000626 | 13.9 | 0 |
b_y2017_par_act | b_veh_per_driver_par_act | -0.00104 | -0.0283 | 13.9 | 0 | 0.00286 | 0.066 | 13.3 | 0 |
b_y2017_par_act | b_y2017_kid_act | 0.00247 | 0.172 | 15 | 0 | 0.0023 | 0.164 | 15.1 | 0 |
Smallest eigenvalue: 1.48067
+Largest eigenvalue: 163718
+Condition number: 110570
+ \ No newline at end of file diff --git a/models/IATBR plan/3 alternatives/no-nest/no_nests3.pickle b/models/IATBR plan/3 alternatives/no-nest/no_nests3.pickle new file mode 100644 index 0000000..5e00185 Binary files /dev/null and b/models/IATBR plan/3 alternatives/no-nest/no_nests3.pickle differ diff --git a/models/IATBR plan/4 alternatives/car-nest/__mode_nests.iter b/models/IATBR plan/4 alternatives/car-nest/__mode_nests.iter new file mode 100644 index 0000000..c79e32e --- /dev/null +++ b/models/IATBR plan/4 alternatives/car-nest/__mode_nests.iter @@ -0,0 +1,37 @@ +asc_kid_act = -5.222448172681874 +asc_kid_car = -0.07087355956289768 +asc_par_act = -5.679450313492681 +b_age_kid_act = 24.28886185071036 +b_age_kid_car = 0.25613147408125697 +b_age_par_act = -25.04762643728083 +b_female_kid_act = -31.6558450719002 +b_female_kid_car = -0.34378561619175874 +b_female_par_act = -13.250882740507787 +b_has_big_sib_kid_act = 33.940976962143914 +b_has_big_sib_kid_car = 0.9928260472858562 +b_has_big_sib_par_act = 4.1701905970628115 +b_has_lil_sib_kid_act = 21.374134902175506 +b_has_lil_sib_kid_car = 1.0820273194326502 +b_has_lil_sib_par_act = 28.814256295751537 +b_log_density_kid_act = 17.283187155348795 +b_log_density_kid_car = -0.14827266925569663 +b_log_density_par_act = 40.35571746318707 +b_log_distance_kid_act = -162.8236933631238 +b_log_distance_kid_car = -0.33449897486445446 +b_log_distance_par_act = -172.81736626756557 +b_log_income_k_kid_act = -4.727591114352415 +b_log_income_k_kid_car = -0.0736139918967267 +b_log_income_k_par_act = 6.500845427344935 +b_non_work_dad_kid_ace = -11.028888580242846 +b_non_work_dad_kid_car = -0.21044092591621627 +b_non_work_dad_par_act = 20.058150622892594 +b_non_work_mom_kid_act = -12.413240113817803 +b_non_work_mom_kid_car = -1.2402888842219726 +b_non_work_mom_par_act = 41.90797891686838 +b_veh_per_driver_kid_act = -18.97361716314473 +b_veh_per_driver_kid_car = 0.6482841060232041 +b_veh_per_driver_par_act = -112.61511180353786 +b_y2017_kid_act = -20.210343234320277 +b_y2017_kid_car = -0.3569399358523622 +b_y2017_par_act = 269.7437522264142 +mu_car = 43.76485854903007 diff --git a/models/IATBR plan/4 alternatives/car-nest/biogeme.toml b/models/IATBR plan/4 alternatives/car-nest/biogeme.toml new file mode 100644 index 0000000..e600d5b --- /dev/null +++ b/models/IATBR plan/4 alternatives/car-nest/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on April 09, 2024. 16:22:15 + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 1000 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + diff --git a/models/IATBR plan/4 alternatives/car-nest/mode_nests.html b/models/IATBR plan/4 alternatives/car-nest/mode_nests.html new file mode 100644 index 0000000..1bbc259 --- /dev/null +++ b/models/IATBR plan/4 alternatives/car-nest/mode_nests.html @@ -0,0 +1,769 @@ + + + + +biogeme 3.2.13 [2024-04-09]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-09 16:25:24.078182
+Report file: | mode_nests.html |
Database name: | est |
It seems that the optimization algorithm did not converge. Therefore, the results below do not correspond to the maximum likelihood estimator. Check the specification of the model, or the criteria for convergence of the algorithm.
Number of estimated parameters: | 37 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -6806.705 |
Final log likelihood: | -4220.381 |
Likelihood ratio test for the init. model: | 5172.648 |
Rho-square for the init. model: | 0.38 |
Rho-square-bar for the init. model: | 0.375 |
Akaike Information Criterion: | 8514.762 |
Bayesian Information Criterion: | 8755.226 |
Final gradient norm: | 1.8786E+00 |
Nbr of threads: | 12 |
Algorithm: | Newton with trust region for simple bound constraints |
Cause of termination: | Maximum number of iterations reached: 100 |
Number of iterations: | 100 |
Proportion of Hessian calculation: | 66/66 = 100.0% |
Optimization time: | 0:03:06.326066 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
asc_kid_act | -5.22 | 0.402 | -13 | 0 |
asc_kid_car | -0.52 | 0.108 | -4.83 | 1.36e-06 |
asc_par_act | -5.68 | 0.901 | -6.3 | 2.93e-10 |
b_age_kid_act | 24.5 | 1.75 | 14 | 0 |
b_age_kid_car | 1.88 | 0.535 | 3.52 | 0.000435 |
b_age_par_act | -24.9 | 3.58 | -6.95 | 3.57e-12 |
b_female_kid_act | -31.9 | 7.23 | -4.41 | 1.01e-05 |
b_female_kid_car | -2.5 | 1.91 | -1.31 | 0.191 |
b_female_par_act | -13.5 | 13.4 | -1.01 | 0.315 |
b_has_big_sib_kid_act | 34.7 | 7.55 | 4.6 | 4.3e-06 |
b_has_big_sib_kid_car | 7.29 | 2.22 | 3.28 | 0.00104 |
b_has_big_sib_par_act | 4.79 | 13.9 | 0.345 | 0.73 |
b_has_lil_sib_kid_act | 22.2 | 7.58 | 2.93 | 0.00341 |
b_has_lil_sib_kid_car | 7.91 | 2.14 | 3.69 | 0.000224 |
b_has_lil_sib_par_act | 29.5 | 13.9 | 2.11 | 0.0345 |
b_log_density_kid_act | 17.2 | 2.94 | 5.83 | 5.44e-09 |
b_log_density_kid_car | -1.07 | 0.676 | -1.59 | 0.112 |
b_log_density_par_act | 40.3 | 7.65 | 5.26 | 1.43e-07 |
b_log_distance_kid_act | -163 | 6.5 | -25.1 | 0 |
b_log_distance_kid_car | -2.5 | 1.99 | -1.26 | 0.208 |
b_log_distance_par_act | -173 | 11.3 | -15.3 | 0 |
b_log_income_k_kid_act | -4.81 | 4.24 | -1.13 | 0.258 |
b_log_income_k_kid_car | -0.552 | 1.25 | -0.442 | 0.658 |
b_log_income_k_par_act | 6.45 | 7.42 | 0.869 | 0.385 |
b_non_work_dad_kid_ace | -11.2 | 11.5 | -0.968 | 0.333 |
b_non_work_dad_kid_car | -1.51 | 3.33 | -0.454 | 0.65 |
b_non_work_dad_par_act | 20 | 19.4 | 1.03 | 0.304 |
b_non_work_mom_kid_act | -13.3 | 7.71 | -1.72 | 0.0848 |
b_non_work_mom_kid_car | -9.08 | 2.33 | -3.89 | 9.85e-05 |
b_non_work_mom_par_act | 41.2 | 13.9 | 2.97 | 0.00298 |
b_veh_per_driver_kid_act | -18.4 | 8.59 | -2.14 | 0.032 |
b_veh_per_driver_kid_car | 4.67 | 1.9 | 2.46 | 0.0141 |
b_veh_per_driver_par_act | -112 | 22.9 | -4.9 | 9.58e-07 |
b_y2017_kid_act | -20.5 | 7.43 | -2.76 | 0.00582 |
b_y2017_kid_car | -2.69 | 2.09 | -1.29 | 0.198 |
b_y2017_par_act | 270 | 19 | 14.2 | 0 |
mu_car | 5.97 | 0.521 | 11.4 | 0 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_kid_car | asc_kid_act | 0.000536 | 0.00306 | 7.91 | 2.44e-15 | 0.00143 | 0.033 | 11.4 | 0 |
asc_par_act | asc_kid_act | 0.0534 | 0.168 | -0.542 | 0.588 | 0.0551 | 0.152 | -0.49 | 0.624 |
asc_par_act | asc_kid_car | -0.000634 | -0.00174 | -5.55 | 2.84e-08 | 0.00107 | 0.0111 | -5.69 | 1.25e-08 |
b_age_kid_act | asc_kid_act | -0.373 | -0.545 | 14.9 | 0 | -0.376 | -0.534 | 14.9 | 0 |
b_age_kid_act | asc_kid_car | -0.0876 | -0.111 | 13.5 | 0 | -0.00323 | -0.0172 | 14.3 | 0 |
b_age_kid_act | asc_par_act | -0.109 | -0.0768 | 15.2 | 0 | -0.124 | -0.0789 | 14.9 | 0 |
b_age_kid_car | asc_kid_act | -0.000131 | -0.000202 | 4.18 | 2.87e-05 | -0.000452 | -0.0021 | 10.6 | 0 |
b_age_kid_car | asc_kid_car | -0.718 | -0.969 | 1.15 | 0.251 | -0.0363 | -0.631 | 3.95 | 7.95e-05 |
b_age_kid_car | asc_par_act | 0.00374 | 0.00279 | 4.11 | 3.96e-05 | 0.00141 | 0.00293 | 7.22 | 5.04e-13 |
b_age_kid_car | b_age_kid_act | 0.334 | 0.115 | -9.98 | 0 | 0.0113 | 0.0121 | -12.4 | 0 |
b_age_par_act | asc_kid_act | -0.136 | -0.0909 | -5.08 | 3.81e-07 | -0.132 | -0.0916 | -5.41 | 6.46e-08 |
b_age_par_act | asc_kid_car | -0.0729 | -0.0426 | -6.31 | 2.82e-10 | -0.00335 | -0.0087 | -6.8 | 1.02e-11 |
b_age_par_act | asc_par_act | -1.37 | -0.44 | -4.53 | 5.84e-06 | -1.4 | -0.433 | -4.74 | 2.12e-06 |
b_age_par_act | b_age_kid_act | 1.09 | 0.164 | -12.6 | 0 | 0.99 | 0.158 | -13.2 | 0 |
b_age_par_act | b_age_kid_car | 0.277 | 0.0439 | -6.54 | 6.13e-11 | -0.00088 | -0.00046 | -7.4 | 1.4e-13 |
b_female_kid_act | asc_kid_act | -0.16 | -0.0566 | -3.68 | 0.00023 | -0.158 | -0.0544 | -3.68 | 0.000238 |
b_female_kid_act | asc_kid_car | 0.105 | 0.0325 | -4.35 | 1.34e-05 | 0.000676 | 0.00087 | -4.34 | 1.41e-05 |
b_female_kid_act | asc_par_act | -0.0798 | -0.0136 | -3.61 | 0.000307 | -0.000601 | -9.23e-05 | -3.6 | 0.000317 |
b_female_kid_act | b_age_kid_act | -0.0489 | -0.00387 | -7.59 | 3.15e-14 | -0.174 | -0.0138 | -7.56 | 4.06e-14 |
b_female_kid_act | b_age_kid_car | -0.389 | -0.0327 | -4.54 | 5.76e-06 | -0.0266 | -0.00689 | -4.66 | 3.18e-06 |
b_female_kid_act | b_age_par_act | -0.0229 | -0.000832 | -0.861 | 0.389 | -0.608 | -0.0235 | -0.863 | 0.388 |
b_female_kid_car | asc_kid_act | -0.00557 | -0.00501 | 0.948 | 0.343 | -0.00544 | -0.00708 | 1.4 | 0.163 |
b_female_kid_car | asc_kid_car | 0.891 | 0.697 | -0.773 | 0.439 | -0.017 | -0.0828 | -1.03 | 0.304 |
b_female_kid_car | asc_par_act | -0.00965 | -0.00417 | 1.07 | 0.283 | -0.0133 | -0.00774 | 1.5 | 0.133 |
b_female_kid_car | b_age_kid_act | -0.403 | -0.0808 | -7.8 | 6.44e-15 | -0.00337 | -0.00101 | -10.4 | 0 |
b_female_kid_car | b_age_kid_car | -3.28 | -0.697 | -1.05 | 0.294 | 0.0528 | 0.0517 | -2.24 | 0.0252 |
b_female_kid_car | b_age_par_act | -0.334 | -0.0308 | 4.63 | 3.59e-06 | 0.0113 | 0.00166 | 5.52 | 3.31e-08 |
b_female_kid_car | b_female_kid_act | 0.965 | 0.047 | 3.86 | 0.000115 | 0.471 | 0.0341 | 3.97 | 7.26e-05 |
b_female_par_act | asc_kid_act | -0.0752 | -0.0144 | -0.616 | 0.538 | 0.0108 | 0.00201 | -0.615 | 0.539 |
b_female_par_act | asc_kid_car | 0.0846 | 0.0141 | -0.969 | 0.332 | 0.00731 | 0.00508 | -0.966 | 0.334 |
b_female_par_act | asc_par_act | -0.663 | -0.0611 | -0.58 | 0.562 | -0.928 | -0.077 | -0.577 | 0.564 |
b_female_par_act | b_age_kid_act | 0.142 | 0.00608 | -2.82 | 0.00478 | -0.33 | -0.0141 | -2.81 | 0.00502 |
b_female_par_act | b_age_kid_car | -0.311 | -0.0141 | -1.14 | 0.255 | -0.0302 | -0.00422 | -1.14 | 0.252 |
b_female_par_act | b_age_par_act | 0.34 | 0.00667 | 0.825 | 0.409 | 3.7 | 0.0773 | 0.842 | 0.4 |
b_female_par_act | b_female_kid_act | 18.2 | 0.189 | 1.33 | 0.185 | 18.4 | 0.19 | 1.32 | 0.186 |
b_female_par_act | b_female_kid_car | 0.775 | 0.0204 | -0.806 | 0.42 | 0.414 | 0.0162 | -0.812 | 0.417 |
b_has_big_sib_kid_act | asc_kid_act | -0.634 | -0.214 | 5.2 | 2e-07 | -0.613 | -0.202 | 5.22 | 1.74e-07 |
b_has_big_sib_kid_act | asc_kid_car | -0.328 | -0.0963 | 4.61 | 4.05e-06 | 0.00571 | 0.00703 | 4.67 | 3.08e-06 |
b_has_big_sib_kid_act | asc_par_act | -0.199 | -0.0323 | 5.27 | 1.33e-07 | -0.184 | -0.027 | 5.29 | 1.2e-07 |
b_has_big_sib_kid_act | b_age_kid_act | 2.39 | 0.18 | 1.37 | 0.172 | 1.82 | 0.138 | 1.36 | 0.174 |
b_has_big_sib_kid_act | b_age_kid_car | 1.19 | 0.0951 | 4.31 | 1.61e-05 | -0.113 | -0.0281 | 4.33 | 1.51e-05 |
b_has_big_sib_kid_act | b_age_par_act | 0.783 | 0.0271 | 7.09 | 1.3e-12 | 0.838 | 0.031 | 7.22 | 5.22e-13 |
b_has_big_sib_kid_act | b_female_kid_act | -1.91 | -0.0349 | 6.26 | 3.96e-10 | -1.25 | -0.023 | 6.3 | 2.96e-10 |
b_has_big_sib_kid_act | b_female_kid_car | -1.55 | -0.0719 | 4.49 | 7.27e-06 | -0.00949 | -0.000659 | 4.78 | 1.79e-06 |
b_has_big_sib_kid_act | b_female_par_act | -0.48 | -0.00474 | 3.13 | 0.00174 | -0.735 | -0.00727 | 3.12 | 0.00179 |
b_has_big_sib_kid_car | asc_kid_act | 0.00547 | 0.00216 | 1.93 | 0.0541 | 0.00779 | 0.00871 | 5.55 | 2.92e-08 |
b_has_big_sib_kid_car | asc_kid_car | -2.73 | -0.939 | 1.13 | 0.258 | -0.0849 | -0.355 | 3.45 | 0.00056 |
b_has_big_sib_kid_car | asc_par_act | 0.0195 | 0.00371 | 1.99 | 0.0471 | 0.0169 | 0.00843 | 5.42 | 5.91e-08 |
b_has_big_sib_kid_car | b_age_kid_act | 1.21 | 0.106 | -2.63 | 0.0085 | -0.0934 | -0.024 | -6.01 | 1.86e-09 |
b_has_big_sib_kid_car | b_age_kid_car | 9.91 | 0.925 | 1.08 | 0.279 | 0.431 | 0.363 | 2.59 | 0.00963 |
b_has_big_sib_kid_car | b_age_par_act | 1 | 0.0406 | 4.35 | 1.34e-05 | -0.115 | -0.0145 | 7.59 | 3.24e-14 |
b_has_big_sib_kid_car | b_female_kid_act | -1.52 | -0.0325 | 3.98 | 6.94e-05 | -0.106 | -0.00657 | 5.17 | 2.3e-07 |
b_has_big_sib_kid_car | b_female_kid_car | -12.9 | -0.7 | 1.12 | 0.262 | 0.0217 | 0.00512 | 3.35 | 0.000812 |
b_has_big_sib_kid_car | b_female_par_act | -1.23 | -0.0142 | 1.39 | 0.164 | -0.122 | -0.00409 | 1.53 | 0.127 |
b_has_big_sib_kid_car | b_has_big_sib_kid_act | 5.05 | 0.103 | -2.9 | 0.00377 | 0.321 | 0.0191 | -3.5 | 0.000465 |
b_has_big_sib_par_act | asc_kid_act | -0.229 | -0.0419 | 0.716 | 0.474 | -0.212 | -0.038 | 0.721 | 0.471 |
b_has_big_sib_par_act | asc_kid_car | -0.267 | -0.0427 | 0.38 | 0.704 | -0.00331 | -0.00222 | 0.383 | 0.702 |
b_has_big_sib_par_act | asc_par_act | -2.16 | -0.191 | 0.74 | 0.459 | -1.64 | -0.131 | 0.747 | 0.455 |
b_has_big_sib_par_act | b_age_kid_act | 0.692 | 0.0283 | -1.41 | 0.16 | 0.721 | 0.0298 | -1.42 | 0.157 |
b_has_big_sib_par_act | b_age_kid_car | 0.966 | 0.0419 | 0.208 | 0.835 | -0.0751 | -0.0101 | 0.209 | 0.834 |
b_has_big_sib_par_act | b_age_par_act | 5.74 | 0.108 | 2.11 | 0.0349 | 4.27 | 0.0861 | 2.12 | 0.0342 |
b_has_big_sib_par_act | b_female_kid_act | -0.653 | -0.00649 | 2.33 | 0.0198 | -0.684 | -0.00683 | 2.34 | 0.0192 |
b_has_big_sib_par_act | b_female_kid_car | -1.27 | -0.0319 | 0.508 | 0.611 | -0.00863 | -0.000326 | 0.52 | 0.603 |
b_has_big_sib_par_act | b_female_par_act | -4.39 | -0.0236 | 0.934 | 0.35 | -10.9 | -0.0587 | 0.92 | 0.358 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 20.8 | 0.196 | -2.06 | 0.0394 | 21 | 0.201 | -2.08 | 0.0377 |
b_has_big_sib_par_act | b_has_big_sib_kid_car | 4.11 | 0.0455 | -0.166 | 0.868 | 0.355 | 0.0115 | -0.179 | 0.858 |
b_has_lil_sib_kid_act | asc_kid_act | -0.514 | -0.174 | 3.58 | 0.000348 | -0.507 | -0.166 | 3.58 | 0.000343 |
b_has_lil_sib_kid_act | asc_kid_car | -0.351 | -0.103 | 2.97 | 0.00298 | -0.00357 | -0.00438 | 3 | 0.00273 |
b_has_lil_sib_kid_act | asc_par_act | -0.2 | -0.0324 | 3.64 | 0.000273 | -0.136 | -0.0199 | 3.64 | 0.000269 |
b_has_lil_sib_kid_act | b_age_kid_act | 0.389 | 0.0293 | -0.298 | 0.766 | 0.0762 | 0.00576 | -0.297 | 0.766 |
b_has_lil_sib_kid_act | b_age_kid_car | 1.26 | 0.101 | 2.67 | 0.00754 | 0.0501 | 0.0124 | 2.68 | 0.00747 |
b_has_lil_sib_kid_act | b_age_par_act | 0.294 | 0.0101 | 5.57 | 2.61e-08 | -0.386 | -0.0142 | 5.59 | 2.31e-08 |
b_has_lil_sib_kid_act | b_female_kid_act | -0.712 | -0.013 | 5.14 | 2.82e-07 | -1.23 | -0.0225 | 5.11 | 3.25e-07 |
b_has_lil_sib_kid_act | b_female_kid_car | -1.65 | -0.0764 | 2.97 | 0.00296 | -0.0821 | -0.00568 | 3.15 | 0.00161 |
b_has_lil_sib_kid_act | b_female_par_act | -0.165 | -0.00164 | 2.32 | 0.0203 | -0.9 | -0.00888 | 2.31 | 0.021 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 15.4 | 0.267 | -1.36 | 0.173 | 15.1 | 0.263 | -1.36 | 0.173 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_car | 5.01 | 0.102 | 1.57 | 0.116 | 0.184 | 0.0109 | 1.89 | 0.0586 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 6.52 | 0.0616 | 1.12 | 0.261 | 6.8 | 0.0648 | 1.13 | 0.258 |
b_has_lil_sib_kid_car | asc_kid_act | 0.00641 | 0.00236 | 1.88 | 0.0596 | 4.2e-05 | 4.87e-05 | 6.02 | 1.75e-09 |
b_has_lil_sib_kid_car | asc_kid_car | -2.95 | -0.944 | 1.14 | 0.254 | -0.0649 | -0.282 | 3.87 | 0.000107 |
b_has_lil_sib_kid_car | asc_par_act | 0.0213 | 0.00377 | 1.94 | 0.0524 | 0.0114 | 0.00588 | 5.85 | 4.78e-09 |
b_has_lil_sib_kid_car | b_age_kid_act | 1.29 | 0.106 | -2.37 | 0.0179 | 0.0677 | 0.0181 | -6.04 | 1.51e-09 |
b_has_lil_sib_kid_car | b_age_kid_car | 10.6 | 0.92 | 1.1 | 0.271 | 0.0895 | 0.078 | 2.78 | 0.00543 |
b_has_lil_sib_kid_car | b_age_par_act | 1.08 | 0.0405 | 4.2 | 2.63e-05 | 0.00507 | 0.000661 | 7.86 | 3.77e-15 |
b_has_lil_sib_kid_car | b_female_kid_act | -1.63 | -0.0325 | 3.91 | 9.23e-05 | -0.176 | -0.0114 | 5.26 | 1.4e-07 |
b_has_lil_sib_kid_car | b_female_kid_car | -13.9 | -0.699 | 1.13 | 0.257 | 0.171 | 0.0418 | 3.7 | 0.000213 |
b_has_lil_sib_kid_car | b_female_par_act | -1.32 | -0.0142 | 1.41 | 0.158 | -0.122 | -0.00424 | 1.58 | 0.115 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_act | 5.05 | 0.0956 | -2.73 | 0.00625 | 0.185 | 0.0114 | -3.42 | 0.000619 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_car | 42.1 | 0.932 | 0.246 | 0.806 | 1.62 | 0.339 | 0.248 | 0.804 |
b_has_lil_sib_kid_car | b_has_big_sib_par_act | 4.12 | 0.0424 | 0.204 | 0.838 | 0.214 | 0.00719 | 0.223 | 0.823 |
b_has_lil_sib_kid_car | b_has_lil_sib_kid_act | 5.75 | 0.109 | -1.47 | 0.142 | 0.518 | 0.0319 | -1.83 | 0.0676 |
b_has_lil_sib_par_act | asc_kid_act | -0.193 | -0.0354 | 2.48 | 0.0132 | -0.155 | -0.0276 | 2.49 | 0.0129 |
b_has_lil_sib_par_act | asc_kid_car | -0.285 | -0.0454 | 2.14 | 0.0323 | -0.00208 | -0.00139 | 2.15 | 0.0315 |
b_has_lil_sib_par_act | asc_par_act | -1.7 | -0.15 | 2.49 | 0.0128 | -1.93 | -0.154 | 2.49 | 0.0127 |
b_has_lil_sib_par_act | b_age_kid_act | 0.133 | 0.00542 | 0.354 | 0.723 | -0.383 | -0.0157 | 0.354 | 0.723 |
b_has_lil_sib_par_act | b_age_kid_car | 1.02 | 0.0442 | 1.97 | 0.0488 | -0.0148 | -0.00198 | 1.98 | 0.048 |
b_has_lil_sib_par_act | b_age_par_act | 0.853 | 0.016 | 3.77 | 0.000166 | 5.49 | 0.11 | 3.88 | 0.000104 |
b_has_lil_sib_par_act | b_female_kid_act | -0.141 | -0.0014 | 3.9 | 9.64e-05 | -0.752 | -0.00746 | 3.9 | 9.75e-05 |
b_has_lil_sib_par_act | b_female_kid_car | -1.34 | -0.0337 | 2.23 | 0.026 | 0.0623 | 0.00234 | 2.27 | 0.0231 |
b_has_lil_sib_par_act | b_female_par_act | -3.31 | -0.0178 | 2.2 | 0.0277 | -5.79 | -0.031 | 2.19 | 0.0287 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 6.36 | 0.06 | -0.336 | 0.737 | 6.45 | 0.0613 | -0.338 | 0.736 |
b_has_lil_sib_par_act | b_has_big_sib_kid_car | 4.07 | 0.0449 | 1.46 | 0.143 | 0.118 | 0.00379 | 1.57 | 0.116 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 51 | 0.261 | 1.45 | 0.146 | 48.1 | 0.249 | 1.45 | 0.147 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 20.8 | 0.196 | 0.502 | 0.616 | 20.4 | 0.194 | 0.502 | 0.615 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_car | 4.68 | 0.048 | 1.41 | 0.159 | 0.414 | 0.0138 | 1.53 | 0.126 |
b_log_density_kid_act | asc_kid_act | -0.698 | -0.637 | 7.29 | 3.02e-13 | -0.777 | -0.656 | 6.95 | 3.65e-12 |
b_log_density_kid_act | asc_kid_car | 0.0477 | 0.0379 | 6.26 | 3.83e-10 | -0.0068 | -0.0215 | 6 | 1.96e-09 |
b_log_density_kid_act | asc_par_act | -0.26 | -0.114 | 7.59 | 3.15e-14 | -0.326 | -0.123 | 7.18 | 6.99e-13 |
b_log_density_kid_act | b_age_kid_act | 0.15 | 0.0305 | -2.25 | 0.0246 | 0.1 | 0.0195 | -2.16 | 0.0307 |
b_log_density_kid_act | b_age_kid_car | -0.194 | -0.042 | 4.61 | 4.04e-06 | -0.00221 | -0.00141 | 5.11 | 3.25e-07 |
b_log_density_kid_act | b_age_par_act | 0.144 | 0.0135 | 8.93 | 0 | 0.257 | 0.0244 | 9.19 | 0 |
b_log_density_kid_act | b_female_kid_act | -0.612 | -0.0303 | 6.28 | 3.45e-10 | -0.508 | -0.0239 | 6.23 | 4.52e-10 |
b_log_density_kid_act | b_female_kid_car | 0.252 | 0.0316 | 5 | 5.83e-07 | -0.0143 | -0.00255 | 5.6 | 2.16e-08 |
b_log_density_kid_act | b_female_par_act | -0.288 | -0.0077 | 2.24 | 0.025 | -0.151 | -0.00384 | 2.23 | 0.0256 |
b_log_density_kid_act | b_has_big_sib_kid_act | 0.0772 | 0.00363 | -2.17 | 0.0299 | 0.253 | 0.0114 | -2.17 | 0.0298 |
b_log_density_kid_act | b_has_big_sib_kid_car | -0.751 | -0.0413 | 1.38 | 0.169 | 0.0379 | 0.00579 | 2.68 | 0.0073 |
b_log_density_kid_act | b_has_big_sib_par_act | 0.148 | 0.00377 | 0.87 | 0.384 | -0.321 | -0.00788 | 0.871 | 0.384 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 0.157 | 0.00737 | -0.623 | 0.533 | 0.655 | 0.0294 | -0.624 | 0.532 |
b_log_density_kid_act | b_has_lil_sib_kid_car | -0.809 | -0.0414 | 1.21 | 0.225 | -0.131 | -0.0207 | 2.51 | 0.0119 |
b_log_density_kid_act | b_has_lil_sib_par_act | 0.129 | 0.00328 | -0.864 | 0.387 | 0.321 | 0.00783 | -0.866 | 0.387 |
b_log_density_kid_car | asc_kid_act | -0.00736 | -0.0165 | 3.43 | 0.000614 | -0.0101 | -0.0371 | 5.19 | 2.14e-07 |
b_log_density_kid_car | asc_kid_car | 0.35 | 0.685 | -0.621 | 0.534 | -0.0351 | -0.482 | -0.757 | 0.449 |
b_log_density_kid_car | asc_par_act | -0.00801 | -0.00865 | 3.28 | 0.00106 | -0.0121 | -0.0198 | 4.05 | 5.17e-05 |
b_log_density_kid_car | b_age_kid_act | -0.172 | -0.086 | -11.8 | 0 | 0.00917 | 0.00777 | -13.7 | 0 |
b_log_density_kid_car | b_age_kid_car | -1.41 | -0.749 | -1.13 | 0.258 | 0.00351 | 0.00972 | -3.45 | 0.000568 |
b_log_density_kid_car | b_age_par_act | -0.141 | -0.0325 | 5.92 | 3.13e-09 | 0.0245 | 0.0101 | 6.55 | 5.77e-11 |
b_log_density_kid_car | b_female_kid_act | 0.215 | 0.0261 | 4.24 | 2.23e-05 | -0.0307 | -0.00627 | 4.24 | 2.19e-05 |
b_log_density_kid_car | b_female_kid_car | 1.82 | 0.561 | 0.592 | 0.554 | -0.103 | -0.0799 | 0.685 | 0.494 |
b_log_density_kid_car | b_female_par_act | 0.172 | 0.0113 | 0.925 | 0.355 | 0.0486 | 0.00537 | 0.924 | 0.356 |
b_log_density_kid_car | b_has_big_sib_kid_act | -0.653 | -0.0756 | -4.61 | 3.97e-06 | 0.0856 | 0.0168 | -4.73 | 2.28e-06 |
b_log_density_kid_car | b_has_big_sib_kid_car | -5.5 | -0.745 | -1.13 | 0.256 | -0.148 | -0.0985 | -3.51 | 0.000456 |
b_log_density_kid_car | b_has_big_sib_par_act | -0.531 | -0.0334 | -0.418 | 0.676 | 0.0528 | 0.00563 | -0.423 | 0.673 |
b_log_density_kid_car | b_has_lil_sib_kid_act | -0.698 | -0.0808 | -3 | 0.00273 | -0.0617 | -0.0121 | -3.05 | 0.00225 |
b_log_density_kid_car | b_has_lil_sib_kid_car | -5.93 | -0.747 | -1.15 | 0.252 | 0.0388 | 0.0268 | -4.03 | 5.61e-05 |
b_log_density_kid_car | b_has_lil_sib_par_act | -0.565 | -0.0355 | -2.17 | 0.0299 | -0.0185 | -0.00197 | -2.19 | 0.0286 |
b_log_density_kid_car | b_log_density_kid_act | 0.178 | 0.0558 | -6.14 | 8.06e-10 | 0.0907 | 0.0456 | -6.1 | 1.05e-09 |
b_log_density_par_act | asc_kid_act | -0.239 | -0.0942 | 6.95 | 3.7e-12 | -0.319 | -0.104 | 5.9 | 3.57e-09 |
b_log_density_par_act | asc_kid_car | 0.0384 | 0.0132 | 6.27 | 3.68e-10 | -0.00554 | -0.00673 | 5.33 | 9.93e-08 |
b_log_density_par_act | asc_par_act | -3.79 | -0.718 | 6.47 | 9.99e-11 | -5.15 | -0.748 | 5.5 | 3.73e-08 |
b_log_density_par_act | b_age_kid_act | -0.0924 | -0.00812 | 2.34 | 0.0193 | 0.17 | 0.0127 | 2.01 | 0.0439 |
b_log_density_par_act | b_age_kid_car | -0.155 | -0.0145 | 5.7 | 1.16e-08 | -0.00113 | -0.000275 | 5 | 5.65e-07 |
b_log_density_par_act | b_age_par_act | -0.806 | -0.0325 | 8.52 | 0 | 0.764 | 0.0279 | 7.8 | 6.44e-15 |
b_log_density_par_act | b_female_kid_act | -0.109 | -0.00232 | 7.43 | 1.12e-13 | 0.194 | 0.0035 | 6.87 | 6.53e-12 |
b_log_density_par_act | b_female_kid_car | 0.202 | 0.0109 | 6.05 | 1.44e-09 | 0.107 | 0.00735 | 5.43 | 5.62e-08 |
b_log_density_par_act | b_female_par_act | -1.54 | -0.0177 | 3.59 | 0.000326 | -4.97 | -0.0486 | 3.41 | 0.000642 |
b_log_density_par_act | b_has_big_sib_kid_act | -0.0695 | -0.00141 | 0.557 | 0.578 | -0.698 | -0.0121 | 0.515 | 0.607 |
b_log_density_par_act | b_has_big_sib_kid_car | -0.603 | -0.0143 | 3.57 | 0.000363 | -0.0171 | -0.00101 | 4.14 | 3.54e-05 |
b_log_density_par_act | b_has_big_sib_par_act | 1.44 | 0.0158 | 2.32 | 0.0204 | 1.15 | 0.0108 | 2.25 | 0.0244 |
b_log_density_par_act | b_has_lil_sib_kid_act | 0.105 | 0.00213 | 1.81 | 0.07 | 0.295 | 0.00508 | 1.68 | 0.0924 |
b_log_density_par_act | b_has_lil_sib_kid_car | -0.65 | -0.0144 | 3.37 | 0.000746 | -0.159 | -0.00971 | 4.06 | 4.91e-05 |
b_log_density_par_act | b_has_lil_sib_par_act | 1.95 | 0.0215 | 0.705 | 0.481 | -3.69 | -0.0346 | 0.668 | 0.504 |
b_log_density_par_act | b_log_density_kid_act | 2.91 | 0.16 | 3.47 | 0.000516 | 3.48 | 0.155 | 2.98 | 0.00292 |
b_log_density_par_act | b_log_density_kid_car | 0.141 | 0.0191 | 6.29 | 3.24e-10 | 0.0873 | 0.0169 | 5.39 | 7.1e-08 |
b_log_distance_kid_act | asc_kid_act | 0.666 | 0.272 | -25.5 | 0 | 0.595 | 0.228 | -24.6 | 0 |
b_log_distance_kid_act | asc_kid_car | 0.119 | 0.0422 | -25.9 | 0 | 0.0158 | 0.0226 | -25 | 0 |
b_log_distance_kid_act | asc_par_act | 0.267 | 0.0524 | -25 | 0 | 0.269 | 0.046 | -24.2 | 0 |
b_log_distance_kid_act | b_age_kid_act | -2.64 | -0.24 | -27.2 | 0 | -2.61 | -0.23 | -26.4 | 0 |
b_log_distance_kid_act | b_age_kid_car | -0.428 | -0.0413 | -25.2 | 0 | -0.109 | -0.0313 | -25.2 | 0 |
b_log_distance_kid_act | b_age_par_act | -1.53 | -0.0638 | -18.3 | 0 | -1.31 | -0.0563 | -18.2 | 0 |
b_log_distance_kid_act | b_female_kid_act | 2.86 | 0.0631 | -14.2 | 0 | 2.99 | 0.0636 | -13.9 | 0 |
b_log_distance_kid_act | b_female_kid_car | 0.548 | 0.0307 | -23.6 | 0 | 0.185 | 0.0149 | -23.8 | 0 |
b_log_distance_kid_act | b_female_par_act | 1.48 | 0.0177 | -10.2 | 0 | 4.76 | 0.0548 | -10.3 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -1.15 | -0.0241 | -19.9 | 0 | -0.94 | -0.0192 | -19.7 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_car | -1.61 | -0.0395 | -18.5 | 0 | 0.148 | 0.0102 | -24.9 | 0 |
b_log_distance_kid_act | b_has_big_sib_par_act | -1.34 | -0.0153 | -10.9 | 0 | -0.591 | -0.00657 | -10.9 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -1.8 | -0.0379 | -18.5 | 0 | -3.13 | -0.0636 | -18 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_car | -1.74 | -0.0398 | -17.9 | 0 | -0.0573 | -0.00411 | -25 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -1.4 | -0.016 | -12.5 | 0 | -2.73 | -0.0301 | -12.4 | 0 |
b_log_distance_kid_act | b_log_density_kid_act | -0.664 | -0.0378 | -25.9 | 0 | 0.0483 | 0.00253 | -25.3 | 0 |
b_log_distance_kid_act | b_log_density_kid_car | 0.234 | 0.0328 | -25.6 | 0 | 0.0295 | 0.00671 | -24.8 | 0 |
b_log_distance_kid_act | b_log_density_par_act | 0.0183 | 0.000449 | -22.5 | 0 | -1.52 | -0.0305 | -20 | 0 |
b_log_distance_kid_car | asc_kid_act | 0.00127 | 0.00113 | 0.937 | 0.349 | 0.00759 | 0.00949 | 1.34 | 0.18 |
b_log_distance_kid_car | asc_kid_car | 0.979 | 0.759 | -0.778 | 0.436 | 0.0699 | 0.327 | -1.01 | 0.311 |
b_log_distance_kid_car | asc_par_act | -0.00439 | -0.00188 | 1.06 | 0.288 | 0.0121 | 0.00675 | 1.46 | 0.145 |
b_log_distance_kid_car | b_age_kid_act | -0.44 | -0.0874 | -7.73 | 1.11e-14 | -0.147 | -0.0423 | -9.98 | 0 |
b_log_distance_kid_car | b_age_kid_car | -3.52 | -0.742 | -1.03 | 0.302 | -0.193 | -0.181 | -2.04 | 0.0416 |
b_log_distance_kid_car | b_age_par_act | -0.366 | -0.0334 | 4.61 | 4e-06 | -0.122 | -0.0171 | 5.43 | 5.75e-08 |
b_log_distance_kid_car | b_female_kid_act | 0.545 | 0.0263 | 3.82 | 0.000132 | 0.305 | 0.0212 | 3.94 | 8.04e-05 |
b_log_distance_kid_car | b_female_kid_car | 4.49 | 0.549 | -0.00296 | 0.998 | -0.0308 | -0.0081 | -0.00291 | 0.998 |
b_log_distance_kid_car | b_female_par_act | 0.441 | 0.0115 | 0.804 | 0.421 | 0.401 | 0.015 | 0.811 | 0.417 |
b_log_distance_kid_car | b_has_big_sib_kid_act | -1.63 | -0.0746 | -4.48 | 7.56e-06 | 0.268 | 0.0179 | -4.79 | 1.7e-06 |
b_log_distance_kid_car | b_has_big_sib_kid_car | -13.2 | -0.709 | -1.12 | 0.263 | -0.684 | -0.155 | -3.06 | 0.00224 |
b_log_distance_kid_car | b_has_big_sib_par_act | -1.33 | -0.0332 | -0.509 | 0.611 | 0.0113 | 0.00041 | -0.521 | 0.603 |
b_log_distance_kid_car | b_has_lil_sib_kid_act | -1.75 | -0.0802 | -2.97 | 0.00302 | 0.0832 | 0.00552 | -3.16 | 0.0016 |
b_log_distance_kid_car | b_has_lil_sib_kid_car | -14.3 | -0.716 | -1.13 | 0.26 | -0.615 | -0.144 | -3.33 | 0.00087 |
b_log_distance_kid_car | b_has_lil_sib_par_act | -1.42 | -0.0354 | -2.22 | 0.0261 | -0.15 | -0.00541 | -2.27 | 0.0233 |
b_log_distance_kid_car | b_log_density_kid_act | 0.273 | 0.0339 | -4.98 | 6.29e-07 | 0.0642 | 0.011 | -5.56 | 2.63e-08 |
b_log_distance_kid_car | b_log_density_kid_car | 1.92 | 0.588 | -0.598 | 0.55 | 0.0379 | 0.0282 | -0.686 | 0.493 |
b_log_distance_kid_car | b_log_density_par_act | 0.22 | 0.0118 | -6.05 | 1.49e-09 | -0.0231 | -0.00152 | -5.41 | 6.43e-08 |
b_log_distance_kid_car | b_log_distance_kid_act | 1.03 | 0.0571 | 23.8 | 0 | 0.881 | 0.0681 | 24.1 | 0 |
b_log_distance_par_act | asc_kid_act | 0.231 | 0.054 | -15.3 | 0 | 0.157 | 0.0344 | -14.8 | 0 |
b_log_distance_par_act | asc_kid_car | 0.0954 | 0.0194 | -15.8 | 0 | 0.00444 | 0.00364 | -15.2 | 0 |
b_log_distance_par_act | asc_par_act | 2.03 | 0.228 | -15.5 | 0 | 3.14 | 0.307 | -15.1 | 0 |
b_log_distance_par_act | b_age_kid_act | -0.392 | -0.0204 | -17.8 | 0 | -0.473 | -0.0239 | -17.2 | 0 |
b_log_distance_par_act | b_age_kid_car | -0.341 | -0.0189 | -15.8 | 0 | -0.0544 | -0.00897 | -15.4 | 0 |
b_log_distance_par_act | b_age_par_act | -1.93 | -0.0462 | -12.6 | 0 | -7.05 | -0.174 | -11.9 | 0 |
b_log_distance_par_act | b_female_kid_act | 1.05 | 0.0133 | -10.8 | 0 | 4.05 | 0.0495 | -10.7 | 0 |
b_log_distance_par_act | b_female_kid_car | 0.439 | 0.0141 | -15.1 | 0 | 0.206 | 0.00953 | -14.9 | 0 |
b_log_distance_par_act | b_female_par_act | 4.99 | 0.0341 | -9.4 | 0 | 1.69 | 0.0111 | -9.15 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_act | -0.113 | -0.00136 | -15.6 | 0 | 0.0327 | 0.000383 | -15.3 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_car | -1.29 | -0.0181 | -14.1 | 0 | 0.177 | 0.00701 | -15.6 | 0 |
b_log_distance_par_act | b_has_big_sib_par_act | -2.51 | -0.0165 | -9.95 | 0 | 3.19 | 0.0203 | -10 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -1.43 | -0.0172 | -14.5 | 0 | -2.31 | -0.0269 | -14.1 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_car | -1.4 | -0.0183 | -13.8 | 0 | 0.0114 | 0.000469 | -15.7 | 0 |
b_log_distance_par_act | b_has_lil_sib_par_act | -5.99 | -0.0391 | -11.2 | 0 | -10.9 | -0.0691 | -10.9 | 0 |
b_log_distance_par_act | b_log_density_kid_act | -0.663 | -0.0216 | -16.7 | 0 | -1.14 | -0.0343 | -16.1 | 0 |
b_log_distance_par_act | b_log_density_kid_car | 0.187 | 0.015 | -15.6 | 0 | -0.0254 | -0.00332 | -15.1 | 0 |
b_log_distance_par_act | b_log_density_par_act | -2.7 | -0.038 | -16.5 | 0 | -5.06 | -0.0583 | -15.2 | 0 |
b_log_distance_par_act | b_log_distance_kid_act | 22.5 | 0.327 | -0.931 | 0.352 | 24.2 | 0.329 | -0.901 | 0.368 |
b_log_distance_par_act | b_log_distance_kid_car | 0.858 | 0.0273 | -15.2 | 0 | 0.875 | 0.0388 | -14.9 | 0 |
b_log_income_k_kid_act | asc_kid_act | -0.84 | -0.508 | 0.0934 | 0.926 | -0.892 | -0.523 | 0.0928 | 0.926 |
b_log_income_k_kid_act | asc_kid_car | 0.0246 | 0.013 | -1.01 | 0.313 | -0.00671 | -0.0147 | -1.01 | 0.313 |
b_log_income_k_kid_act | asc_par_act | -0.317 | -0.0922 | 0.199 | 0.843 | -0.231 | -0.0604 | 0.198 | 0.843 |
b_log_income_k_kid_act | b_age_kid_act | 0.4 | 0.054 | -6.53 | 6.69e-11 | 0.534 | 0.072 | -6.55 | 5.78e-11 |
b_log_income_k_kid_act | b_age_kid_car | -0.118 | -0.0169 | -1.47 | 0.143 | -0.0161 | -0.00709 | -1.56 | 0.118 |
b_log_income_k_kid_act | b_age_par_act | 0.0689 | 0.00427 | 3.53 | 0.000411 | 0.0649 | 0.00427 | 3.62 | 0.00029 |
b_log_income_k_kid_act | b_female_kid_act | -0.155 | -0.00509 | 3.24 | 0.00122 | 0.28 | 0.00911 | 3.25 | 0.00117 |
b_log_income_k_kid_act | b_female_kid_car | 0.155 | 0.0129 | -0.456 | 0.648 | 0.0971 | 0.012 | -0.499 | 0.618 |
b_log_income_k_kid_act | b_female_par_act | -0.1 | -0.00177 | 0.617 | 0.537 | -0.508 | -0.00893 | 0.614 | 0.539 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 0.253 | 0.0079 | -4.56 | 5.01e-06 | 0.791 | 0.0247 | -4.61 | 4.02e-06 |
b_log_income_k_kid_act | b_has_big_sib_kid_car | -0.465 | -0.017 | -1.55 | 0.121 | -0.1 | -0.0106 | -2.51 | 0.0119 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 0.37 | 0.00627 | -0.659 | 0.51 | 0.137 | 0.00233 | -0.662 | 0.508 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 1.49 | 0.0464 | -3.17 | 0.00152 | 1.18 | 0.0368 | -3.16 | 0.00159 |
b_log_income_k_kid_act | b_has_lil_sib_kid_car | -0.486 | -0.0165 | -1.55 | 0.121 | -0.0444 | -0.00487 | -2.67 | 0.0076 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 0.629 | 0.0106 | -2.35 | 0.0186 | 0.322 | 0.00544 | -2.36 | 0.0185 |
b_log_income_k_kid_act | b_log_density_kid_act | 0.621 | 0.0524 | -4.44 | 9.09e-06 | 1.11 | 0.0885 | -4.44 | 8.95e-06 |
b_log_income_k_kid_act | b_log_density_kid_car | 0.0692 | 0.0144 | -0.855 | 0.392 | 0.0429 | 0.015 | -0.87 | 0.384 |
b_log_income_k_kid_act | b_log_density_par_act | 0.298 | 0.0108 | -5.84 | 5.14e-09 | 0.33 | 0.0102 | -5.17 | 2.31e-07 |
b_log_income_k_kid_act | b_log_distance_kid_act | -2 | -0.0753 | 20.2 | 0 | -1.8 | -0.0654 | 19.8 | 0 |
b_log_income_k_kid_act | b_log_distance_kid_car | 0.138 | 0.0114 | -0.453 | 0.651 | -0.0277 | -0.00328 | -0.491 | 0.624 |
b_log_income_k_kid_act | b_log_distance_par_act | -0.634 | -0.0137 | 14.3 | 0 | 1.64 | 0.0342 | 14.1 | 0 |
b_log_income_k_kid_car | asc_kid_act | -0.00899 | -0.0172 | 3.34 | 0.00083 | -0.0127 | -0.0253 | 3.54 | 0.000408 |
b_log_income_k_kid_car | asc_kid_car | 0.136 | 0.227 | -0.0246 | 0.98 | -0.0612 | -0.456 | -0.0248 | 0.98 |
b_log_income_k_kid_car | asc_par_act | -0.00858 | -0.00791 | 3.27 | 0.00108 | -0.0188 | -0.0167 | 3.3 | 0.000955 |
b_log_income_k_kid_car | b_age_kid_act | -0.0911 | -0.039 | -11.2 | 0 | -0.0017 | -0.000781 | -11.7 | 0 |
b_log_income_k_kid_car | b_age_kid_car | -0.739 | -0.335 | -0.994 | 0.32 | -0.00692 | -0.0104 | -1.79 | 0.0742 |
b_log_income_k_kid_car | b_age_par_act | -0.075 | -0.0147 | 5.99 | 2.1e-09 | 0.0396 | 0.00887 | 6.44 | 1.21e-10 |
b_log_income_k_kid_car | b_female_kid_act | 0.116 | 0.012 | 4.28 | 1.83e-05 | 0.13 | 0.0144 | 4.28 | 1.83e-05 |
b_log_income_k_kid_car | b_female_kid_car | 0.998 | 0.263 | 0.692 | 0.489 | -0.0972 | -0.0408 | 0.837 | 0.403 |
b_log_income_k_kid_car | b_female_par_act | 0.0928 | 0.00521 | 0.963 | 0.336 | -0.0451 | -0.0027 | 0.959 | 0.337 |
b_log_income_k_kid_car | b_has_big_sib_kid_act | -0.357 | -0.0353 | -4.55 | 5.38e-06 | -0.0385 | -0.00408 | -4.6 | 4.15e-06 |
b_log_income_k_kid_car | b_has_big_sib_kid_car | -2.92 | -0.338 | -1.11 | 0.266 | -0.0106 | -0.00384 | -3.07 | 0.00213 |
b_log_income_k_kid_car | b_has_big_sib_par_act | -0.285 | -0.0153 | -0.38 | 0.704 | 0.105 | 0.00605 | -0.384 | 0.701 |
b_log_income_k_kid_car | b_has_lil_sib_kid_act | -0.367 | -0.0362 | -2.93 | 0.00335 | 0.0248 | 0.00263 | -2.96 | 0.00305 |
b_log_income_k_kid_car | b_has_lil_sib_kid_car | -3.02 | -0.325 | -1.13 | 0.259 | 0.158 | 0.0592 | -3.5 | 0.00046 |
b_log_income_k_kid_car | b_has_lil_sib_par_act | -0.294 | -0.0157 | -2.13 | 0.0328 | 0.0981 | 0.00564 | -2.15 | 0.0319 |
b_log_income_k_kid_car | b_log_density_kid_act | 0.0607 | 0.0162 | -5.74 | 9.58e-09 | 0.0465 | 0.0127 | -5.57 | 2.58e-08 |
b_log_income_k_kid_car | b_log_density_kid_car | 0.432 | 0.284 | 0.352 | 0.725 | -0.032 | -0.0379 | 0.363 | 0.717 |
b_log_income_k_kid_car | b_log_density_par_act | 0.0485 | 0.00559 | -6.16 | 7.29e-10 | 0.0485 | 0.00508 | -5.27 | 1.38e-07 |
b_log_income_k_kid_car | b_log_distance_kid_act | 0.0962 | 0.0115 | 25.4 | 0 | -0.00591 | -0.00073 | 24.6 | 0 |
b_log_income_k_kid_car | b_log_distance_kid_car | 0.794 | 0.207 | 0.672 | 0.502 | -0.171 | -0.0691 | 0.806 | 0.42 |
b_log_income_k_kid_car | b_log_distance_par_act | 0.0752 | 0.00514 | 15.6 | 0 | 0.066 | 0.00467 | 15.1 | 0 |
b_log_income_k_kid_car | b_log_income_k_kid_act | 0.214 | 0.038 | 0.97 | 0.332 | 0.158 | 0.0299 | 0.969 | 0.332 |
b_log_income_k_par_act | asc_kid_act | -0.305 | -0.106 | 1.57 | 0.116 | -0.247 | -0.0826 | 1.56 | 0.118 |
b_log_income_k_par_act | asc_kid_car | 0.0158 | 0.00478 | 0.943 | 0.346 | -0.00854 | -0.0107 | 0.939 | 0.348 |
b_log_income_k_par_act | asc_par_act | -2.46 | -0.411 | 1.56 | 0.118 | -2.26 | -0.339 | 1.56 | 0.119 |
b_log_income_k_par_act | b_age_kid_act | 0.0908 | 0.00702 | -2.38 | 0.0172 | 0.113 | 0.00874 | -2.37 | 0.0178 |
b_log_income_k_par_act | b_age_kid_car | -0.08 | -0.00657 | 0.603 | 0.546 | -0.0147 | -0.0037 | 0.614 | 0.539 |
b_log_income_k_par_act | b_age_par_act | 2.37 | 0.0841 | 3.91 | 9.31e-05 | 0.267 | 0.01 | 3.82 | 0.000135 |
b_log_income_k_par_act | b_female_kid_act | -0.0973 | -0.00183 | 3.71 | 0.000204 | -0.227 | -0.00423 | 3.69 | 0.000221 |
b_log_income_k_par_act | b_female_kid_car | 0.106 | 0.00507 | 1.13 | 0.257 | -0.0249 | -0.00176 | 1.17 | 0.243 |
b_log_income_k_par_act | b_female_par_act | -2.34 | -0.0237 | 1.29 | 0.196 | -3.71 | -0.0374 | 1.28 | 0.2 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 0.261 | 0.00467 | -2.68 | 0.00747 | 0.106 | 0.0019 | -2.67 | 0.00758 |
b_log_income_k_par_act | b_has_big_sib_kid_car | -0.317 | -0.00662 | -0.0854 | 0.932 | -0.0304 | -0.00184 | -0.109 | 0.914 |
b_log_income_k_par_act | b_has_big_sib_par_act | 6.91 | 0.0671 | 0.108 | 0.914 | 1.33 | 0.0129 | 0.106 | 0.915 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 0.602 | 0.0108 | -1.49 | 0.135 | 0.0454 | 0.000807 | -1.48 | 0.138 |
b_log_income_k_par_act | b_has_lil_sib_kid_car | -0.331 | -0.00645 | -0.144 | 0.886 | -0.0142 | -0.000892 | -0.189 | 0.85 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 2.42 | 0.0234 | -1.47 | 0.141 | 6.19 | 0.0598 | -1.5 | 0.135 |
b_log_income_k_par_act | b_log_density_kid_act | 0.246 | 0.0119 | -1.36 | 0.173 | 0.226 | 0.0104 | -1.35 | 0.178 |
b_log_income_k_par_act | b_log_density_kid_car | 0.0473 | 0.00563 | 1.01 | 0.313 | 0.0352 | 0.00701 | 1.01 | 0.312 |
b_log_income_k_par_act | b_log_density_par_act | 2.01 | 0.042 | -3.51 | 0.000444 | -0.0604 | -0.00106 | -3.17 | 0.00153 |
b_log_income_k_par_act | b_log_distance_kid_act | -0.385 | -0.00831 | 17.4 | 0 | 1.91 | 0.0397 | 17.5 | 0 |
b_log_income_k_par_act | b_log_distance_kid_car | 0.0923 | 0.00436 | 1.13 | 0.258 | 0.121 | 0.00822 | 1.17 | 0.243 |
b_log_income_k_par_act | b_log_distance_par_act | -6.07 | -0.0751 | 13.1 | 0 | -8.59 | -0.102 | 12.7 | 0 |
b_log_income_k_par_act | b_log_income_k_kid_act | 6.54 | 0.21 | 1.46 | 0.144 | 5.76 | 0.183 | 1.43 | 0.152 |
b_log_income_k_par_act | b_log_income_k_kid_car | 0.169 | 0.0172 | 0.936 | 0.349 | 0.253 | 0.0273 | 0.934 | 0.35 |
b_non_work_dad_kid_ace | asc_kid_act | -0.421 | -0.0928 | -0.509 | 0.611 | -0.588 | -0.127 | -0.512 | 0.608 |
b_non_work_dad_kid_ace | asc_kid_car | 0.0467 | 0.00897 | -0.915 | 0.36 | -0.0383 | -0.0309 | -0.922 | 0.356 |
b_non_work_dad_kid_ace | asc_par_act | -0.2 | -0.0212 | -0.47 | 0.638 | -0.228 | -0.022 | -0.473 | 0.636 |
b_non_work_dad_kid_ace | b_age_kid_act | -1.3 | -0.0638 | -3.01 | 0.00265 | -1.09 | -0.0539 | -3.03 | 0.00243 |
b_non_work_dad_kid_ace | b_age_kid_car | -0.197 | -0.0103 | -1.11 | 0.267 | 0.134 | 0.0218 | -1.13 | 0.258 |
b_non_work_dad_kid_ace | b_age_par_act | -0.456 | -0.0103 | 1.12 | 0.263 | 0.587 | 0.0142 | 1.14 | 0.254 |
b_non_work_dad_kid_ace | b_female_kid_act | 1.07 | 0.0128 | 1.53 | 0.127 | 0.104 | 0.00125 | 1.53 | 0.127 |
b_non_work_dad_kid_ace | b_female_kid_car | 0.261 | 0.0079 | -0.725 | 0.468 | -0.0677 | -0.00308 | -0.741 | 0.459 |
b_non_work_dad_kid_ace | b_female_par_act | 1.59 | 0.0103 | 0.13 | 0.896 | 1.94 | 0.0126 | 0.131 | 0.896 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | 0.476 | 0.0054 | -3.31 | 0.000923 | 2.1 | 0.0241 | -3.36 | 0.000768 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_car | -0.704 | -0.00934 | -1.38 | 0.167 | 0.378 | 0.0147 | -1.58 | 0.115 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 0.356 | 0.0022 | -0.879 | 0.379 | 1.04 | 0.00649 | -0.887 | 0.375 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 5.59 | 0.0635 | -2.48 | 0.0133 | 6.19 | 0.0709 | -2.5 | 0.0125 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_car | -0.714 | -0.00883 | -1.4 | 0.161 | -0.00525 | -0.000212 | -1.63 | 0.104 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 2.17 | 0.0134 | -2.25 | 0.0245 | 0.702 | 0.00437 | -2.25 | 0.0244 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 0.211 | 0.00646 | -2.37 | 0.0177 | 1.57 | 0.0464 | -2.41 | 0.0161 |
b_non_work_dad_kid_ace | b_log_density_kid_car | 0.111 | 0.0084 | -0.864 | 0.387 | 0.22 | 0.0283 | -0.874 | 0.382 |
b_non_work_dad_kid_ace | b_log_density_par_act | 0.272 | 0.0036 | -3.87 | 0.00011 | 0.703 | 0.00797 | -3.73 | 0.000192 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | 0.364 | 0.005 | 11.5 | 0 | 0.107 | 0.00143 | 11.5 | 0 |
b_non_work_dad_kid_ace | b_log_distance_kid_car | 0.239 | 0.00716 | -0.724 | 0.469 | 0.351 | 0.0153 | -0.741 | 0.458 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -0.762 | -0.00599 | 10.1 | 0 | 0.0531 | 0.000407 | 10 | 0 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 7.51 | 0.153 | -0.541 | 0.589 | 8.02 | 0.164 | -0.547 | 0.585 |
b_non_work_dad_kid_ace | b_log_income_k_kid_car | 0.126 | 0.00815 | -0.908 | 0.364 | 0.00954 | 0.000663 | -0.914 | 0.36 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 3.11 | 0.0363 | -1.3 | 0.193 | 2.45 | 0.0286 | -1.3 | 0.193 |
b_non_work_dad_kid_car | asc_kid_act | -0.00712 | -0.00518 | 1.05 | 0.295 | -0.0409 | -0.0305 | 1.1 | 0.271 |
b_non_work_dad_kid_car | asc_kid_car | 0.506 | 0.32 | -0.292 | 0.77 | -0.0191 | -0.0533 | -0.297 | 0.766 |
b_non_work_dad_kid_car | asc_par_act | -0.00878 | -0.00307 | 1.15 | 0.249 | -0.0232 | -0.00774 | 1.2 | 0.229 |
b_non_work_dad_kid_car | b_age_kid_act | -0.25 | -0.0406 | -6.51 | 7.47e-11 | 0.122 | 0.0209 | -6.97 | 3.23e-12 |
b_non_work_dad_kid_car | b_age_kid_car | -2.06 | -0.354 | -0.774 | 0.439 | -0.192 | -0.108 | -0.989 | 0.323 |
b_non_work_dad_kid_car | b_age_par_act | -0.207 | -0.0154 | 4.47 | 7.89e-06 | 0.0601 | 0.00504 | 4.79 | 1.66e-06 |
b_non_work_dad_kid_car | b_female_kid_act | 0.32 | 0.0126 | 3.81 | 0.000141 | -0.029 | -0.0012 | 3.82 | 0.000135 |
b_non_work_dad_kid_car | b_female_kid_car | 2.69 | 0.269 | 0.253 | 0.8 | 0.302 | 0.0474 | 0.261 | 0.794 |
b_non_work_dad_kid_car | b_female_par_act | 0.261 | 0.00556 | 0.866 | 0.386 | 0.0278 | 0.000623 | 0.866 | 0.387 |
b_non_work_dad_kid_car | b_has_big_sib_kid_act | -0.895 | -0.0336 | -4.28 | 1.9e-05 | 0.327 | 0.013 | -4.41 | 1.04e-05 |
b_non_work_dad_kid_car | b_has_big_sib_kid_car | -7.6 | -0.333 | -1.06 | 0.291 | 0.0641 | 0.00864 | -2.21 | 0.0274 |
b_non_work_dad_kid_car | b_has_big_sib_par_act | -0.731 | -0.0149 | -0.436 | 0.663 | 0.129 | 0.0028 | -0.442 | 0.658 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_act | -0.914 | -0.0343 | -2.8 | 0.00515 | -0.124 | -0.00493 | -2.86 | 0.00427 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_car | -7.75 | -0.316 | -1.08 | 0.281 | 0.887 | 0.124 | -2.53 | 0.0116 |
b_non_work_dad_kid_car | b_has_lil_sib_par_act | -0.742 | -0.0151 | -2.14 | 0.0322 | 0.117 | 0.00251 | -2.16 | 0.0306 |
b_non_work_dad_kid_car | b_log_density_kid_act | 0.16 | 0.0163 | -4.18 | 2.88e-05 | 0.289 | 0.0295 | -4.26 | 2.02e-05 |
b_non_work_dad_kid_car | b_log_density_kid_car | 1.15 | 0.288 | -0.13 | 0.897 | -0.219 | -0.0973 | -0.126 | 0.899 |
b_non_work_dad_kid_car | b_log_density_par_act | 0.126 | 0.0055 | -5.67 | 1.46e-08 | 0.104 | 0.0041 | -5.01 | 5.39e-07 |
b_non_work_dad_kid_car | b_log_distance_kid_act | 0.307 | 0.0139 | 22.6 | 0 | 0.243 | 0.0112 | 22.2 | 0 |
b_non_work_dad_kid_car | b_log_distance_kid_car | 2.65 | 0.262 | 0.253 | 0.8 | -0.118 | -0.0179 | 0.253 | 0.8 |
b_non_work_dad_kid_car | b_log_distance_par_act | 0.244 | 0.00634 | 14.9 | 0 | 0.108 | 0.00285 | 14.5 | 0 |
b_non_work_dad_kid_car | b_log_income_k_kid_act | 0.162 | 0.0109 | 0.602 | 0.547 | 0.0755 | 0.00534 | 0.612 | 0.541 |
b_non_work_dad_kid_car | b_log_income_k_kid_car | 1.22 | 0.26 | -0.281 | 0.779 | 0.753 | 0.181 | -0.288 | 0.774 |
b_non_work_dad_kid_car | b_log_income_k_par_act | 0.125 | 0.00481 | -0.976 | 0.329 | 0.0736 | 0.00298 | -0.98 | 0.327 |
b_non_work_dad_kid_car | b_non_work_dad_kid_ace | 1.36 | 0.0334 | 0.802 | 0.423 | 1.33 | 0.0346 | 0.811 | 0.417 |
b_non_work_dad_par_act | asc_kid_act | -0.189 | -0.0237 | 1.23 | 0.217 | -0.205 | -0.0262 | 1.3 | 0.195 |
b_non_work_dad_par_act | asc_kid_car | 0.0393 | 0.00429 | 1 | 0.315 | -0.0113 | -0.0054 | 1.05 | 0.291 |
b_non_work_dad_par_act | asc_par_act | -1.27 | -0.0769 | 1.25 | 0.211 | -0.994 | -0.0569 | 1.32 | 0.188 |
b_non_work_dad_par_act | b_age_kid_act | -0.437 | -0.0122 | -0.221 | 0.825 | 0.279 | 0.00823 | -0.233 | 0.816 |
b_non_work_dad_par_act | b_age_kid_car | -0.164 | -0.00486 | 0.883 | 0.377 | 0.0371 | 0.00357 | 0.931 | 0.352 |
b_non_work_dad_par_act | b_age_par_act | -3.32 | -0.0427 | 2.14 | 0.032 | -5.89 | -0.0849 | 2.24 | 0.0252 |
b_non_work_dad_par_act | b_female_kid_act | 1.54 | 0.0104 | 2.41 | 0.0161 | 1.78 | 0.0127 | 2.51 | 0.0119 |
b_non_work_dad_par_act | b_female_kid_car | 0.223 | 0.00384 | 1.09 | 0.275 | 0.0251 | 0.000677 | 1.15 | 0.25 |
b_non_work_dad_par_act | b_female_par_act | 6.41 | 0.0236 | 1.39 | 0.166 | 2.33 | 0.00897 | 1.42 | 0.155 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 0.135 | 0.000872 | -0.677 | 0.498 | 1.41 | 0.00965 | -0.71 | 0.478 |
b_non_work_dad_par_act | b_has_big_sib_kid_car | -0.597 | -0.00452 | 0.591 | 0.554 | 0.0486 | 0.00113 | 0.648 | 0.517 |
b_non_work_dad_par_act | b_has_big_sib_par_act | 0.0463 | 0.000163 | 0.614 | 0.539 | 4.65 | 0.0173 | 0.641 | 0.521 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 2.05 | 0.0132 | -0.103 | 0.918 | 0.457 | 0.00311 | -0.107 | 0.915 |
b_non_work_dad_par_act | b_has_lil_sib_kid_car | -0.606 | -0.00427 | 0.558 | 0.577 | 0.026 | 0.000624 | 0.617 | 0.537 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 9.4 | 0.033 | -0.391 | 0.696 | 19.8 | 0.0731 | -0.413 | 0.68 |
b_non_work_dad_par_act | b_log_density_kid_act | 0.042 | 0.000734 | 0.136 | 0.892 | 0.55 | 0.00964 | 0.143 | 0.886 |
b_non_work_dad_par_act | b_log_density_kid_car | 0.09 | 0.00387 | 1.03 | 0.303 | 0.0758 | 0.00578 | 1.08 | 0.279 |
b_non_work_dad_par_act | b_log_density_par_act | -2.66 | -0.0201 | -0.943 | 0.346 | -2.61 | -0.0176 | -0.967 | 0.333 |
b_non_work_dad_par_act | b_log_distance_kid_act | -0.481 | -0.00376 | 8.57 | 0 | 1.47 | 0.0117 | 8.98 | 0 |
b_non_work_dad_par_act | b_log_distance_kid_car | 0.201 | 0.00343 | 1.09 | 0.275 | 0.102 | 0.00265 | 1.15 | 0.25 |
b_non_work_dad_par_act | b_log_distance_par_act | -10.1 | -0.0452 | 8.19 | 2.22e-16 | 3.31 | 0.0151 | 8.65 | 0 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 3.24 | 0.0376 | 1.2 | 0.231 | 1.86 | 0.0226 | 1.25 | 0.21 |
b_non_work_dad_par_act | b_log_income_k_kid_car | 0.11 | 0.00404 | 1 | 0.315 | 0.000582 | 2.4e-05 | 1.05 | 0.292 |
b_non_work_dad_par_act | b_log_income_k_par_act | 17.6 | 0.117 | 0.647 | 0.517 | 25.7 | 0.178 | 0.693 | 0.489 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 47.3 | 0.2 | 1.46 | 0.145 | 40.3 | 0.18 | 1.5 | 0.133 |
b_non_work_dad_par_act | b_non_work_dad_kid_car | 1.08 | 0.015 | 1.04 | 0.298 | 0.98 | 0.0152 | 1.09 | 0.274 |
b_non_work_mom_kid_act | asc_kid_act | -0.433 | -0.142 | -1.03 | 0.303 | -0.356 | -0.115 | -1.04 | 0.299 |
b_non_work_mom_kid_act | asc_kid_car | 0.372 | 0.107 | -1.65 | 0.0989 | -0.0103 | -0.0124 | -1.66 | 0.0978 |
b_non_work_mom_kid_act | asc_par_act | -0.185 | -0.0293 | -0.971 | 0.331 | -0.156 | -0.0225 | -0.978 | 0.328 |
b_non_work_mom_kid_act | b_age_kid_act | 0.573 | 0.042 | -4.78 | 1.72e-06 | 0.593 | 0.044 | -4.82 | 1.42e-06 |
b_non_work_mom_kid_act | b_age_kid_car | -1.36 | -0.106 | -1.87 | 0.0616 | 0.0271 | 0.00656 | -1.96 | 0.0496 |
b_non_work_mom_kid_act | b_age_par_act | 0.353 | 0.0119 | 1.34 | 0.179 | 0.638 | 0.0231 | 1.38 | 0.169 |
b_non_work_mom_kid_act | b_female_kid_act | -0.81 | -0.0144 | 1.74 | 0.0813 | -3.32 | -0.0596 | 1.71 | 0.0871 |
b_non_work_mom_kid_act | b_female_kid_car | 1.79 | 0.0808 | -1.34 | 0.18 | -0.117 | -0.00795 | -1.36 | 0.175 |
b_non_work_mom_kid_act | b_female_par_act | -0.26 | -0.00251 | 0.0104 | 0.992 | -0.891 | -0.00863 | 0.0103 | 0.992 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -0.984 | -0.0167 | -4.38 | 1.18e-05 | -0.0446 | -0.000766 | -4.44 | 8.8e-06 |
b_non_work_mom_kid_act | b_has_big_sib_kid_car | -5.29 | -0.105 | -1.94 | 0.0529 | 0.0718 | 0.00418 | -2.57 | 0.0103 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | -1.21 | -0.0111 | -1.13 | 0.26 | 1.53 | 0.0143 | -1.15 | 0.252 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -4.43 | -0.0751 | -3.15 | 0.00163 | -3.55 | -0.0607 | -3.19 | 0.00144 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_car | -5.74 | -0.106 | -1.93 | 0.0533 | 0.215 | 0.013 | -2.66 | 0.00787 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | -1.88 | -0.0173 | -2.65 | 0.00796 | -0.361 | -0.00336 | -2.68 | 0.00736 |
b_non_work_mom_kid_act | b_log_density_kid_act | -1.16 | -0.0531 | -3.62 | 0.000291 | -1.36 | -0.0601 | -3.62 | 0.000298 |
b_non_work_mom_kid_act | b_log_density_kid_car | 0.751 | 0.0848 | -1.57 | 0.115 | -0.0352 | -0.00675 | -1.58 | 0.115 |
b_non_work_mom_kid_act | b_log_density_par_act | -0.0609 | -0.00121 | -5.28 | 1.28e-07 | -0.671 | -0.0114 | -4.9 | 9.54e-07 |
b_non_work_mom_kid_act | b_log_distance_kid_act | 1.83 | 0.0375 | 15.3 | 0 | 2.2 | 0.044 | 15.2 | 0 |
b_non_work_mom_kid_act | b_log_distance_kid_car | 1.91 | 0.0855 | -1.34 | 0.18 | -0.0533 | -0.00347 | -1.35 | 0.176 |
b_non_work_mom_kid_act | b_log_distance_par_act | -0.419 | -0.00493 | 11.9 | 0 | -0.227 | -0.00259 | 11.6 | 0 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 6.38 | 0.194 | -1.05 | 0.295 | 4.97 | 0.152 | -1.03 | 0.302 |
b_non_work_mom_kid_act | b_log_income_k_kid_car | 0.465 | 0.0448 | -1.63 | 0.104 | 0.114 | 0.0118 | -1.63 | 0.102 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 1.82 | 0.0317 | -1.87 | 0.0613 | 1.37 | 0.024 | -1.87 | 0.0619 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -2.65 | -0.0293 | -0.151 | 0.88 | 0.293 | 0.00329 | -0.154 | 0.877 |
b_non_work_mom_kid_act | b_non_work_dad_kid_car | 1.03 | 0.0375 | -1.4 | 0.161 | 0.182 | 0.00709 | -1.41 | 0.16 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -1.85 | -0.0117 | -1.52 | 0.129 | 1.12 | 0.0075 | -1.6 | 0.11 |
b_non_work_mom_kid_car | asc_kid_act | -0.0166 | -0.00535 | -0.485 | 0.628 | -0.0112 | -0.012 | -1.63 | 0.104 |
b_non_work_mom_kid_car | asc_kid_car | 3.3 | 0.926 | -1.14 | 0.256 | 0.00262 | 0.0105 | -3.67 | 0.000243 |
b_non_work_mom_kid_car | asc_par_act | -0.0322 | -0.00498 | -0.426 | 0.67 | -0.0181 | -0.0086 | -1.36 | 0.175 |
b_non_work_mom_kid_car | b_age_kid_act | -1.47 | -0.106 | -4.04 | 5.44e-05 | 0.00974 | 0.00239 | -11.5 | 0 |
b_non_work_mom_kid_car | b_age_kid_car | -12.1 | -0.92 | -1.16 | 0.248 | -0.131 | -0.105 | -4.48 | 7.44e-06 |
b_non_work_mom_kid_car | b_age_par_act | -1.22 | -0.0403 | 1.77 | 0.0774 | 0.081 | 0.00971 | 3.72 | 0.000201 |
b_non_work_mom_kid_car | b_female_kid_act | 1.87 | 0.0326 | 2.16 | 0.0305 | -0.00957 | -0.000568 | 3.01 | 0.00265 |
b_non_work_mom_kid_car | b_female_kid_car | 15.9 | 0.701 | -1.05 | 0.295 | -0.148 | -0.0333 | -2.15 | 0.0316 |
b_non_work_mom_kid_car | b_female_par_act | 1.5 | 0.0142 | 0.284 | 0.777 | 0.0676 | 0.00217 | 0.322 | 0.747 |
b_non_work_mom_kid_car | b_has_big_sib_kid_act | -5.64 | -0.0936 | -3.81 | 0.000139 | 0.0799 | 0.00454 | -5.55 | 2.89e-08 |
b_non_work_mom_kid_car | b_has_big_sib_kid_car | -47 | -0.913 | -1.16 | 0.246 | -0.56 | -0.108 | -4.83 | 1.38e-06 |
b_non_work_mom_kid_car | b_has_big_sib_par_act | -4.6 | -0.0414 | -0.848 | 0.396 | -0.233 | -0.00722 | -0.985 | 0.325 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_act | -6.06 | -0.101 | -2.71 | 0.00668 | 0.181 | 0.0103 | -3.96 | 7.65e-05 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_car | -51 | -0.922 | -1.16 | 0.245 | -0.879 | -0.176 | -4.95 | 7.48e-07 |
b_non_work_mom_kid_car | b_has_lil_sib_par_act | -4.92 | -0.0443 | -2.35 | 0.0186 | 0.0855 | 0.00263 | -2.73 | 0.00637 |
b_non_work_mom_kid_car | b_log_density_kid_act | 0.923 | 0.0414 | -3.15 | 0.00161 | 0.0195 | 0.00284 | -7 | 2.56e-12 |
b_non_work_mom_kid_car | b_log_density_kid_car | 6.74 | 0.745 | -1.12 | 0.262 | -0.0929 | -0.059 | -3.25 | 0.00117 |
b_non_work_mom_kid_car | b_log_density_par_act | 0.74 | 0.0143 | -4.84 | 1.3e-06 | 0.0335 | 0.00188 | -6.17 | 6.8e-10 |
b_non_work_mom_kid_car | b_log_distance_kid_act | 2.01 | 0.0403 | 15.5 | 0 | 0.105 | 0.00694 | 22.4 | 0 |
b_non_work_mom_kid_car | b_log_distance_kid_car | 16.6 | 0.726 | -1.06 | 0.288 | 0.657 | 0.142 | -2.31 | 0.0207 |
b_non_work_mom_kid_car | b_log_distance_par_act | 1.61 | 0.0185 | 12.2 | 0 | 0.214 | 0.00812 | 14.2 | 0 |
b_non_work_mom_kid_car | b_log_income_k_kid_act | 0.624 | 0.0186 | -0.478 | 0.633 | 0.218 | 0.0221 | -0.89 | 0.373 |
b_non_work_mom_kid_car | b_log_income_k_kid_car | 4.08 | 0.385 | -1.13 | 0.258 | 0.433 | 0.149 | -3.44 | 0.000572 |
b_non_work_mom_kid_car | b_log_income_k_par_act | 0.433 | 0.00739 | -1.44 | 0.151 | 0.209 | 0.0121 | -2 | 0.0452 |
b_non_work_mom_kid_car | b_non_work_dad_kid_ace | 0.856 | 0.00928 | 0.148 | 0.882 | 0.0966 | 0.0036 | 0.177 | 0.86 |
b_non_work_mom_kid_car | b_non_work_dad_kid_car | 9.16 | 0.328 | -1 | 0.317 | -0.426 | -0.0549 | -1.81 | 0.0697 |
b_non_work_mom_kid_car | b_non_work_dad_par_act | 0.721 | 0.00445 | -1.33 | 0.184 | 0.44 | 0.00972 | -1.49 | 0.137 |
b_non_work_mom_kid_car | b_non_work_mom_kid_act | 7.05 | 0.114 | 0.403 | 0.687 | 0.471 | 0.0262 | 0.527 | 0.598 |
b_non_work_mom_par_act | asc_kid_act | -0.139 | -0.0255 | 3.31 | 0.000934 | -0.117 | -0.0209 | 3.34 | 0.000828 |
b_non_work_mom_par_act | asc_kid_car | 0.306 | 0.0487 | 2.98 | 0.00287 | -0.0107 | -0.0072 | 3.01 | 0.00263 |
b_non_work_mom_par_act | asc_par_act | -1.65 | -0.145 | 3.31 | 0.000924 | -0.936 | -0.075 | 3.36 | 0.00079 |
b_non_work_mom_par_act | b_age_kid_act | 0.209 | 0.00852 | 1.18 | 0.236 | 0.437 | 0.018 | 1.2 | 0.231 |
b_non_work_mom_par_act | b_age_kid_car | -1.12 | -0.0482 | 2.77 | 0.00558 | 0.0751 | 0.0101 | 2.83 | 0.0046 |
b_non_work_mom_par_act | b_age_par_act | 1.27 | 0.0237 | 4.58 | 4.67e-06 | 0.63 | 0.0127 | 4.63 | 3.69e-06 |
b_non_work_mom_par_act | b_female_kid_act | -0.0355 | -0.000351 | 4.64 | 3.5e-06 | -0.911 | -0.00908 | 4.66 | 3.21e-06 |
b_non_work_mom_par_act | b_female_kid_car | 1.47 | 0.0369 | 3.08 | 0.00208 | -0.175 | -0.00663 | 3.12 | 0.00182 |
b_non_work_mom_par_act | b_female_par_act | -9.01 | -0.0482 | 2.76 | 0.0058 | 0.773 | 0.00416 | 2.84 | 0.0045 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | -1.36 | -0.0128 | 0.406 | 0.685 | 1.39 | 0.0133 | 0.414 | 0.679 |
b_non_work_mom_par_act | b_has_big_sib_kid_car | -4.36 | -0.048 | 2.16 | 0.031 | -0.0427 | -0.00138 | 2.41 | 0.0158 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -2.24 | -0.0115 | 1.83 | 0.0672 | 2.52 | 0.0131 | 1.87 | 0.0617 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -2.13 | -0.02 | 1.18 | 0.237 | -0.518 | -0.00493 | 1.2 | 0.23 |
b_non_work_mom_par_act | b_has_lil_sib_kid_car | -4.73 | -0.0485 | 2.09 | 0.0369 | 0.148 | 0.00497 | 2.37 | 0.0176 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | -22.7 | -0.116 | 0.56 | 0.576 | -17.3 | -0.0893 | 0.57 | 0.568 |
b_non_work_mom_par_act | b_log_density_kid_act | -0.359 | -0.00915 | 1.68 | 0.0931 | -0.807 | -0.0198 | 1.69 | 0.0913 |
b_non_work_mom_par_act | b_log_density_kid_car | 0.616 | 0.0386 | 3.02 | 0.00255 | -0.0815 | -0.0087 | 3.04 | 0.00234 |
b_non_work_mom_par_act | b_log_density_par_act | -4.58 | -0.0503 | 0.0591 | 0.953 | -13.5 | -0.127 | 0.0558 | 0.956 |
b_non_work_mom_par_act | b_log_distance_kid_act | 0.64 | 0.00728 | 13.3 | 0 | 0.814 | 0.00904 | 13.4 | 0 |
b_non_work_mom_par_act | b_log_distance_kid_car | 1.57 | 0.0391 | 3.08 | 0.00207 | 0.383 | 0.0139 | 3.12 | 0.00178 |
b_non_work_mom_par_act | b_log_distance_par_act | -6.34 | -0.0413 | 11.8 | 0 | -4.39 | -0.028 | 11.8 | 0 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 1.84 | 0.0311 | 3.17 | 0.00152 | 1.26 | 0.0214 | 3.19 | 0.00142 |
b_non_work_mom_par_act | b_log_income_k_kid_car | 0.377 | 0.0202 | 2.97 | 0.00296 | 0.0827 | 0.00478 | 3 | 0.00271 |
b_non_work_mom_par_act | b_log_income_k_par_act | 22.5 | 0.217 | 2.42 | 0.0154 | 17.9 | 0.174 | 2.39 | 0.0169 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -1.85 | -0.0114 | 2.86 | 0.00423 | 1.24 | 0.00775 | 2.91 | 0.00357 |
b_non_work_mom_par_act | b_non_work_dad_kid_car | 0.843 | 0.0171 | 2.97 | 0.00299 | 0.341 | 0.00738 | 3 | 0.00271 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -8.5 | -0.0298 | 0.846 | 0.397 | 9.1 | 0.0338 | 0.905 | 0.366 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 21 | 0.193 | 3.72 | 0.000201 | 20.5 | 0.191 | 3.75 | 0.000175 |
b_non_work_mom_par_act | b_non_work_mom_kid_car | 5.81 | 0.0522 | 3.19 | 0.0014 | 0.147 | 0.00455 | 3.58 | 0.000347 |
b_veh_per_driver_kid_act | asc_kid_act | -0.582 | -0.183 | -1.6 | 0.109 | -0.642 | -0.186 | -1.52 | 0.128 |
b_veh_per_driver_kid_act | asc_kid_car | -0.236 | -0.0644 | -2.19 | 0.0288 | -0.02 | -0.0217 | -2.08 | 0.0372 |
b_veh_per_driver_kid_act | asc_par_act | -0.153 | -0.0231 | -1.55 | 0.12 | -0.117 | -0.0151 | -1.47 | 0.141 |
b_veh_per_driver_kid_act | b_age_kid_act | -0.322 | -0.0226 | -5.12 | 3e-07 | -0.209 | -0.0139 | -4.88 | 1.05e-06 |
b_veh_per_driver_kid_act | b_age_kid_car | 0.834 | 0.062 | -2.47 | 0.0134 | 0.0564 | 0.0123 | -2.36 | 0.0182 |
b_veh_per_driver_kid_act | b_age_par_act | -0.491 | -0.0158 | 0.713 | 0.476 | -0.38 | -0.0124 | 0.691 | 0.49 |
b_veh_per_driver_kid_act | b_female_kid_act | 0.688 | 0.0117 | 1.25 | 0.213 | 0.446 | 0.00718 | 1.21 | 0.228 |
b_veh_per_driver_kid_act | b_female_kid_car | -1.08 | -0.0467 | -1.82 | 0.069 | 0.151 | 0.00919 | -1.81 | 0.0697 |
b_veh_per_driver_kid_act | b_female_par_act | 0.941 | 0.00865 | -0.319 | 0.749 | 0.871 | 0.00758 | -0.314 | 0.754 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 1.85 | 0.0299 | -4.84 | 1.28e-06 | -0.0248 | -0.000383 | -4.64 | 3.41e-06 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_car | 3.25 | 0.0615 | -2.55 | 0.0109 | 0.334 | 0.0175 | -2.91 | 0.00361 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | 0.361 | 0.00318 | -1.44 | 0.15 | 1.01 | 0.00846 | -1.43 | 0.153 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | -0.139 | -0.00224 | -3.64 | 0.000269 | -2.17 | -0.0334 | -3.49 | 0.000487 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_car | 3.5 | 0.0617 | -2.54 | 0.0112 | 0.179 | 0.00969 | -2.98 | 0.00287 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | -0.0685 | -0.000601 | -2.96 | 0.00309 | -0.481 | -0.00402 | -2.92 | 0.0035 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 1.43 | 0.0624 | -4.21 | 2.56e-05 | 1.2 | 0.0475 | -3.98 | 6.98e-05 |
b_veh_per_driver_kid_act | b_log_density_kid_car | -0.458 | -0.0493 | -2.09 | 0.0363 | -0.0188 | -0.00324 | -2.01 | 0.0441 |
b_veh_per_driver_kid_act | b_log_density_par_act | 0.028 | 0.000528 | -5.63 | 1.79e-08 | -0.125 | -0.00191 | -5.1 | 3.47e-07 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 0.617 | 0.0121 | 14.1 | 0 | 1.36 | 0.0243 | 13.6 | 0 |
b_veh_per_driver_kid_act | b_log_distance_kid_car | -1.17 | -0.0501 | -1.81 | 0.0697 | 0.327 | 0.0191 | -1.81 | 0.0698 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 3.15 | 0.0353 | 11.5 | 0 | 4.03 | 0.0415 | 11.1 | 0 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -5.43 | -0.158 | -1.4 | 0.163 | -5.55 | -0.152 | -1.34 | 0.179 |
b_veh_per_driver_kid_act | b_log_income_k_kid_car | -0.269 | -0.0248 | -2.16 | 0.0311 | 0.0835 | 0.00779 | -2.06 | 0.0393 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -1.57 | -0.0262 | -2.23 | 0.0255 | -1.95 | -0.0306 | -2.16 | 0.0309 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 3.94 | 0.0416 | -0.523 | 0.601 | 3.2 | 0.0323 | -0.514 | 0.608 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_car | -0.616 | -0.0215 | -1.89 | 0.0587 | 0.099 | 0.00346 | -1.84 | 0.0661 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 2.21 | 0.0133 | -1.76 | 0.0791 | 0.328 | 0.00197 | -1.81 | 0.0703 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | 0.957 | 0.0151 | -0.459 | 0.646 | 3.56 | 0.0537 | -0.457 | 0.648 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_car | -3.98 | -0.0614 | -0.797 | 0.425 | -0.375 | -0.0187 | -1.05 | 0.296 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | 0.346 | 0.00303 | -3.68 | 0.00023 | 1.38 | 0.0116 | -3.67 | 0.000239 |
b_veh_per_driver_kid_car | asc_kid_act | 0.00139 | 0.00084 | 2.32 | 0.0201 | -0.00159 | -0.00208 | 5.08 | 3.69e-07 |
b_veh_per_driver_kid_car | asc_kid_car | -1.72 | -0.905 | 1.12 | 0.264 | -0.00551 | -0.0269 | 2.72 | 0.00653 |
b_veh_per_driver_kid_car | asc_par_act | 0.011 | 0.00319 | 2.4 | 0.0164 | 0.00443 | 0.00259 | 4.92 | 8.64e-07 |
b_veh_per_driver_kid_car | b_age_kid_act | 0.743 | 0.1 | -4.48 | 7.42e-06 | -0.00912 | -0.00274 | -7.66 | 1.89e-14 |
b_veh_per_driver_kid_car | b_age_kid_car | 6.1 | 0.872 | 0.958 | 0.338 | -0.154 | -0.151 | 1.36 | 0.174 |
b_veh_per_driver_kid_car | b_age_par_act | 0.615 | 0.038 | 5.28 | 1.28e-07 | -0.0212 | -0.00311 | 7.28 | 3.27e-13 |
b_veh_per_driver_kid_car | b_female_kid_act | -0.934 | -0.0306 | 4.32 | 1.59e-05 | 0.127 | 0.00923 | 4.9 | 9.36e-07 |
b_veh_per_driver_kid_car | b_female_kid_car | -7.98 | -0.661 | 1.11 | 0.269 | -0.0523 | -0.0144 | 2.64 | 0.00828 |
b_veh_per_driver_kid_car | b_female_par_act | -0.748 | -0.0132 | 1.29 | 0.197 | 0.045 | 0.00177 | 1.34 | 0.18 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_act | 2.86 | 0.0888 | -3.59 | 0.000326 | -0.0404 | -0.00281 | -3.85 | 0.000116 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_car | 23.9 | 0.868 | -0.748 | 0.455 | -0.295 | -0.0698 | -0.866 | 0.387 |
b_veh_per_driver_kid_car | b_has_big_sib_par_act | 2.32 | 0.0392 | -0.00805 | 0.994 | -0.0477 | -0.00181 | -0.0083 | 0.993 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_act | 3.05 | 0.0948 | -2.1 | 0.0356 | -0.151 | -0.0105 | -2.24 | 0.0253 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_car | 25.7 | 0.871 | -0.837 | 0.403 | -0.423 | -0.104 | -1.08 | 0.282 |
b_veh_per_driver_kid_car | b_has_lil_sib_par_act | 2.47 | 0.0417 | -1.72 | 0.0859 | -0.181 | -0.00681 | -1.76 | 0.0782 |
b_veh_per_driver_kid_car | b_log_density_kid_act | -0.462 | -0.0388 | -2.41 | 0.0158 | -0.00874 | -0.00156 | -3.56 | 0.000369 |
b_veh_per_driver_kid_car | b_log_density_kid_car | -3.41 | -0.706 | 1.13 | 0.26 | 0.134 | 0.104 | 2.94 | 0.00324 |
b_veh_per_driver_kid_car | b_log_density_par_act | -0.371 | -0.0135 | -4.56 | 5.14e-06 | -0.0219 | -0.00151 | -4.51 | 6.44e-06 |
b_veh_per_driver_kid_car | b_log_distance_kid_act | -1.02 | -0.0382 | 21.8 | 0 | 0.117 | 0.00943 | 24.8 | 0 |
b_veh_per_driver_kid_car | b_log_distance_kid_car | -8.38 | -0.688 | 1.09 | 0.274 | -0.21 | -0.0555 | 2.54 | 0.0112 |
b_veh_per_driver_kid_car | b_log_distance_par_act | -0.808 | -0.0174 | 15 | 0 | 0.101 | 0.00468 | 15.5 | 0 |
b_veh_per_driver_kid_car | b_log_income_k_kid_act | -0.312 | -0.0174 | 1.57 | 0.117 | 0.0446 | 0.00553 | 2.04 | 0.0412 |
b_veh_per_driver_kid_car | b_log_income_k_kid_car | -1.9 | -0.337 | 1.08 | 0.282 | -0.222 | -0.0935 | 2.2 | 0.0276 |
b_veh_per_driver_kid_car | b_log_income_k_par_act | -0.212 | -0.00678 | -0.208 | 0.835 | -0.0152 | -0.00108 | -0.232 | 0.817 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_ace | -0.419 | -0.0085 | 1.28 | 0.202 | 0.105 | 0.00477 | 1.36 | 0.175 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_car | -4.64 | -0.311 | 0.982 | 0.326 | 0.11 | 0.0174 | 1.62 | 0.104 |
b_veh_per_driver_kid_car | b_non_work_dad_par_act | -0.35 | -0.00405 | -0.733 | 0.463 | -0.0106 | -0.000288 | -0.784 | 0.433 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_act | -3.28 | -0.0994 | 1.95 | 0.0513 | 0.127 | 0.00868 | 2.27 | 0.0235 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_car | -29.2 | -0.868 | 1.16 | 0.245 | 1.04 | 0.234 | 5.21 | 1.93e-07 |
b_veh_per_driver_kid_car | b_non_work_mom_par_act | -2.69 | -0.0453 | -2.46 | 0.0137 | 0.227 | 0.0086 | -2.61 | 0.00901 |
b_veh_per_driver_kid_car | b_veh_per_driver_kid_act | 2.52 | 0.0728 | 2.59 | 0.00953 | 0.0651 | 0.00398 | 2.63 | 0.00861 |
b_veh_per_driver_par_act | asc_kid_act | -0.243 | -0.0323 | -5.57 | 2.62e-08 | -0.203 | -0.022 | -4.67 | 3.02e-06 |
b_veh_per_driver_par_act | asc_kid_car | -0.185 | -0.0215 | -5.81 | 6.23e-09 | 0.00897 | 0.00364 | -4.88 | 1.07e-06 |
b_veh_per_driver_par_act | asc_par_act | -3.07 | -0.197 | -5.5 | 3.88e-08 | -5.84 | -0.283 | -4.6 | 4.27e-06 |
b_veh_per_driver_par_act | b_age_kid_act | -0.0417 | -0.00124 | -7.09 | 1.37e-12 | -0.0653 | -0.00163 | -5.95 | 2.66e-09 |
b_veh_per_driver_par_act | b_age_kid_car | 0.654 | 0.0206 | -5.93 | 3.06e-09 | -0.0124 | -0.00101 | -4.98 | 6.33e-07 |
b_veh_per_driver_par_act | b_age_par_act | 2.59 | 0.0354 | -4.49 | 7.15e-06 | 6 | 0.0732 | -3.81 | 0.000139 |
b_veh_per_driver_par_act | b_female_kid_act | 0.638 | 0.00461 | -3.92 | 8.88e-05 | 0.357 | 0.00216 | -3.35 | 0.000821 |
b_veh_per_driver_par_act | b_female_kid_car | -0.85 | -0.0155 | -5.64 | 1.72e-08 | 0.374 | 0.00856 | -4.78 | 1.77e-06 |
b_veh_per_driver_par_act | b_female_par_act | 9.47 | 0.037 | -4.3 | 1.73e-05 | 14 | 0.0456 | -3.8 | 0.000145 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | 0.81 | 0.00556 | -7.13 | 1.02e-12 | 2.05 | 0.0119 | -6.11 | 9.69e-10 |
b_veh_per_driver_par_act | b_has_big_sib_kid_car | 2.56 | 0.0205 | -5.93 | 3e-09 | -0.184 | -0.00361 | -5.19 | 2.08e-07 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | -3.07 | -0.0114 | -4.9 | 9.52e-07 | 8.34 | 0.0263 | -4.42 | 9.77e-06 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | 0.337 | 0.00231 | -6.51 | 7.36e-11 | 0.183 | 0.00105 | -5.57 | 2.5e-08 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_car | 2.76 | 0.0206 | -5.92 | 3.24e-09 | -0.316 | -0.00644 | -5.22 | 1.79e-07 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -7.62 | -0.0284 | -5.88 | 3.99e-09 | 6.69 | 0.0209 | -5.33 | 9.58e-08 |
b_veh_per_driver_par_act | b_log_density_kid_act | 0.188 | 0.0035 | -6.67 | 2.59e-11 | 0.498 | 0.00739 | -5.61 | 2.04e-08 |
b_veh_per_driver_par_act | b_log_density_kid_car | -0.359 | -0.0164 | -5.77 | 7.91e-09 | 0.0552 | 0.00357 | -4.85 | 1.22e-06 |
b_veh_per_driver_par_act | b_log_density_par_act | 11.8 | 0.0945 | -7.75 | 9.55e-15 | 22.2 | 0.127 | -6.57 | 5.03e-11 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.968 | 0.00803 | 2.53 | 0.0115 | -0.469 | -0.00316 | 2.14 | 0.0326 |
b_veh_per_driver_par_act | b_log_distance_kid_car | -0.922 | -0.0167 | -5.63 | 1.75e-08 | 0.0386 | 0.000847 | -4.77 | 1.81e-06 |
b_veh_per_driver_par_act | b_log_distance_par_act | 1.59 | 0.00754 | 2.76 | 0.00574 | -18.1 | -0.0697 | 2.32 | 0.0204 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -1.2 | -0.0148 | -5.44 | 5.21e-08 | -2.69 | -0.0277 | -4.59 | 4.46e-06 |
b_veh_per_driver_par_act | b_log_income_k_kid_car | -0.209 | -0.00815 | -5.8 | 6.79e-09 | -0.0128 | -0.000448 | -4.87 | 1.12e-06 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -39.9 | -0.282 | -5.29 | 1.23e-07 | -51.2 | -0.302 | -4.54 | 5.53e-06 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 2.21 | 0.0099 | -4.52 | 6.15e-06 | -0.00872 | -3.3e-05 | -3.94 | 8.11e-05 |
b_veh_per_driver_par_act | b_non_work_dad_kid_car | -0.485 | -0.00718 | -5.66 | 1.5e-08 | 0.13 | 0.0017 | -4.78 | 1.71e-06 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 31.8 | 0.0813 | -4.92 | 8.6e-07 | -13.5 | -0.0304 | -4.34 | 1.44e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | 0.105 | 0.000703 | -4.77 | 1.8e-06 | 1.86 | 0.0105 | -4.11 | 4.02e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_car | -3.13 | -0.0205 | -4.93 | 8.4e-07 | 0.186 | 0.00349 | -4.48 | 7.39e-06 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | 9.99 | 0.0371 | -6.57 | 5.03e-11 | 16.9 | 0.0533 | -5.87 | 4.35e-09 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 26.1 | 0.167 | -4.79 | 1.66e-06 | 24.1 | 0.122 | -4 | 6.37e-05 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_car | 1.95 | 0.024 | -5.97 | 2.34e-09 | -0.0812 | -0.00187 | -5.09 | 3.66e-07 |
b_y2017_kid_act | asc_kid_act | -0.283 | -0.0962 | -2.02 | 0.0439 | -0.44 | -0.147 | -2.04 | 0.0417 |
b_y2017_kid_act | asc_kid_car | 0.119 | 0.0352 | -2.65 | 0.00797 | -0.00523 | -0.00654 | -2.69 | 0.0072 |
b_y2017_kid_act | asc_par_act | -0.361 | -0.059 | -1.94 | 0.0519 | -0.254 | -0.0379 | -1.97 | 0.0488 |
b_y2017_kid_act | b_age_kid_act | 0.129 | 0.00982 | -5.83 | 5.52e-09 | 1.54 | 0.119 | -6.05 | 1.4e-09 |
b_y2017_kid_act | b_age_kid_car | -0.438 | -0.0352 | -2.88 | 0.00396 | -0.0641 | -0.0161 | -3 | 0.0027 |
b_y2017_kid_act | b_age_par_act | 1.37 | 0.0477 | 0.531 | 0.595 | 1.05 | 0.0396 | 0.541 | 0.588 |
b_y2017_kid_act | b_female_kid_act | 1.22 | 0.0224 | 1.11 | 0.268 | -0.562 | -0.0105 | 1.1 | 0.273 |
b_y2017_kid_act | b_female_kid_car | 0.587 | 0.0274 | -2.26 | 0.0241 | 0.149 | 0.0105 | -2.35 | 0.0187 |
b_y2017_kid_act | b_female_par_act | -1.22 | -0.0122 | -0.457 | 0.648 | -2.14 | -0.0215 | -0.456 | 0.649 |
b_y2017_kid_act | b_has_big_sib_kid_act | 2.86 | 0.0502 | -5.3 | 1.17e-07 | 4.95 | 0.0883 | -5.46 | 4.86e-08 |
b_y2017_kid_act | b_has_big_sib_kid_car | -1.69 | -0.0346 | -2.75 | 0.00597 | -0.121 | -0.00735 | -3.57 | 0.00035 |
b_y2017_kid_act | b_has_big_sib_par_act | 2.22 | 0.0211 | -1.61 | 0.108 | 1.69 | 0.0164 | -1.62 | 0.106 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 6.62 | 0.116 | -4.25 | 2.17e-05 | 6.44 | 0.114 | -4.27 | 1.93e-05 |
b_y2017_kid_act | b_has_lil_sib_kid_car | -1.79 | -0.0342 | -2.72 | 0.00645 | 0.417 | 0.0262 | -3.7 | 0.000217 |
b_y2017_kid_act | b_has_lil_sib_par_act | 2.98 | 0.0283 | -3.18 | 0.00145 | 3.41 | 0.033 | -3.21 | 0.00134 |
b_y2017_kid_act | b_log_density_kid_act | -0.437 | -0.0207 | -4.65 | 3.25e-06 | -0.113 | -0.00519 | -4.7 | 2.57e-06 |
b_y2017_kid_act | b_log_density_kid_car | 0.24 | 0.028 | -2.56 | 0.0105 | 0.0779 | 0.0155 | -2.61 | 0.00916 |
b_y2017_kid_act | b_log_density_par_act | 0.387 | 0.00792 | -6.13 | 8.66e-10 | 0.147 | 0.00258 | -5.7 | 1.18e-08 |
b_y2017_kid_act | b_log_distance_kid_act | -4.82 | -0.102 | 13.9 | 0 | -4.96 | -0.103 | 13.8 | 0 |
b_y2017_kid_act | b_log_distance_kid_car | 0.578 | 0.0267 | -2.25 | 0.0243 | -0.214 | -0.0145 | -2.33 | 0.0198 |
b_y2017_kid_act | b_log_distance_par_act | -10.1 | -0.122 | 10.9 | 0 | -7.51 | -0.0892 | 10.8 | 0 |
b_y2017_kid_act | b_log_income_k_kid_act | 0.0817 | 0.00257 | -1.82 | 0.069 | -0.272 | -0.00862 | -1.83 | 0.0678 |
b_y2017_kid_act | b_log_income_k_kid_car | 0.143 | 0.0142 | -2.61 | 0.00895 | 0.051 | 0.0055 | -2.65 | 0.00808 |
b_y2017_kid_act | b_log_income_k_par_act | -0.235 | -0.00423 | -2.55 | 0.0108 | -1.2 | -0.0218 | -2.54 | 0.0112 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 0.66 | 0.00754 | -0.677 | 0.499 | 0.968 | 0.0113 | -0.684 | 0.494 |
b_y2017_kid_act | b_non_work_dad_kid_car | 0.355 | 0.0134 | -2.3 | 0.0217 | -0.143 | -0.00576 | -2.33 | 0.02 |
b_y2017_kid_act | b_non_work_dad_par_act | -0.527 | -0.00343 | -1.86 | 0.0631 | -5.33 | -0.0369 | -1.92 | 0.0545 |
b_y2017_kid_act | b_non_work_mom_kid_act | 1.85 | 0.0316 | -0.676 | 0.499 | 0.022 | 0.000384 | -0.672 | 0.501 |
b_y2017_kid_act | b_non_work_mom_kid_car | 2.13 | 0.0355 | -1.06 | 0.288 | -0.35 | -0.0202 | -1.46 | 0.145 |
b_y2017_kid_act | b_non_work_mom_par_act | 0.0479 | 0.000454 | -3.88 | 0.000105 | 0.396 | 0.00384 | -3.93 | 8.61e-05 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -0.812 | -0.0132 | -0.185 | 0.853 | -0.343 | -0.00537 | -0.181 | 0.856 |
b_y2017_kid_act | b_veh_per_driver_kid_car | -1.07 | -0.0336 | -2.87 | 0.00409 | -0.0283 | -0.002 | -3.28 | 0.00104 |
b_y2017_kid_act | b_veh_per_driver_par_act | -1.24 | -0.00858 | 4.43 | 9.32e-06 | 1.33 | 0.00781 | 3.82 | 0.000134 |
b_y2017_kid_car | asc_kid_act | -0.00683 | -0.00566 | 0.813 | 0.416 | -0.00796 | -0.00947 | 1.19 | 0.235 |
b_y2017_kid_car | asc_kid_car | 0.997 | 0.72 | -0.78 | 0.435 | 0.0246 | 0.11 | -1.04 | 0.296 |
b_y2017_kid_car | asc_par_act | -0.0124 | -0.00494 | 0.934 | 0.35 | -0.0172 | -0.00917 | 1.31 | 0.191 |
b_y2017_kid_car | b_age_kid_act | -0.447 | -0.0828 | -7.4 | 1.37e-13 | -0.0883 | -0.0242 | -9.86 | 0 |
b_y2017_kid_car | b_age_kid_car | -3.65 | -0.716 | -1.03 | 0.301 | -0.0643 | -0.0576 | -2.09 | 0.0364 |
b_y2017_kid_car | b_age_par_act | -0.358 | -0.0304 | 4.46 | 8.37e-06 | 0.0254 | 0.0034 | 5.37 | 8.09e-08 |
b_y2017_kid_car | b_female_kid_act | 0.579 | 0.026 | 3.76 | 0.00017 | 0.222 | 0.0147 | 3.9 | 9.67e-05 |
b_y2017_kid_car | b_female_kid_car | 4.95 | 0.563 | -0.0699 | 0.944 | -0.00716 | -0.0018 | -0.0686 | 0.945 |
b_y2017_kid_car | b_female_par_act | 0.449 | 0.0109 | 0.788 | 0.431 | 0.024 | 0.000861 | 0.795 | 0.427 |
b_y2017_kid_car | b_has_big_sib_kid_act | -1.7 | -0.0727 | -4.45 | 8.43e-06 | -0.167 | -0.0106 | -4.76 | 1.93e-06 |
b_y2017_kid_car | b_has_big_sib_kid_car | -14.2 | -0.709 | -1.12 | 0.264 | -0.326 | -0.0702 | -3.16 | 0.00156 |
b_y2017_kid_car | b_has_big_sib_par_act | -1.35 | -0.0313 | -0.52 | 0.603 | 0.0179 | 0.000619 | -0.533 | 0.594 |
b_y2017_kid_car | b_has_lil_sib_kid_act | -1.79 | -0.0766 | -2.96 | 0.00308 | 0.396 | 0.025 | -3.19 | 0.00144 |
b_y2017_kid_car | b_has_lil_sib_kid_car | -15.1 | -0.701 | -1.13 | 0.259 | -0.644 | -0.144 | -3.31 | 0.000923 |
b_y2017_kid_car | b_has_lil_sib_par_act | -1.41 | -0.0328 | -2.23 | 0.0257 | 0.502 | 0.0173 | -2.29 | 0.0222 |
b_y2017_kid_car | b_log_density_kid_act | 0.279 | 0.0322 | -4.84 | 1.32e-06 | 0.128 | 0.0208 | -5.56 | 2.74e-08 |
b_y2017_kid_car | b_log_density_kid_car | 2.02 | 0.575 | -0.62 | 0.535 | -0.00793 | -0.00562 | -0.735 | 0.462 |
b_y2017_kid_car | b_log_density_par_act | 0.218 | 0.0109 | -6 | 2.02e-09 | 0.0946 | 0.00592 | -5.42 | 5.87e-08 |
b_y2017_kid_car | b_log_distance_kid_act | 0.577 | 0.0298 | 23.2 | 0 | -0.112 | -0.00826 | 23.4 | 0 |
b_y2017_kid_car | b_log_distance_kid_car | 4.78 | 0.539 | -0.065 | 0.948 | 0.142 | 0.0342 | -0.0657 | 0.948 |
b_y2017_kid_car | b_log_distance_par_act | 0.441 | 0.013 | 15 | 0 | -0.198 | -0.00838 | 14.8 | 0 |
b_y2017_kid_car | b_log_income_k_kid_act | 0.184 | 0.0141 | 0.407 | 0.684 | 0.0605 | 0.00682 | 0.449 | 0.654 |
b_y2017_kid_car | b_log_income_k_kid_car | 1.19 | 0.289 | -0.715 | 0.474 | -0.072 | -0.0276 | -0.869 | 0.385 |
b_y2017_kid_car | b_log_income_k_par_act | 0.123 | 0.00539 | -1.14 | 0.252 | 0.101 | 0.00653 | -1.19 | 0.235 |
b_y2017_kid_car | b_non_work_dad_kid_ace | 0.283 | 0.00788 | 0.706 | 0.48 | -0.16 | -0.00664 | 0.722 | 0.47 |
b_y2017_kid_car | b_non_work_dad_kid_car | 2.98 | 0.274 | -0.295 | 0.768 | 0.201 | 0.0289 | -0.303 | 0.762 |
b_y2017_kid_car | b_non_work_dad_par_act | 0.228 | 0.00362 | -1.1 | 0.272 | 0.0705 | 0.00174 | -1.16 | 0.246 |
b_y2017_kid_car | b_non_work_mom_kid_act | 2.01 | 0.0838 | 1.31 | 0.192 | -0.273 | -0.0169 | 1.32 | 0.186 |
b_y2017_kid_car | b_non_work_mom_kid_car | 17.8 | 0.727 | 1.05 | 0.294 | 0.746 | 0.153 | 2.22 | 0.0266 |
b_y2017_kid_car | b_non_work_mom_par_act | 1.6 | 0.0371 | -3.08 | 0.00205 | -0.52 | -0.0179 | -3.12 | 0.0018 |
b_y2017_kid_car | b_veh_per_driver_kid_act | -1.23 | -0.0489 | 1.78 | 0.0756 | -0.205 | -0.0114 | 1.78 | 0.0758 |
b_y2017_kid_car | b_veh_per_driver_kid_car | -9.08 | -0.694 | -1.09 | 0.276 | -0.04 | -0.0101 | -2.59 | 0.00951 |
b_y2017_kid_car | b_veh_per_driver_par_act | -0.946 | -0.016 | 5.62 | 1.96e-08 | -0.127 | -0.00265 | 4.76 | 1.92e-06 |
b_y2017_kid_car | b_y2017_kid_act | 1.12 | 0.0483 | 2.23 | 0.026 | 0.534 | 0.0344 | 2.33 | 0.0199 |
b_y2017_par_act | asc_kid_act | -0.107 | -0.0143 | 14.4 | 0 | -0.0176 | -0.00231 | 14.5 | 0 |
b_y2017_par_act | asc_kid_car | 0.102 | 0.0119 | 14.1 | 0 | -0.0065 | -0.00319 | 14.2 | 0 |
b_y2017_par_act | asc_par_act | -3.8 | -0.245 | 14.2 | 0 | -4.67 | -0.274 | 14.3 | 0 |
b_y2017_par_act | b_age_kid_act | 0.475 | 0.0142 | 12.8 | 0 | 0.594 | 0.0179 | 12.9 | 0 |
b_y2017_par_act | b_age_kid_car | -0.371 | -0.0118 | 13.9 | 0 | -0.0385 | -0.0038 | 14.1 | 0 |
b_y2017_par_act | b_age_par_act | -5.37 | -0.0737 | 14.9 | 0 | -1.53 | -0.0225 | 15.2 | 0 |
b_y2017_par_act | b_female_kid_act | 0.261 | 0.0019 | 14.8 | 0 | -1.88 | -0.0137 | 14.8 | 0 |
b_y2017_par_act | b_female_kid_car | 0.498 | 0.00915 | 14.1 | 0 | 0.0203 | 0.000561 | 14.3 | 0 |
b_y2017_par_act | b_female_par_act | 0.613 | 0.00241 | 12.2 | 0 | 26 | 0.103 | 12.8 | 0 |
b_y2017_par_act | b_has_big_sib_kid_act | 0.455 | 0.00314 | 11.4 | 0 | 1.3 | 0.00911 | 11.5 | 0 |
b_y2017_par_act | b_has_big_sib_kid_car | -1.45 | -0.0117 | 13 | 0 | -0.118 | -0.0028 | 13.7 | 0 |
b_y2017_par_act | b_has_big_sib_par_act | 16.2 | 0.0608 | 11.5 | 0 | 1.55 | 0.00591 | 11.3 | 0 |
b_y2017_par_act | b_has_lil_sib_kid_act | 1.5 | 0.0104 | 12.1 | 0 | 0.877 | 0.00611 | 12.1 | 0 |
b_y2017_par_act | b_has_lil_sib_kid_car | -1.54 | -0.0116 | 12.8 | 0 | 0.476 | 0.0117 | 13.7 | 0 |
b_y2017_par_act | b_has_lil_sib_par_act | 28.7 | 0.107 | 10.7 | 0 | 27.5 | 0.104 | 10.8 | 0 |
b_y2017_par_act | b_log_density_kid_act | -0.857 | -0.016 | 13 | 0 | -0.612 | -0.011 | 13.1 | 0 |
b_y2017_par_act | b_log_density_kid_car | 0.202 | 0.00928 | 14.2 | 0 | 0.0603 | 0.00471 | 14.3 | 0 |
b_y2017_par_act | b_log_density_par_act | 8.97 | 0.0723 | 11.6 | 0 | -4.8 | -0.0331 | 11.1 | 0 |
b_y2017_par_act | b_log_distance_kid_act | -1.67 | -0.0139 | 21.4 | 0 | 0.605 | 0.00491 | 21.6 | 0 |
b_y2017_par_act | b_log_distance_kid_car | 0.499 | 0.00909 | 14.1 | 0 | -0.502 | -0.0133 | 14.3 | 0 |
b_y2017_par_act | b_log_distance_par_act | -49.8 | -0.238 | 18.3 | 0 | -63.8 | -0.297 | 17.8 | 0 |
b_y2017_par_act | b_log_income_k_kid_act | 0.0231 | 0.000286 | 14 | 0 | -1.82 | -0.0226 | 14.1 | 0 |
b_y2017_par_act | b_log_income_k_kid_car | 0.121 | 0.00476 | 14.1 | 0 | 0.0253 | 0.00107 | 14.2 | 0 |
b_y2017_par_act | b_log_income_k_par_act | -3.21 | -0.0228 | 12.8 | 0 | 23.9 | 0.17 | 13.7 | 0 |
b_y2017_par_act | b_non_work_dad_kid_ace | -1 | -0.00452 | 12.5 | 0 | -6.95 | -0.0318 | 12.5 | 0 |
b_y2017_par_act | b_non_work_dad_kid_car | 0.297 | 0.00442 | 14 | 0 | 0.184 | 0.00291 | 14.1 | 0 |
b_y2017_par_act | b_non_work_dad_par_act | 12.6 | 0.0323 | 9.08 | 0 | 14.3 | 0.0389 | 9.38 | 0 |
b_y2017_par_act | b_non_work_mom_kid_act | 0.0388 | 0.000262 | 13.7 | 0 | -0.425 | -0.00291 | 13.8 | 0 |
b_y2017_par_act | b_non_work_mom_kid_car | 1.81 | 0.0119 | 13.5 | 0 | -0.538 | -0.0122 | 14.6 | 0 |
b_y2017_par_act | b_non_work_mom_par_act | 12.4 | 0.0465 | 9.86 | 0 | 31.1 | 0.118 | 10.3 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_act | 0.034 | 0.000218 | 13.9 | 0 | 0.0831 | 0.000511 | 13.8 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_car | -0.915 | -0.0113 | 13.5 | 0 | -0.0588 | -0.00163 | 13.9 | 0 |
b_y2017_par_act | b_veh_per_driver_par_act | -10.5 | -0.0285 | 13.9 | 0 | 28.6 | 0.0659 | 13.3 | 0 |
b_y2017_par_act | b_y2017_kid_act | 24.8 | 0.172 | 15 | 0 | 23.1 | 0.164 | 15.1 | 0 |
b_y2017_par_act | b_y2017_kid_car | 0.96 | 0.0163 | 14.1 | 0 | 0.386 | 0.00976 | 14.3 | 0 |
mu_car | asc_kid_act | -0.00839 | -0.00427 | 2.22 | 0.0265 | -0.00196 | -0.00934 | 16.9 | 0 |
mu_car | asc_kid_car | 2.2 | 0.974 | 1.41 | 0.157 | 0.0227 | 0.406 | 13.3 | 0 |
mu_car | asc_par_act | -0.0191 | -0.00467 | 2.29 | 0.0223 | -0.00988 | -0.0211 | 11.1 | 0 |
mu_car | b_age_kid_act | -0.973 | -0.111 | -3.37 | 0.000763 | -0.0238 | -0.0261 | -10.1 | 0 |
mu_car | b_age_kid_car | -7.98 | -0.961 | 0.616 | 0.538 | -0.107 | -0.385 | 4.65 | 3.34e-06 |
mu_car | b_age_par_act | -0.809 | -0.0422 | 4.79 | 1.65e-06 | -0.000664 | -0.000356 | 8.53 | 0 |
mu_car | b_female_kid_act | 1.23 | 0.0339 | 4.38 | 1.19e-05 | 0.0652 | 0.0173 | 5.23 | 1.67e-07 |
mu_car | b_female_kid_car | 10.4 | 0.729 | 2.39 | 0.0167 | -0.104 | -0.105 | 4.17 | 3.07e-05 |
mu_car | b_female_par_act | 0.991 | 0.0148 | 1.37 | 0.171 | 0.118 | 0.017 | 1.45 | 0.147 |
mu_car | b_has_big_sib_kid_act | -3.7 | -0.0972 | -3.02 | 0.00249 | 0.00924 | 0.00235 | -3.8 | 0.000146 |
mu_car | b_has_big_sib_kid_car | -30.9 | -0.948 | -0.117 | 0.907 | -0.411 | -0.355 | -0.539 | 0.59 |
mu_car | b_has_big_sib_par_act | -3.02 | -0.0431 | 0.0785 | 0.937 | -0.0173 | -0.00239 | 0.085 | 0.932 |
mu_car | b_has_lil_sib_kid_act | -3.97 | -0.104 | -1.7 | 0.0887 | 0.0145 | 0.00367 | -2.14 | 0.0327 |
mu_car | b_has_lil_sib_kid_car | -33.4 | -0.954 | -0.164 | 0.87 | -0.308 | -0.275 | -0.831 | 0.406 |
mu_car | b_has_lil_sib_par_act | -3.23 | -0.0459 | -1.56 | 0.119 | 0.0358 | 0.00492 | -1.69 | 0.0919 |
mu_car | b_log_density_kid_act | 0.613 | 0.0435 | -1.98 | 0.0476 | 0.0354 | 0.0231 | -3.76 | 0.000169 |
mu_car | b_log_density_kid_car | 4.49 | 0.784 | 1.68 | 0.093 | -0.00347 | -0.00985 | 8.21 | 2.22e-16 |
mu_car | b_log_density_par_act | 0.492 | 0.0151 | -4.21 | 2.61e-05 | 0.0555 | 0.0139 | -4.47 | 7.64e-06 |
mu_car | b_log_distance_kid_act | 1.32 | 0.0417 | 21.5 | 0 | 0.112 | 0.0331 | 26 | 0 |
mu_car | b_log_distance_kid_car | 10.8 | 0.751 | 2.46 | 0.0137 | 0.411 | 0.396 | 4.59 | 4.5e-06 |
mu_car | b_log_distance_par_act | 1.06 | 0.0192 | 15 | 0 | -0.0089 | -0.00151 | 15.8 | 0 |
mu_car | b_log_income_k_kid_act | 0.376 | 0.0177 | 1.66 | 0.0979 | 0.0535 | 0.0242 | 2.53 | 0.0115 |
mu_car | b_log_income_k_kid_car | 2.39 | 0.356 | 1.38 | 0.167 | 0.05 | 0.0769 | 4.96 | 7.12e-07 |
mu_car | b_log_income_k_par_act | 0.258 | 0.00697 | -0.0542 | 0.957 | 0.0611 | 0.0158 | -0.0649 | 0.948 |
mu_car | b_non_work_dad_kid_ace | 0.591 | 0.0101 | 1.36 | 0.175 | -0.0847 | -0.0141 | 1.48 | 0.138 |
mu_car | b_non_work_dad_kid_car | 6.25 | 0.353 | 1.49 | 0.136 | -0.0726 | -0.0418 | 2.2 | 0.0276 |
mu_car | b_non_work_dad_par_act | 0.496 | 0.00484 | -0.667 | 0.505 | 0.0146 | 0.00144 | -0.721 | 0.471 |
mu_car | b_non_work_mom_kid_act | 4.3 | 0.11 | 2.19 | 0.0283 | -0.0339 | -0.00843 | 2.49 | 0.0128 |
mu_car | b_non_work_mom_kid_car | 38.3 | 0.959 | 4.38 | 1.17e-05 | 0.346 | 0.285 | 6.72 | 1.82e-11 |
mu_car | b_non_work_mom_par_act | 3.55 | 0.0504 | -2.41 | 0.0161 | -0.0791 | -0.0109 | -2.54 | 0.0112 |
mu_car | b_veh_per_driver_kid_act | -2.64 | -0.0644 | 2.48 | 0.0132 | -0.184 | -0.0412 | 2.83 | 0.00469 |
mu_car | b_veh_per_driver_kid_car | -19.4 | -0.909 | 0.143 | 0.886 | 0.361 | 0.364 | 0.728 | 0.467 |
mu_car | b_veh_per_driver_par_act | -2.08 | -0.0215 | 5.92 | 3.2e-09 | 0.178 | 0.0149 | 5.16 | 2.45e-07 |
mu_car | b_y2017_kid_act | 1.4 | 0.0369 | 2.97 | 0.00294 | 0.0158 | 0.00407 | 3.55 | 0.000381 |
mu_car | b_y2017_kid_car | 11.7 | 0.756 | 2.57 | 0.0101 | 0.481 | 0.442 | 4.52 | 6.16e-06 |
mu_car | b_y2017_par_act | 1.19 | 0.0124 | -13.4 | 0 | -0.0209 | -0.00211 | -13.9 | 0 |
Smallest eigenvalue: 0.00226829
+Largest eigenvalue: 10862.1
+Condition number: 4.78868e+06
+ \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/car-nest/mode_nests.pickle b/models/IATBR plan/4 alternatives/car-nest/mode_nests.pickle new file mode 100644 index 0000000..8d7c0c6 Binary files /dev/null and b/models/IATBR plan/4 alternatives/car-nest/mode_nests.pickle differ diff --git a/models/IATBR plan/4 alternatives/car-nest/mode_nests~00.html b/models/IATBR plan/4 alternatives/car-nest/mode_nests~00.html new file mode 100644 index 0000000..c68c536 --- /dev/null +++ b/models/IATBR plan/4 alternatives/car-nest/mode_nests~00.html @@ -0,0 +1,810 @@ + + + + +biogeme 3.2.13 [2024-04-09]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-09 16:36:58.001930
+Report file: | mode_nests~00.html |
Database name: | est |
The second derivatives matrix is close to singularity. The smallest eigenvalue is 7.82e-06. This warning is triggered when it is smaller than the parameter identification_threshold
=1e-05.
Variables involved:
-0.00162 | * | asc_kid_car |
1.39e-05 | * | asc_par_act |
0.00071 | * | b_age_kid_act |
0.00585 | * | b_age_kid_car |
0.000592 | * | b_age_par_act |
-0.00092 | * | b_female_kid_act |
-0.00783 | * | b_female_kid_car |
-0.000743 | * | b_female_par_act |
0.0027 | * | b_has_big_sib_kid_act |
0.0227 | * | b_has_big_sib_kid_car |
0.00221 | * | b_has_big_sib_par_act |
0.00292 | * | b_has_lil_sib_kid_act |
0.0247 | * | b_has_lil_sib_kid_car |
0.00238 | * | b_has_lil_sib_par_act |
-0.000459 | * | b_log_density_kid_act |
-0.00338 | * | b_log_density_kid_car |
-0.000369 | * | b_log_density_par_act |
-0.000924 | * | b_log_distance_kid_act |
-0.00766 | * | b_log_distance_kid_car |
-0.000739 | * | b_log_distance_par_act |
-0.000271 | * | b_log_income_k_kid_act |
-0.00169 | * | b_log_income_k_kid_car |
-0.000186 | * | b_log_income_k_par_act |
-0.000454 | * | b_non_work_dad_kid_ace |
-0.00479 | * | b_non_work_dad_kid_car |
-0.00038 | * | b_non_work_dad_par_act |
-0.00317 | * | b_non_work_mom_kid_act |
-0.0283 | * | b_non_work_mom_kid_car |
-0.00262 | * | b_non_work_mom_par_act |
0.00202 | * | b_veh_per_driver_kid_act |
0.0148 | * | b_veh_per_driver_kid_car |
0.00159 | * | b_veh_per_driver_par_act |
-0.000971 | * | b_y2017_kid_act |
-0.00818 | * | b_y2017_kid_car |
-0.00083 | * | b_y2017_par_act |
-0.999 | * | mu_car |
Number of estimated parameters: | 37 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -4220.381 |
Final log likelihood: | -4220.34 |
Likelihood ratio test for the init. model: | 0.08197703 |
Rho-square for the init. model: | 9.71e-06 |
Rho-square-bar for the init. model: | -0.00876 |
Akaike Information Criterion: | 8514.68 |
Bayesian Information Criterion: | 8755.144 |
Final gradient norm: | 2.1207E-02 |
Nbr of threads: | 12 |
Relative gradient: | 5.868405291226067e-06 |
Cause of termination: | Relative gradient = 5.9e-06 <= 6.1e-06 |
Number of function evaluations: | 248 |
Number of gradient evaluations: | 193 |
Number of hessian evaluations: | 192 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 247 |
Proportion of Hessian calculation: | 192/192 = 100.0% |
Optimization time: | 0:08:35.652993 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
asc_kid_act | -5.22 | 0.402 | -13 | 0 |
asc_kid_car | -0.0709 | 0.0802 | -0.884 | 0.377 |
asc_par_act | -5.68 | 0.9 | -6.31 | 2.83e-10 |
b_age_kid_act | 24.3 | 1.75 | 13.9 | 0 |
b_age_kid_car | 0.256 | 0.3 | 0.853 | 0.394 |
b_age_par_act | -25 | 3.58 | -7 | 2.54e-12 |
b_female_kid_act | -31.7 | 7.23 | -4.38 | 1.18e-05 |
b_female_kid_car | -0.344 | 0.417 | -0.824 | 0.41 |
b_female_par_act | -13.3 | 13.4 | -0.99 | 0.322 |
b_has_big_sib_kid_act | 33.9 | 7.55 | 4.5 | 6.86e-06 |
b_has_big_sib_kid_car | 0.993 | 1.17 | 0.848 | 0.397 |
b_has_big_sib_par_act | 4.17 | 13.9 | 0.301 | 0.763 |
b_has_lil_sib_kid_act | 21.4 | 7.57 | 2.82 | 0.00475 |
b_has_lil_sib_kid_car | 1.08 | 1.23 | 0.877 | 0.38 |
b_has_lil_sib_par_act | 28.8 | 13.9 | 2.07 | 0.0387 |
b_log_density_kid_act | 17.3 | 2.94 | 5.88 | 4.11e-09 |
b_log_density_kid_car | -0.148 | 0.178 | -0.833 | 0.405 |
b_log_density_par_act | 40.4 | 7.65 | 5.27 | 1.33e-07 |
b_log_distance_kid_act | -163 | 6.49 | -25.1 | 0 |
b_log_distance_kid_car | -0.334 | 0.512 | -0.653 | 0.514 |
b_log_distance_par_act | -173 | 11.3 | -15.3 | 0 |
b_log_income_k_kid_act | -4.73 | 4.24 | -1.11 | 0.265 |
b_log_income_k_kid_car | -0.0736 | 0.194 | -0.379 | 0.704 |
b_log_income_k_par_act | 6.5 | 7.42 | 0.876 | 0.381 |
b_non_work_dad_kid_ace | -11 | 11.5 | -0.957 | 0.338 |
b_non_work_dad_kid_car | -0.21 | 0.497 | -0.423 | 0.672 |
b_non_work_dad_par_act | 20.1 | 19.4 | 1.03 | 0.301 |
b_non_work_mom_kid_act | -12.4 | 7.71 | -1.61 | 0.107 |
b_non_work_mom_kid_car | -1.24 | 1.41 | -0.879 | 0.379 |
b_non_work_mom_par_act | 41.9 | 13.9 | 3.02 | 0.0025 |
b_veh_per_driver_kid_act | -19 | 8.59 | -2.21 | 0.0271 |
b_veh_per_driver_kid_car | 0.648 | 0.615 | 1.05 | 0.292 |
b_veh_per_driver_par_act | -113 | 22.9 | -4.92 | 8.63e-07 |
b_y2017_kid_act | -20.2 | 7.43 | -2.72 | 0.00649 |
b_y2017_kid_car | -0.357 | 0.558 | -0.64 | 0.522 |
b_y2017_par_act | 270 | 18.9 | 14.2 | 0 |
mu_car | 43.8 | 48.9 | 0.895 | 0.371 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_kid_car | asc_kid_act | -0.00127 | -0.00564 | 7.36 | 1.84e-13 | -0.000228 | -0.00706 | 12.5 | 0 |
asc_par_act | asc_kid_act | 0.0533 | 0.168 | -0.544 | 0.587 | 0.0549 | 0.152 | -0.492 | 0.623 |
asc_par_act | asc_kid_car | -0.00287 | -0.00611 | -5.61 | 2.06e-08 | -0.00145 | -0.0201 | -6.19 | 5.88e-10 |
b_age_kid_act | asc_kid_act | -0.373 | -0.543 | 14.8 | 0 | -0.376 | -0.534 | 14.8 | 0 |
b_age_kid_act | asc_kid_car | -0.147 | -0.144 | 12.6 | 0 | -0.0038 | -0.0271 | 13.9 | 0 |
b_age_kid_act | asc_par_act | -0.109 | -0.076 | 15 | 0 | -0.124 | -0.0787 | 14.8 | 0 |
b_age_kid_car | asc_kid_act | 0.00464 | 0.00568 | 2.58 | 0.00997 | 0.00132 | 0.011 | 11 | 0 |
b_age_kid_car | asc_kid_car | -1.21 | -1 | 0.122 | 0.903 | -0.0236 | -0.982 | 0.862 | 0.389 |
b_age_kid_car | asc_par_act | 0.0104 | 0.00612 | 2.65 | 0.00805 | 0.00585 | 0.0216 | 6.29 | 3.08e-10 |
b_age_kid_car | b_age_kid_act | 0.532 | 0.145 | -9.5 | 0 | 0.0116 | 0.022 | -13.6 | 0 |
b_age_par_act | asc_kid_act | -0.135 | -0.0906 | -5.12 | 3.1e-07 | -0.132 | -0.0915 | -5.45 | 4.99e-08 |
b_age_par_act | asc_kid_car | -0.123 | -0.0554 | -6.41 | 1.42e-10 | -0.000432 | -0.00151 | -6.98 | 2.97e-12 |
b_age_par_act | asc_par_act | -1.37 | -0.44 | -4.57 | 4.92e-06 | -1.39 | -0.433 | -4.78 | 1.73e-06 |
b_age_par_act | b_age_kid_act | 1.11 | 0.166 | -12.6 | 0 | 0.993 | 0.159 | -13.2 | 0 |
b_age_par_act | b_age_kid_car | 0.443 | 0.0555 | -5.95 | 2.65e-09 | -0.00182 | -0.00169 | -7.05 | 1.83e-12 |
b_female_kid_act | asc_kid_act | -0.16 | -0.0567 | -3.65 | 0.000263 | -0.158 | -0.0543 | -3.64 | 0.000271 |
b_female_kid_act | asc_kid_car | 0.19 | 0.0456 | -4.38 | 1.18e-05 | 0.0131 | 0.0226 | -4.37 | 1.23e-05 |
b_female_kid_act | asc_par_act | -0.0803 | -0.0137 | -3.57 | 0.000352 | 0.00018 | 2.77e-05 | -3.57 | 0.000361 |
b_female_kid_act | b_age_kid_act | -0.0841 | -0.00663 | -7.53 | 5.26e-14 | -0.175 | -0.0138 | -7.5 | 6.33e-14 |
b_female_kid_act | b_age_kid_car | -0.688 | -0.0456 | -4.2 | 2.68e-05 | -0.0505 | -0.0233 | -4.41 | 1.04e-05 |
b_female_kid_act | b_age_par_act | -0.0532 | -0.00193 | -0.809 | 0.418 | -0.608 | -0.0235 | -0.812 | 0.417 |
b_female_kid_car | asc_kid_act | -0.00633 | -0.00575 | 1.72 | 0.0862 | -0.00197 | -0.0117 | 8.37 | 0 |
b_female_kid_car | asc_kid_car | 1.62 | 0.995 | -0.122 | 0.903 | 0.0257 | 0.769 | -0.759 | 0.448 |
b_female_kid_car | asc_par_act | -0.014 | -0.00614 | 1.82 | 0.069 | -0.00893 | -0.0238 | 5.33 | 9.92e-08 |
b_female_kid_car | b_age_kid_act | -0.712 | -0.144 | -6.99 | 2.84e-12 | -0.0179 | -0.0246 | -13.6 | 0 |
b_female_kid_car | b_age_kid_car | -5.86 | -0.995 | -0.122 | 0.903 | -0.0957 | -0.763 | -0.888 | 0.374 |
b_female_kid_car | b_age_par_act | -0.593 | -0.0552 | 5.08 | 3.87e-07 | 0.0011 | 0.000737 | 6.86 | 6.94e-12 |
b_female_kid_car | b_female_kid_act | 0.93 | 0.0458 | 4.11 | 3.97e-05 | 0.0721 | 0.0239 | 4.33 | 1.48e-05 |
b_female_par_act | asc_kid_act | -0.0752 | -0.0144 | -0.601 | 0.548 | 0.0114 | 0.00211 | -0.6 | 0.549 |
b_female_par_act | asc_kid_car | 0.153 | 0.0199 | -0.988 | 0.323 | 0.0202 | 0.0188 | -0.985 | 0.325 |
b_female_par_act | asc_par_act | -0.663 | -0.0612 | -0.564 | 0.573 | -0.929 | -0.0771 | -0.562 | 0.574 |
b_female_par_act | b_age_kid_act | 0.113 | 0.0048 | -2.79 | 0.00525 | -0.335 | -0.0143 | -2.78 | 0.0055 |
b_female_par_act | b_age_kid_car | -0.555 | -0.0199 | -0.997 | 0.319 | -0.0733 | -0.0182 | -1.01 | 0.313 |
b_female_par_act | b_age_par_act | 0.32 | 0.00627 | 0.851 | 0.395 | 3.71 | 0.0775 | 0.869 | 0.385 |
b_female_par_act | b_female_kid_act | 18.2 | 0.189 | 1.32 | 0.186 | 18.3 | 0.19 | 1.32 | 0.187 |
b_female_par_act | b_female_kid_car | 0.75 | 0.02 | -0.95 | 0.342 | 0.105 | 0.0189 | -0.965 | 0.335 |
b_has_big_sib_kid_act | asc_kid_act | -0.632 | -0.213 | 5.09 | 3.62e-07 | -0.614 | -0.202 | 5.13 | 2.93e-07 |
b_has_big_sib_kid_act | asc_kid_car | -0.559 | -0.127 | 4.42 | 9.99e-06 | 0.000285 | 0.000471 | 4.51 | 6.57e-06 |
b_has_big_sib_kid_act | asc_par_act | -0.196 | -0.0318 | 5.16 | 2.43e-07 | -0.184 | -0.0271 | 5.2 | 2.02e-07 |
b_has_big_sib_kid_act | b_age_kid_act | 2.49 | 0.186 | 1.29 | 0.197 | 1.85 | 0.14 | 1.29 | 0.198 |
b_has_big_sib_kid_act | b_age_kid_car | 2.02 | 0.127 | 4.42 | 1e-05 | -0.0147 | -0.00649 | 4.46 | 8.22e-06 |
b_has_big_sib_kid_act | b_age_par_act | 0.868 | 0.0299 | 7.02 | 2.27e-12 | 0.863 | 0.032 | 7.15 | 8.5e-13 |
b_has_big_sib_kid_act | b_female_kid_act | -2.04 | -0.0373 | 6.15 | 7.96e-10 | -1.25 | -0.0229 | 6.21 | 5.37e-10 |
b_has_big_sib_kid_act | b_female_kid_car | -2.71 | -0.127 | 4.06 | 4.82e-05 | -0.0037 | -0.00118 | 4.54 | 5.72e-06 |
b_has_big_sib_kid_act | b_female_par_act | -0.59 | -0.00582 | 3.07 | 0.00217 | -0.747 | -0.0074 | 3.06 | 0.0022 |
b_has_big_sib_kid_car | asc_kid_act | 0.0181 | 0.00571 | 0.766 | 0.444 | 0.00568 | 0.0121 | 5.04 | 4.69e-07 |
b_has_big_sib_kid_car | asc_kid_car | -4.69 | -0.999 | 0.122 | 0.903 | -0.0907 | -0.966 | 0.852 | 0.394 |
b_has_big_sib_kid_car | asc_par_act | 0.0404 | 0.00614 | 0.819 | 0.413 | 0.0235 | 0.0223 | 4.57 | 4.96e-06 |
b_has_big_sib_kid_car | b_age_kid_act | 2.06 | 0.144 | -2.89 | 0.00379 | 0.0362 | 0.0177 | -11.2 | 0 |
b_has_big_sib_kid_car | b_age_kid_car | 17 | 0.999 | 0.122 | 0.903 | 0.338 | 0.96 | 0.831 | 0.406 |
b_has_big_sib_kid_car | b_age_par_act | 1.72 | 0.0554 | 2.97 | 0.00299 | -0.0145 | -0.00346 | 6.91 | 4.84e-12 |
b_has_big_sib_kid_car | b_female_kid_act | -2.67 | -0.0456 | 2.94 | 0.00326 | -0.195 | -0.023 | 4.44 | 8.83e-06 |
b_has_big_sib_kid_car | b_female_kid_car | -22.7 | -0.995 | 0.122 | 0.903 | -0.375 | -0.767 | 0.882 | 0.378 |
b_has_big_sib_kid_car | b_female_par_act | -2.15 | -0.0199 | 0.904 | 0.366 | -0.284 | -0.0181 | 1.06 | 0.29 |
b_has_big_sib_kid_car | b_has_big_sib_kid_act | 7.85 | 0.127 | -3.17 | 0.00152 | -0.000322 | -3.65e-05 | -4.31 | 1.6e-05 |
b_has_big_sib_par_act | asc_kid_act | -0.227 | -0.0417 | 0.672 | 0.502 | -0.212 | -0.0381 | 0.677 | 0.499 |
b_has_big_sib_par_act | asc_kid_car | -0.457 | -0.0566 | 0.303 | 0.762 | -0.00418 | -0.00376 | 0.306 | 0.76 |
b_has_big_sib_par_act | asc_par_act | -2.16 | -0.191 | 0.697 | 0.486 | -1.64 | -0.131 | 0.703 | 0.482 |
b_has_big_sib_par_act | b_age_kid_act | 0.775 | 0.0316 | -1.44 | 0.151 | 0.746 | 0.0308 | -1.45 | 0.148 |
b_has_big_sib_par_act | b_age_kid_car | 1.65 | 0.0566 | 0.28 | 0.78 | 0.00262 | 0.00063 | 0.282 | 0.778 |
b_has_big_sib_par_act | b_age_par_act | 5.8 | 0.109 | 2.08 | 0.0378 | 4.26 | 0.086 | 2.09 | 0.0371 |
b_has_big_sib_par_act | b_female_kid_act | -0.765 | -0.00759 | 2.27 | 0.023 | -0.685 | -0.00684 | 2.29 | 0.0223 |
b_has_big_sib_par_act | b_female_kid_car | -2.21 | -0.0564 | 0.314 | 0.754 | -0.0186 | -0.00322 | 0.326 | 0.745 |
b_has_big_sib_par_act | b_female_par_act | -4.47 | -0.024 | 0.892 | 0.373 | -10.9 | -0.0586 | 0.879 | 0.379 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 21 | 0.198 | -2.05 | 0.0402 | 21 | 0.201 | -2.07 | 0.0385 |
b_has_big_sib_par_act | b_has_big_sib_kid_car | 6.41 | 0.0566 | 0.202 | 0.84 | 0.0591 | 0.00364 | 0.229 | 0.819 |
b_has_lil_sib_kid_act | asc_kid_act | -0.512 | -0.172 | 3.46 | 0.00054 | -0.507 | -0.166 | 3.48 | 0.000505 |
b_has_lil_sib_kid_act | asc_kid_car | -0.604 | -0.137 | 2.78 | 0.00542 | -0.00206 | -0.0034 | 2.83 | 0.00462 |
b_has_lil_sib_kid_act | asc_par_act | -0.197 | -0.0319 | 3.52 | 0.000427 | -0.134 | -0.0197 | 3.54 | 0.000399 |
b_has_lil_sib_kid_act | b_age_kid_act | 0.497 | 0.0372 | -0.376 | 0.707 | 0.0644 | 0.00486 | -0.376 | 0.707 |
b_has_lil_sib_kid_act | b_age_kid_car | 2.18 | 0.137 | 2.77 | 0.00553 | 0.0149 | 0.00653 | 2.79 | 0.0053 |
b_has_lil_sib_kid_act | b_age_par_act | 0.387 | 0.0133 | 5.48 | 4.22e-08 | -0.392 | -0.0145 | 5.51 | 3.52e-08 |
b_has_lil_sib_kid_act | b_female_kid_act | -0.859 | -0.0157 | 5.02 | 5.2e-07 | -1.21 | -0.0221 | 5.01 | 5.38e-07 |
b_has_lil_sib_kid_act | b_female_kid_car | -2.93 | -0.137 | 2.57 | 0.0103 | -0.0189 | -0.00597 | 2.86 | 0.00419 |
b_has_lil_sib_kid_act | b_female_par_act | -0.287 | -0.00282 | 2.25 | 0.0244 | -0.904 | -0.00892 | 2.24 | 0.0249 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 15.8 | 0.272 | -1.37 | 0.171 | 15 | 0.263 | -1.37 | 0.171 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_car | 8.47 | 0.137 | 1.97 | 0.0486 | 0.0392 | 0.00443 | 2.66 | 0.00776 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 6.86 | 0.0646 | 1.11 | 0.266 | 6.78 | 0.0646 | 1.12 | 0.263 |
b_has_lil_sib_kid_car | asc_kid_act | 0.0197 | 0.00572 | 0.713 | 0.476 | 0.00479 | 0.00967 | 4.87 | 1.09e-06 |
b_has_lil_sib_kid_car | asc_kid_car | -5.11 | -0.999 | 0.122 | 0.903 | -0.0957 | -0.967 | 0.879 | 0.379 |
b_has_lil_sib_kid_car | asc_par_act | 0.044 | 0.00614 | 0.763 | 0.446 | 0.0246 | 0.0221 | 4.48 | 7.63e-06 |
b_has_lil_sib_kid_car | b_age_kid_act | 2.24 | 0.144 | -2.65 | 0.00802 | 0.0665 | 0.0309 | -11 | 0 |
b_has_lil_sib_kid_car | b_age_kid_car | 18.5 | 0.999 | 0.122 | 0.903 | 0.351 | 0.948 | 0.866 | 0.386 |
b_has_lil_sib_kid_car | b_age_par_act | 1.87 | 0.0554 | 2.77 | 0.00558 | 0.00538 | 0.00122 | 6.91 | 4.94e-12 |
b_has_lil_sib_kid_car | b_female_kid_act | -2.9 | -0.0456 | 2.81 | 0.00497 | -0.222 | -0.0249 | 4.45 | 8.68e-06 |
b_has_lil_sib_kid_car | b_female_kid_car | -24.7 | -0.995 | 0.123 | 0.902 | -0.392 | -0.762 | 0.905 | 0.365 |
b_has_lil_sib_kid_car | b_female_par_act | -2.34 | -0.0199 | 0.888 | 0.375 | -0.309 | -0.0187 | 1.06 | 0.287 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_act | 8.54 | 0.127 | -3.01 | 0.00257 | 0.0268 | 0.00288 | -4.3 | 1.71e-05 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_car | 71.6 | 0.999 | 0.112 | 0.911 | 1.39 | 0.96 | 0.257 | 0.797 |
b_has_lil_sib_kid_car | b_has_big_sib_par_act | 6.98 | 0.0566 | -0.192 | 0.848 | 0.08 | 0.00468 | -0.222 | 0.824 |
b_has_lil_sib_kid_car | b_has_lil_sib_kid_act | 9.23 | 0.137 | -1.87 | 0.0612 | 0.0446 | 0.00478 | -2.65 | 0.0081 |
b_has_lil_sib_par_act | asc_kid_act | -0.192 | -0.0352 | 2.43 | 0.0151 | -0.155 | -0.0276 | 2.44 | 0.0147 |
b_has_lil_sib_par_act | asc_kid_car | -0.492 | -0.0608 | 2.06 | 0.0396 | 0.00259 | 0.00232 | 2.07 | 0.0382 |
b_has_lil_sib_par_act | asc_par_act | -1.7 | -0.149 | 2.44 | 0.0147 | -1.93 | -0.154 | 2.45 | 0.0145 |
b_has_lil_sib_par_act | b_age_kid_act | 0.225 | 0.00914 | 0.321 | 0.748 | -0.384 | -0.0158 | 0.322 | 0.748 |
b_has_lil_sib_par_act | b_age_kid_car | 1.78 | 0.0608 | 2.04 | 0.0417 | -0.01 | -0.00239 | 2.05 | 0.0405 |
b_has_lil_sib_par_act | b_age_par_act | 0.915 | 0.0171 | 3.73 | 0.000191 | 5.45 | 0.109 | 3.85 | 0.00012 |
b_has_lil_sib_par_act | b_female_kid_act | -0.264 | -0.00262 | 3.84 | 0.000124 | -0.748 | -0.00743 | 3.84 | 0.000123 |
b_has_lil_sib_par_act | b_female_kid_car | -2.38 | -0.0605 | 2.02 | 0.0434 | 0.0231 | 0.00398 | 2.09 | 0.0365 |
b_has_lil_sib_par_act | b_female_par_act | -3.4 | -0.0182 | 2.16 | 0.0311 | -5.77 | -0.0309 | 2.14 | 0.032 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 6.7 | 0.063 | -0.331 | 0.741 | 6.43 | 0.0611 | -0.332 | 0.74 |
b_has_lil_sib_par_act | b_has_big_sib_kid_car | 6.9 | 0.0608 | 1.77 | 0.0771 | -0.0306 | -0.00187 | 1.99 | 0.0467 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 51.2 | 0.262 | 1.45 | 0.147 | 48 | 0.248 | 1.45 | 0.148 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 21.1 | 0.198 | 0.512 | 0.609 | 20.4 | 0.193 | 0.512 | 0.608 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_car | 7.52 | 0.0608 | 1.72 | 0.0847 | -0.029 | -0.00168 | 1.98 | 0.0475 |
b_log_density_kid_act | asc_kid_act | -0.697 | -0.636 | 7.33 | 2.23e-13 | -0.775 | -0.656 | 6.99 | 2.66e-12 |
b_log_density_kid_act | asc_kid_car | 0.0948 | 0.0584 | 6.13 | 8.78e-10 | 0.00595 | 0.0252 | 5.91 | 3.51e-09 |
b_log_density_kid_act | asc_par_act | -0.259 | -0.114 | 7.63 | 2.29e-14 | -0.324 | -0.123 | 7.23 | 5e-13 |
b_log_density_kid_act | b_age_kid_act | 0.132 | 0.0268 | -2.14 | 0.0322 | 0.0984 | 0.0191 | -2.07 | 0.0389 |
b_log_density_kid_act | b_age_kid_car | -0.343 | -0.0585 | 4.73 | 2.19e-06 | -0.0231 | -0.0261 | 5.75 | 9.06e-09 |
b_log_density_kid_act | b_age_par_act | 0.129 | 0.0121 | 8.99 | 0 | 0.252 | 0.024 | 9.25 | 0 |
b_log_density_kid_act | b_female_kid_act | -0.589 | -0.0291 | 6.26 | 3.77e-10 | -0.5 | -0.0236 | 6.22 | 4.89e-10 |
b_log_density_kid_act | b_female_kid_car | 0.46 | 0.0582 | 4.57 | 4.85e-06 | 0.0288 | 0.0235 | 5.96 | 2.58e-09 |
b_log_density_kid_act | b_female_par_act | -0.268 | -0.00717 | 2.24 | 0.0253 | -0.151 | -0.00383 | 2.23 | 0.026 |
b_log_density_kid_act | b_has_big_sib_kid_act | 0.00959 | 0.000449 | -2.06 | 0.0398 | 0.23 | 0.0104 | -2.06 | 0.039 |
b_log_density_kid_act | b_has_big_sib_kid_car | -1.33 | -0.0585 | 1.86 | 0.0622 | -0.0815 | -0.0237 | 5.11 | 3.27e-07 |
b_log_density_kid_act | b_has_big_sib_par_act | 0.0903 | 0.00231 | 0.921 | 0.357 | -0.342 | -0.00839 | 0.924 | 0.355 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 0.0824 | 0.00386 | -0.505 | 0.614 | 0.671 | 0.0302 | -0.509 | 0.611 |
b_log_density_kid_act | b_has_lil_sib_kid_car | -1.45 | -0.0585 | 1.72 | 0.0856 | -0.114 | -0.0316 | 5.03 | 5e-07 |
b_log_density_kid_act | b_has_lil_sib_par_act | 0.0659 | 0.00168 | -0.808 | 0.419 | 0.326 | 0.00797 | -0.811 | 0.417 |
b_log_density_kid_car | asc_kid_act | -0.00282 | -0.00596 | 3.98 | 6.95e-05 | -0.00137 | -0.0192 | 11.5 | 0 |
b_log_density_kid_car | asc_kid_car | 0.698 | 0.995 | -0.121 | 0.903 | 0.0113 | 0.794 | -0.623 | 0.533 |
b_log_density_kid_car | asc_par_act | -0.00612 | -0.00622 | 3.78 | 0.000157 | -0.00426 | -0.0266 | 6 | 2.02e-09 |
b_log_density_kid_car | b_age_kid_act | -0.307 | -0.144 | -10.7 | 0 | -0.00645 | -0.0207 | -13.9 | 0 |
b_log_density_kid_car | b_age_kid_car | -2.53 | -0.996 | -0.122 | 0.903 | -0.0444 | -0.83 | -0.881 | 0.378 |
b_log_density_kid_car | b_age_par_act | -0.256 | -0.0552 | 6.12 | 9.49e-10 | 0.00273 | 0.00429 | 6.95 | 3.59e-12 |
b_log_density_kid_car | b_female_kid_act | 0.397 | 0.0455 | 4.34 | 1.42e-05 | 0.0233 | 0.0181 | 4.36 | 1.3e-05 |
b_log_density_kid_car | b_female_kid_car | 3.38 | 0.992 | 0.121 | 0.904 | 0.0477 | 0.642 | 0.588 | 0.556 |
b_log_density_kid_car | b_female_par_act | 0.32 | 0.0198 | 0.98 | 0.327 | 0.047 | 0.0198 | 0.979 | 0.327 |
b_log_density_kid_car | b_has_big_sib_kid_act | -1.17 | -0.127 | -4.34 | 1.41e-05 | 0.0111 | 0.00829 | -4.52 | 6.26e-06 |
b_log_density_kid_car | b_has_big_sib_kid_car | -9.79 | -0.996 | -0.122 | 0.903 | -0.176 | -0.842 | -0.862 | 0.389 |
b_log_density_kid_car | b_has_big_sib_par_act | -0.955 | -0.0564 | -0.307 | 0.759 | 0.000279 | 0.000113 | -0.312 | 0.755 |
b_log_density_kid_car | b_has_lil_sib_kid_act | -1.26 | -0.137 | -2.74 | 0.00623 | -0.0129 | -0.00961 | -2.84 | 0.00449 |
b_log_density_kid_car | b_has_lil_sib_kid_car | -10.7 | -0.996 | -0.123 | 0.902 | -0.182 | -0.828 | -0.889 | 0.374 |
b_log_density_kid_car | b_has_lil_sib_par_act | -1.03 | -0.0606 | -2.05 | 0.0402 | 0.00235 | 0.000947 | -2.08 | 0.0377 |
b_log_density_kid_car | b_log_density_kid_act | 0.2 | 0.0587 | -5.83 | 5.53e-09 | 0.0179 | 0.0342 | -5.93 | 3e-09 |
b_log_density_par_act | asc_kid_act | -0.239 | -0.0941 | 6.96 | 3.31e-12 | -0.317 | -0.103 | 5.92 | 3.27e-09 |
b_log_density_par_act | asc_kid_car | 0.0762 | 0.0203 | 6.21 | 5.32e-10 | 0.00903 | 0.0147 | 5.28 | 1.26e-07 |
b_log_density_par_act | asc_par_act | -3.79 | -0.718 | 6.48 | 9.05e-11 | -5.15 | -0.748 | 5.52 | 3.46e-08 |
b_log_density_par_act | b_age_kid_act | -0.107 | -0.00938 | 2.38 | 0.0172 | 0.166 | 0.0124 | 2.05 | 0.0401 |
b_log_density_par_act | b_age_kid_car | -0.276 | -0.0203 | 5.84 | 5.19e-09 | -0.0339 | -0.0148 | 5.23 | 1.66e-07 |
b_log_density_par_act | b_age_par_act | -0.817 | -0.0329 | 8.56 | 0 | 0.763 | 0.0279 | 7.83 | 4.88e-15 |
b_log_density_par_act | b_female_kid_act | -0.0897 | -0.00192 | 7.41 | 1.24e-13 | 0.19 | 0.00343 | 6.85 | 7.15e-12 |
b_log_density_par_act | b_female_kid_car | 0.37 | 0.0202 | 5.79 | 6.98e-09 | 0.0596 | 0.0187 | 5.32 | 1.05e-07 |
b_log_density_par_act | b_female_par_act | -1.52 | -0.0175 | 3.59 | 0.000334 | -4.98 | -0.0487 | 3.41 | 0.000657 |
b_log_density_par_act | b_has_big_sib_kid_act | -0.125 | -0.00254 | 0.641 | 0.522 | -0.72 | -0.0125 | 0.593 | 0.553 |
b_log_density_par_act | b_has_big_sib_kid_car | -1.07 | -0.0203 | 3.75 | 0.000176 | -0.131 | -0.0146 | 5.07 | 3.88e-07 |
b_log_density_par_act | b_has_big_sib_par_act | 1.39 | 0.0153 | 2.36 | 0.0181 | 1.13 | 0.0107 | 2.3 | 0.0217 |
b_log_density_par_act | b_has_lil_sib_kid_act | 0.044 | 0.000889 | 1.9 | 0.0577 | 0.301 | 0.00521 | 1.77 | 0.077 |
b_log_density_par_act | b_has_lil_sib_kid_car | -1.16 | -0.0203 | 3.55 | 0.000389 | -0.164 | -0.0174 | 5.05 | 4.32e-07 |
b_log_density_par_act | b_has_lil_sib_par_act | 1.91 | 0.021 | 0.754 | 0.451 | -3.68 | -0.0345 | 0.716 | 0.474 |
b_log_density_par_act | b_log_density_kid_act | 2.91 | 0.16 | 3.47 | 0.000523 | 3.47 | 0.154 | 2.97 | 0.00295 |
b_log_density_par_act | b_log_density_kid_car | 0.16 | 0.0204 | 6.15 | 7.67e-10 | 0.0253 | 0.0185 | 5.3 | 1.19e-07 |
b_log_distance_kid_act | asc_kid_act | 0.665 | 0.272 | -25.5 | 0 | 0.594 | 0.228 | -24.6 | 0 |
b_log_distance_kid_act | asc_kid_car | 0.191 | 0.0526 | -26 | 0 | 0.0137 | 0.0263 | -25.1 | 0 |
b_log_distance_kid_act | asc_par_act | 0.266 | 0.0523 | -25 | 0 | 0.267 | 0.0457 | -24.1 | 0 |
b_log_distance_kid_act | b_age_kid_act | -2.67 | -0.242 | -27.1 | 0 | -2.59 | -0.228 | -26.4 | 0 |
b_log_distance_kid_act | b_age_kid_car | -0.691 | -0.0526 | -24.3 | 0 | -0.0575 | -0.0295 | -25.1 | 0 |
b_log_distance_kid_act | b_age_par_act | -1.55 | -0.0649 | -18.2 | 0 | -1.29 | -0.0556 | -18.2 | 0 |
b_log_distance_kid_act | b_female_kid_act | 2.9 | 0.0641 | -14.2 | 0 | 2.94 | 0.0628 | -14 | 0 |
b_log_distance_kid_act | b_female_kid_car | 0.925 | 0.0524 | -24.1 | 0 | 0.0836 | 0.0309 | -25 | 0 |
b_log_distance_kid_act | b_female_par_act | 1.51 | 0.0181 | -10.2 | 0 | 4.71 | 0.0543 | -10.3 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -1.27 | -0.0266 | -19.7 | 0 | -1.01 | -0.0206 | -19.6 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_car | -2.68 | -0.0526 | -15.6 | 0 | -0.145 | -0.0191 | -24.8 | 0 |
b_log_distance_kid_act | b_has_big_sib_par_act | -1.44 | -0.0164 | -10.8 | 0 | -0.618 | -0.00688 | -10.9 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -1.94 | -0.0406 | -18.3 | 0 | -3.15 | -0.0642 | -17.9 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_car | -2.92 | -0.0526 | -14.8 | 0 | -0.189 | -0.0236 | -24.7 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -1.51 | -0.0172 | -12.4 | 0 | -2.71 | -0.03 | -12.3 | 0 |
b_log_distance_kid_act | b_log_density_kid_act | -0.644 | -0.0366 | -25.9 | 0 | 0.0404 | 0.00212 | -25.3 | 0 |
b_log_distance_kid_act | b_log_density_kid_car | 0.399 | 0.0525 | -25.7 | 0 | 0.0285 | 0.0247 | -25.1 | 0 |
b_log_distance_kid_act | b_log_density_par_act | 0.0339 | 0.000832 | -22.5 | 0 | -1.51 | -0.0305 | -20 | 0 |
b_log_distance_kid_car | asc_kid_act | -0.00606 | -0.00564 | 1.76 | 0.0788 | -0.000831 | -0.00403 | 7.49 | 6.71e-14 |
b_log_distance_kid_car | asc_kid_car | 1.59 | 0.996 | -0.121 | 0.904 | 0.0361 | 0.88 | -0.595 | 0.552 |
b_log_distance_kid_car | asc_par_act | -0.0136 | -0.00609 | 1.86 | 0.0629 | -0.00575 | -0.0125 | 5.13 | 2.85e-07 |
b_log_distance_kid_car | b_age_kid_act | -0.696 | -0.144 | -7.09 | 1.31e-12 | -0.0369 | -0.0412 | -13.4 | 0 |
b_log_distance_kid_car | b_age_kid_car | -5.73 | -0.995 | -0.122 | 0.903 | -0.132 | -0.856 | -0.753 | 0.452 |
b_log_distance_kid_car | b_age_par_act | -0.58 | -0.0552 | 5.12 | 3.08e-07 | -0.0177 | -0.00964 | 6.83 | 8.58e-12 |
b_log_distance_kid_car | b_female_kid_act | 0.901 | 0.0454 | 4.12 | 3.78e-05 | 0.103 | 0.0279 | 4.33 | 1.48e-05 |
b_log_distance_kid_car | b_female_kid_car | 7.67 | 0.991 | 0.0248 | 0.98 | 0.149 | 0.695 | 0.0249 | 0.98 |
b_log_distance_kid_car | b_female_par_act | 0.727 | 0.0198 | 0.952 | 0.341 | 0.144 | 0.021 | 0.965 | 0.334 |
b_log_distance_kid_car | b_has_big_sib_kid_act | -2.65 | -0.127 | -4.08 | 4.57e-05 | 0.0326 | 0.00844 | -4.53 | 5.77e-06 |
b_log_distance_kid_car | b_has_big_sib_kid_car | -22.2 | -0.995 | -0.122 | 0.903 | -0.51 | -0.851 | -0.815 | 0.415 |
b_log_distance_kid_car | b_has_big_sib_par_act | -2.17 | -0.0564 | -0.313 | 0.754 | -0.0176 | -0.00247 | -0.325 | 0.745 |
b_log_distance_kid_car | b_has_lil_sib_kid_act | -2.86 | -0.137 | -2.57 | 0.0101 | 0.00318 | 0.00082 | -2.86 | 0.00422 |
b_log_distance_kid_car | b_has_lil_sib_kid_car | -24.2 | -0.995 | -0.122 | 0.903 | -0.541 | -0.856 | -0.837 | 0.403 |
b_log_distance_kid_car | b_has_lil_sib_par_act | -2.33 | -0.0605 | -2.02 | 0.0433 | -0.00776 | -0.00109 | -2.09 | 0.0366 |
b_log_distance_kid_car | b_log_density_kid_act | 0.45 | 0.0583 | -4.62 | 3.83e-06 | 0.0379 | 0.0252 | -5.93 | 3.03e-09 |
b_log_distance_kid_car | b_log_density_kid_car | 3.31 | 0.992 | -0.12 | 0.905 | 0.0688 | 0.755 | -0.471 | 0.638 |
b_log_distance_kid_car | b_log_density_par_act | 0.362 | 0.0202 | -5.81 | 6.25e-09 | 0.0409 | 0.0104 | -5.31 | 1.09e-07 |
b_log_distance_kid_car | b_log_distance_kid_act | 0.913 | 0.0529 | 24.2 | 0 | 0.122 | 0.0366 | 25 | 0 |
b_log_distance_par_act | asc_kid_act | 0.231 | 0.0539 | -15.3 | 0 | 0.156 | 0.0344 | -14.8 | 0 |
b_log_distance_par_act | asc_kid_car | 0.153 | 0.0241 | -15.8 | 0 | -0.00392 | -0.00432 | -15.3 | 0 |
b_log_distance_par_act | asc_par_act | 2.03 | 0.228 | -15.5 | 0 | 3.13 | 0.307 | -15.1 | 0 |
b_log_distance_par_act | b_age_kid_act | -0.418 | -0.0217 | -17.7 | 0 | -0.457 | -0.0231 | -17.1 | 0 |
b_log_distance_par_act | b_age_kid_car | -0.553 | -0.0241 | -15.5 | 0 | 0.00749 | 0.0022 | -15.3 | 0 |
b_log_distance_par_act | b_age_par_act | -1.95 | -0.0465 | -12.6 | 0 | -7.02 | -0.173 | -11.9 | 0 |
b_log_distance_par_act | b_female_kid_act | 1.09 | 0.0138 | -10.8 | 0 | 4 | 0.0489 | -10.8 | 0 |
b_log_distance_par_act | b_female_kid_car | 0.741 | 0.024 | -15.3 | 0 | 0.00727 | 0.00154 | -15.2 | 0 |
b_log_distance_par_act | b_female_par_act | 5.01 | 0.0343 | -9.4 | 0 | 1.62 | 0.0107 | -9.15 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_act | -0.213 | -0.00256 | -15.5 | 0 | -0.0106 | -0.000124 | -15.2 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_car | -2.14 | -0.0241 | -12.6 | 0 | 0.0829 | 0.00625 | -15.3 | 0 |
b_log_distance_par_act | b_has_big_sib_par_act | -2.57 | -0.0168 | -9.9 | 0 | 3.24 | 0.0207 | -9.99 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -1.54 | -0.0185 | -14.4 | 0 | -2.32 | -0.027 | -14.1 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_car | -2.33 | -0.0241 | -12.2 | 0 | 0.0658 | 0.00472 | -15.3 | 0 |
b_log_distance_par_act | b_has_lil_sib_par_act | -6.04 | -0.0394 | -11.1 | 0 | -10.8 | -0.0685 | -10.9 | 0 |
b_log_distance_par_act | b_log_density_kid_act | -0.647 | -0.0211 | -16.7 | 0 | -1.15 | -0.0344 | -16.1 | 0 |
b_log_distance_par_act | b_log_density_kid_car | 0.319 | 0.0241 | -15.7 | 0 | -0.012 | -0.00595 | -15.2 | 0 |
b_log_distance_par_act | b_log_density_par_act | -2.69 | -0.0379 | -16.5 | 0 | -5.06 | -0.0585 | -15.2 | 0 |
b_log_distance_par_act | b_log_distance_kid_act | 22.5 | 0.327 | -0.935 | 0.35 | 24.1 | 0.328 | -0.904 | 0.366 |
b_log_distance_par_act | b_log_distance_kid_car | 0.731 | 0.0243 | -15.4 | 0 | 0.0524 | 0.00905 | -15.2 | 0 |
b_log_income_k_kid_act | asc_kid_act | -0.839 | -0.508 | 0.112 | 0.911 | -0.891 | -0.522 | 0.111 | 0.912 |
b_log_income_k_kid_act | asc_kid_car | 0.0558 | 0.0228 | -1.1 | 0.273 | 0.00835 | 0.0245 | -1.1 | 0.272 |
b_log_income_k_kid_act | asc_par_act | -0.316 | -0.0921 | 0.218 | 0.828 | -0.229 | -0.0599 | 0.217 | 0.828 |
b_log_income_k_kid_act | b_age_kid_act | 0.39 | 0.0525 | -6.46 | 1.03e-10 | 0.533 | 0.0718 | -6.49 | 8.61e-11 |
b_log_income_k_kid_act | b_age_kid_car | -0.202 | -0.0229 | -1.05 | 0.295 | -0.0327 | -0.0256 | -1.17 | 0.242 |
b_log_income_k_kid_act | b_age_par_act | 0.0603 | 0.00373 | 3.57 | 0.000351 | 0.0587 | 0.00387 | 3.67 | 0.000244 |
b_log_income_k_kid_act | b_female_kid_act | -0.142 | -0.00465 | 3.22 | 0.0013 | 0.26 | 0.00847 | 3.23 | 0.00126 |
b_log_income_k_kid_act | b_female_kid_car | 0.271 | 0.0228 | -0.873 | 0.383 | 0.0545 | 0.0308 | -1.03 | 0.302 |
b_log_income_k_kid_act | b_female_par_act | -0.0889 | -0.00158 | 0.609 | 0.543 | -0.506 | -0.00892 | 0.606 | 0.545 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 0.217 | 0.00674 | -4.46 | 8.28e-06 | 0.791 | 0.0247 | -4.51 | 6.34e-06 |
b_log_income_k_kid_act | b_has_big_sib_kid_car | -0.784 | -0.0229 | -0.62 | 0.535 | -0.132 | -0.0265 | -1.29 | 0.197 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 0.338 | 0.00573 | -0.611 | 0.541 | 0.123 | 0.00208 | -0.614 | 0.539 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 1.45 | 0.0449 | -3.06 | 0.00223 | 1.17 | 0.0365 | -3.06 | 0.00224 |
b_log_income_k_kid_act | b_has_lil_sib_kid_car | -0.854 | -0.0229 | -0.588 | 0.556 | -0.136 | -0.026 | -1.31 | 0.192 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 0.593 | 0.01 | -2.3 | 0.0214 | 0.305 | 0.00516 | -2.31 | 0.0211 |
b_log_income_k_kid_act | b_log_density_kid_act | 0.627 | 0.0529 | -4.45 | 8.59e-06 | 1.1 | 0.0881 | -4.45 | 8.5e-06 |
b_log_income_k_kid_act | b_log_density_kid_car | 0.117 | 0.0228 | -1.05 | 0.295 | 0.0237 | 0.0314 | -1.08 | 0.28 |
b_log_income_k_kid_act | b_log_density_par_act | 0.303 | 0.011 | -5.85 | 5e-09 | 0.324 | 0.00997 | -5.18 | 2.27e-07 |
b_log_income_k_kid_act | b_log_distance_kid_act | -1.98 | -0.0748 | 20.2 | 0 | -1.8 | -0.0653 | 19.8 | 0 |
b_log_income_k_kid_act | b_log_distance_kid_car | 0.265 | 0.0228 | -0.881 | 0.379 | 0.0388 | 0.0179 | -1.03 | 0.303 |
b_log_income_k_kid_act | b_log_distance_par_act | -0.622 | -0.0134 | 14.3 | 0 | 1.64 | 0.0341 | 14.1 | 0 |
b_log_income_k_kid_car | asc_kid_act | -0.00151 | -0.00616 | 6.95 | 3.59e-12 | -0.00118 | -0.0152 | 11.5 | 0 |
b_log_income_k_kid_car | asc_kid_car | 0.347 | 0.958 | -0.0151 | 0.988 | 0.00592 | 0.381 | -0.0153 | 0.988 |
b_log_income_k_kid_car | asc_par_act | -0.00314 | -0.00617 | 5.45 | 5.12e-08 | -0.00344 | -0.0197 | 6.06 | 1.35e-09 |
b_log_income_k_kid_car | b_age_kid_act | -0.153 | -0.139 | -12.5 | 0 | -0.0043 | -0.0127 | -13.8 | 0 |
b_log_income_k_kid_car | b_age_kid_car | -1.26 | -0.961 | -0.122 | 0.903 | -0.0264 | -0.453 | -0.776 | 0.438 |
b_log_income_k_kid_car | b_age_par_act | -0.128 | -0.0533 | 6.4 | 1.57e-10 | 0.00499 | 0.00719 | 6.97 | 3.11e-12 |
b_log_income_k_kid_car | b_female_kid_act | 0.198 | 0.0439 | 4.38 | 1.19e-05 | 0.0327 | 0.0234 | 4.37 | 1.23e-05 |
b_log_income_k_kid_car | b_female_kid_car | 1.69 | 0.958 | 0.122 | 0.903 | 0.0283 | 0.35 | 0.686 | 0.493 |
b_log_income_k_kid_car | b_female_par_act | 0.16 | 0.0191 | 0.987 | 0.323 | 0.0154 | 0.00594 | 0.985 | 0.325 |
b_log_income_k_kid_car | b_has_big_sib_kid_act | -0.583 | -0.122 | -4.41 | 1.02e-05 | -0.00723 | -0.00494 | -4.51 | 6.61e-06 |
b_log_income_k_kid_car | b_has_big_sib_kid_car | -4.89 | -0.961 | -0.122 | 0.903 | -0.102 | -0.448 | -0.84 | 0.401 |
b_log_income_k_kid_car | b_has_big_sib_par_act | -0.477 | -0.0545 | -0.303 | 0.762 | 0.00943 | 0.00351 | -0.306 | 0.759 |
b_log_income_k_kid_car | b_has_lil_sib_kid_act | -0.629 | -0.132 | -2.78 | 0.00545 | -0.00115 | -0.000781 | -2.83 | 0.00462 |
b_log_income_k_kid_car | b_has_lil_sib_kid_car | -5.32 | -0.961 | -0.122 | 0.903 | -0.105 | -0.438 | -0.869 | 0.385 |
b_log_income_k_kid_car | b_has_lil_sib_par_act | -0.513 | -0.0585 | -2.06 | 0.0397 | 0.0142 | 0.00526 | -2.07 | 0.0382 |
b_log_income_k_kid_car | b_log_density_kid_act | 0.099 | 0.0563 | -6.11 | 9.83e-10 | 0.0135 | 0.0237 | -5.9 | 3.61e-09 |
b_log_income_k_kid_car | b_log_density_kid_car | 0.729 | 0.959 | 0.117 | 0.907 | 0.0132 | 0.382 | 0.36 | 0.718 |
b_log_income_k_kid_car | b_log_density_par_act | 0.0796 | 0.0195 | -6.21 | 5.43e-10 | 0.0166 | 0.0112 | -5.28 | 1.26e-07 |
b_log_income_k_kid_car | b_log_distance_kid_act | 0.199 | 0.0505 | 25.9 | 0 | 0.0153 | 0.0122 | 25.1 | 0 |
b_log_income_k_kid_car | b_log_distance_kid_car | 1.65 | 0.955 | 0.121 | 0.904 | 0.0356 | 0.358 | 0.546 | 0.585 |
b_log_income_k_kid_car | b_log_distance_par_act | 0.159 | 0.0232 | 15.8 | 0 | 0.00762 | 0.00347 | 15.3 | 0 |
b_log_income_k_kid_car | b_log_income_k_kid_act | 0.0617 | 0.0233 | 1.09 | 0.274 | 0.00932 | 0.0113 | 1.1 | 0.273 |
b_log_income_k_par_act | asc_kid_act | -0.305 | -0.106 | 1.58 | 0.115 | -0.245 | -0.0821 | 1.57 | 0.116 |
b_log_income_k_par_act | asc_kid_car | 0.0381 | 0.00893 | 0.889 | 0.374 | 0.00863 | 0.0145 | 0.886 | 0.376 |
b_log_income_k_par_act | asc_par_act | -2.46 | -0.411 | 1.57 | 0.116 | -2.26 | -0.339 | 1.57 | 0.117 |
b_log_income_k_par_act | b_age_kid_act | 0.0837 | 0.00645 | -2.35 | 0.0188 | 0.11 | 0.00851 | -2.34 | 0.0194 |
b_log_income_k_par_act | b_age_kid_car | -0.138 | -0.00896 | 0.812 | 0.417 | -0.035 | -0.0157 | 0.84 | 0.401 |
b_log_income_k_par_act | b_age_par_act | 2.36 | 0.0839 | 3.93 | 8.34e-05 | 0.265 | 0.00998 | 3.84 | 0.000121 |
b_log_income_k_par_act | b_female_kid_act | -0.088 | -0.00165 | 3.7 | 0.00022 | -0.23 | -0.00429 | 3.68 | 0.000237 |
b_log_income_k_par_act | b_female_kid_car | 0.185 | 0.00892 | 0.869 | 0.385 | 0.0419 | 0.0135 | 0.922 | 0.357 |
b_log_income_k_par_act | b_female_par_act | -2.33 | -0.0237 | 1.28 | 0.2 | -3.71 | -0.0373 | 1.27 | 0.204 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 0.235 | 0.00419 | -2.6 | 0.00945 | 0.0965 | 0.00172 | -2.59 | 0.00946 |
b_log_income_k_par_act | b_has_big_sib_kid_car | -0.536 | -0.00896 | 0.5 | 0.617 | -0.132 | -0.0152 | 0.731 | 0.465 |
b_log_income_k_par_act | b_has_big_sib_par_act | 6.9 | 0.067 | 0.152 | 0.879 | 1.33 | 0.013 | 0.149 | 0.882 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 0.572 | 0.0102 | -1.41 | 0.158 | 0.0308 | 0.000548 | -1.4 | 0.16 |
b_log_income_k_par_act | b_has_lil_sib_kid_car | -0.584 | -0.00895 | 0.469 | 0.639 | -0.143 | -0.0156 | 0.719 | 0.472 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 2.4 | 0.0233 | -1.42 | 0.154 | 6.2 | 0.0599 | -1.45 | 0.147 |
b_log_income_k_par_act | b_log_density_kid_act | 0.251 | 0.0121 | -1.37 | 0.17 | 0.221 | 0.0101 | -1.36 | 0.175 |
b_log_income_k_par_act | b_log_density_kid_car | 0.0799 | 0.00894 | 0.891 | 0.373 | 0.0241 | 0.0182 | 0.896 | 0.37 |
b_log_income_k_par_act | b_log_density_par_act | 2.02 | 0.042 | -3.52 | 0.000435 | -0.0661 | -0.00116 | -3.17 | 0.0015 |
b_log_income_k_par_act | b_log_distance_kid_act | -0.376 | -0.00811 | 17.4 | 0 | 1.9 | 0.0396 | 17.5 | 0 |
b_log_income_k_par_act | b_log_distance_kid_car | 0.181 | 0.0089 | 0.871 | 0.384 | 0.0613 | 0.0161 | 0.92 | 0.358 |
b_log_income_k_par_act | b_log_distance_par_act | -6.07 | -0.0751 | 13.1 | 0 | -8.61 | -0.103 | 12.7 | 0 |
b_log_income_k_par_act | b_log_income_k_kid_act | 6.52 | 0.209 | 1.46 | 0.145 | 5.74 | 0.182 | 1.43 | 0.153 |
b_log_income_k_par_act | b_log_income_k_kid_car | 0.0426 | 0.00921 | 0.889 | 0.374 | 0.027 | 0.0187 | 0.886 | 0.376 |
b_non_work_dad_kid_ace | asc_kid_act | -0.421 | -0.0928 | -0.498 | 0.618 | -0.581 | -0.125 | -0.501 | 0.616 |
b_non_work_dad_kid_ace | asc_kid_car | 0.0938 | 0.014 | -0.943 | 0.346 | -0.0136 | -0.0148 | -0.951 | 0.342 |
b_non_work_dad_kid_ace | asc_par_act | -0.2 | -0.0212 | -0.459 | 0.646 | -0.223 | -0.0215 | -0.462 | 0.644 |
b_non_work_dad_kid_ace | b_age_kid_act | -1.31 | -0.0644 | -2.98 | 0.00289 | -1.11 | -0.055 | -3.01 | 0.00265 |
b_non_work_dad_kid_ace | b_age_kid_car | -0.34 | -0.014 | -0.954 | 0.34 | 0.0523 | 0.0151 | -0.979 | 0.327 |
b_non_work_dad_kid_ace | b_age_par_act | -0.471 | -0.0106 | 1.14 | 0.253 | 0.57 | 0.0138 | 1.17 | 0.243 |
b_non_work_dad_kid_ace | b_female_kid_act | 1.09 | 0.0131 | 1.52 | 0.129 | 0.116 | 0.00139 | 1.52 | 0.129 |
b_non_work_dad_kid_ace | b_female_kid_car | 0.455 | 0.0139 | -0.897 | 0.37 | -0.0571 | -0.0119 | -0.926 | 0.354 |
b_non_work_dad_kid_ace | b_female_par_act | 1.61 | 0.0104 | 0.126 | 0.9 | 1.95 | 0.0126 | 0.127 | 0.899 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | 0.406 | 0.0046 | -3.25 | 0.00117 | 2.05 | 0.0236 | -3.3 | 0.000964 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_car | -1.32 | -0.014 | -0.843 | 0.399 | 0.17 | 0.0126 | -1.04 | 0.299 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 0.294 | 0.00182 | -0.838 | 0.402 | 1.01 | 0.00631 | -0.846 | 0.398 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 5.51 | 0.0624 | -2.4 | 0.0162 | 6.24 | 0.0715 | -2.43 | 0.015 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_car | -1.43 | -0.014 | -0.825 | 0.41 | 0.12 | 0.00845 | -1.05 | 0.296 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 2.1 | 0.0129 | -2.21 | 0.0274 | 0.716 | 0.00446 | -2.21 | 0.0272 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 0.221 | 0.00679 | -2.37 | 0.0176 | 1.51 | 0.0447 | -2.41 | 0.0161 |
b_non_work_dad_kid_ace | b_log_density_kid_car | 0.196 | 0.0139 | -0.933 | 0.351 | 0.0146 | 0.00712 | -0.944 | 0.345 |
b_non_work_dad_kid_ace | b_log_density_par_act | 0.282 | 0.00374 | -3.87 | 0.00011 | 0.671 | 0.00761 | -3.73 | 0.000193 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | 0.389 | 0.00534 | 11.5 | 0 | 0.0372 | 0.000497 | 11.5 | 0 |
b_non_work_dad_kid_ace | b_log_distance_kid_car | 0.444 | 0.0139 | -0.899 | 0.369 | 0.0124 | 0.0021 | -0.927 | 0.354 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -0.74 | -0.00582 | 10.1 | 0 | 0.00052 | 3.99e-06 | 10 | 0 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 7.51 | 0.153 | -0.537 | 0.591 | 8.02 | 0.164 | -0.543 | 0.587 |
b_non_work_dad_kid_ace | b_log_income_k_kid_car | 0.0992 | 0.0136 | -0.943 | 0.346 | -0.0181 | -0.0081 | -0.951 | 0.342 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 3.11 | 0.0363 | -1.3 | 0.195 | 2.45 | 0.0287 | -1.3 | 0.195 |
b_non_work_dad_kid_car | asc_kid_act | -0.00394 | -0.0057 | 2.76 | 0.00576 | -0.00627 | -0.0314 | 7.72 | 1.15e-14 |
b_non_work_dad_kid_car | asc_kid_car | 0.99 | 0.966 | -0.114 | 0.909 | 0.0156 | 0.392 | -0.296 | 0.767 |
b_non_work_dad_kid_car | asc_par_act | -0.00863 | -0.006 | 2.8 | 0.00509 | -0.00742 | -0.0166 | 5.28 | 1.29e-07 |
b_non_work_dad_kid_car | b_age_kid_act | -0.435 | -0.14 | -9.2 | 0 | 0.00879 | 0.0101 | -13.5 | 0 |
b_non_work_dad_kid_car | b_age_kid_car | -3.58 | -0.967 | -0.122 | 0.903 | -0.0631 | -0.422 | -0.685 | 0.493 |
b_non_work_dad_kid_car | b_age_par_act | -0.363 | -0.0536 | 5.78 | 7.33e-09 | 0.00931 | 0.00523 | 6.88 | 5.94e-12 |
b_non_work_dad_kid_car | b_female_kid_act | 0.564 | 0.0442 | 4.28 | 1.88e-05 | 0.0285 | 0.00794 | 4.34 | 1.4e-05 |
b_non_work_dad_kid_car | b_female_kid_car | 4.8 | 0.963 | 0.111 | 0.912 | 0.0709 | 0.342 | 0.252 | 0.801 |
b_non_work_dad_kid_car | b_female_par_act | 0.455 | 0.0193 | 0.971 | 0.331 | 0.0558 | 0.00839 | 0.974 | 0.33 |
b_non_work_dad_kid_car | b_has_big_sib_kid_act | -1.66 | -0.123 | -4.26 | 2.05e-05 | 0.0404 | 0.0108 | -4.52 | 6.2e-06 |
b_non_work_dad_kid_car | b_has_big_sib_kid_car | -13.9 | -0.967 | -0.122 | 0.903 | -0.23 | -0.395 | -0.835 | 0.404 |
b_non_work_dad_kid_car | b_has_big_sib_par_act | -1.35 | -0.0548 | -0.309 | 0.757 | 0.00382 | 0.000555 | -0.316 | 0.752 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_act | -1.79 | -0.133 | -2.69 | 0.00725 | -0.0333 | -0.00884 | -2.84 | 0.00446 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_car | -15.1 | -0.966 | -0.122 | 0.903 | -0.227 | -0.37 | -0.867 | 0.386 |
b_non_work_dad_kid_car | b_has_lil_sib_par_act | -1.46 | -0.0588 | -2.04 | 0.041 | 0.014 | 0.00202 | -2.08 | 0.0374 |
b_non_work_dad_kid_car | b_log_density_kid_act | 0.281 | 0.0566 | -5.41 | 6.17e-08 | 0.0612 | 0.0419 | -5.91 | 3.45e-09 |
b_non_work_dad_kid_car | b_log_density_kid_car | 2.07 | 0.965 | -0.0913 | 0.927 | 0.0269 | 0.304 | -0.131 | 0.896 |
b_non_work_dad_kid_car | b_log_density_par_act | 0.226 | 0.0197 | -6.05 | 1.41e-09 | 0.0444 | 0.0117 | -5.3 | 1.19e-07 |
b_non_work_dad_kid_car | b_log_distance_kid_act | 0.565 | 0.0509 | 25.3 | 0 | 0.0738 | 0.0229 | 25 | 0 |
b_non_work_dad_kid_car | b_log_distance_kid_car | 4.69 | 0.963 | 0.108 | 0.914 | 0.0894 | 0.351 | 0.216 | 0.829 |
b_non_work_dad_kid_car | b_log_distance_par_act | 0.452 | 0.0233 | 15.6 | 0 | 0.00671 | 0.00119 | 15.2 | 0 |
b_non_work_dad_kid_car | b_log_income_k_kid_act | 0.167 | 0.0223 | 0.994 | 0.32 | 0.0254 | 0.012 | 1.06 | 0.29 |
b_non_work_dad_kid_car | b_log_income_k_kid_car | 1.04 | 0.941 | -0.114 | 0.909 | 0.0325 | 0.337 | -0.292 | 0.77 |
b_non_work_dad_kid_car | b_log_income_k_par_act | 0.114 | 0.00876 | -0.886 | 0.375 | 0.0288 | 0.00781 | -0.903 | 0.367 |
b_non_work_dad_kid_car | b_non_work_dad_kid_ace | 0.301 | 0.0146 | 0.923 | 0.356 | 0.00205 | 0.000358 | 0.938 | 0.348 |
b_non_work_dad_par_act | asc_kid_act | -0.188 | -0.0237 | 1.24 | 0.215 | -0.2 | -0.0257 | 1.3 | 0.193 |
b_non_work_dad_par_act | asc_kid_car | 0.0785 | 0.00665 | 0.987 | 0.324 | 0.00492 | 0.00316 | 1.04 | 0.3 |
b_non_work_dad_par_act | asc_par_act | -1.27 | -0.077 | 1.26 | 0.209 | -0.992 | -0.0567 | 1.32 | 0.186 |
b_non_work_dad_par_act | b_age_kid_act | -0.452 | -0.0126 | -0.206 | 0.836 | 0.26 | 0.00767 | -0.217 | 0.828 |
b_non_work_dad_par_act | b_age_kid_car | -0.284 | -0.00666 | 0.965 | 0.334 | -0.0158 | -0.00271 | 1.02 | 0.308 |
b_non_work_dad_par_act | b_age_par_act | -3.33 | -0.0428 | 2.16 | 0.031 | -5.9 | -0.085 | 2.25 | 0.0243 |
b_non_work_dad_par_act | b_female_kid_act | 1.55 | 0.0106 | 2.4 | 0.0164 | 1.79 | 0.0127 | 2.51 | 0.0121 |
b_non_work_dad_par_act | b_female_kid_car | 0.381 | 0.00663 | 0.992 | 0.321 | 0.0289 | 0.00357 | 1.05 | 0.293 |
b_non_work_dad_par_act | b_female_par_act | 6.42 | 0.0236 | 1.38 | 0.167 | 2.3 | 0.00887 | 1.42 | 0.156 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 0.0741 | 0.000478 | -0.638 | 0.523 | 1.38 | 0.0094 | -0.669 | 0.504 |
b_non_work_dad_par_act | b_has_big_sib_kid_car | -1.1 | -0.00665 | 0.867 | 0.386 | -0.0833 | -0.00367 | 0.98 | 0.327 |
b_non_work_dad_par_act | b_has_big_sib_par_act | 0.00331 | 1.16e-05 | 0.643 | 0.52 | 4.67 | 0.0174 | 0.672 | 0.502 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 1.98 | 0.0128 | -0.0607 | 0.952 | 0.462 | 0.00315 | -0.0632 | 0.95 |
b_non_work_dad_par_act | b_has_lil_sib_kid_car | -1.2 | -0.00665 | 0.852 | 0.394 | -0.101 | -0.00423 | 0.976 | 0.329 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 9.35 | 0.0328 | -0.36 | 0.719 | 19.8 | 0.0732 | -0.38 | 0.704 |
b_non_work_dad_par_act | b_log_density_kid_act | 0.0521 | 0.00091 | 0.135 | 0.893 | 0.521 | 0.00913 | 0.142 | 0.887 |
b_non_work_dad_par_act | b_log_density_kid_car | 0.164 | 0.00664 | 0.99 | 0.322 | 0.0255 | 0.00738 | 1.04 | 0.298 |
b_non_work_dad_par_act | b_log_density_par_act | -2.65 | -0.02 | -0.943 | 0.346 | -2.64 | -0.0178 | -0.967 | 0.333 |
b_non_work_dad_par_act | b_log_distance_kid_act | -0.459 | -0.00359 | 8.56 | 0 | 1.45 | 0.0115 | 8.97 | 0 |
b_non_work_dad_par_act | b_log_distance_kid_car | 0.372 | 0.00662 | 0.992 | 0.321 | 0.0468 | 0.00471 | 1.05 | 0.293 |
b_non_work_dad_par_act | b_log_distance_par_act | -10.1 | -0.0451 | 8.18 | 2.22e-16 | 3.29 | 0.015 | 8.64 | 0 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 3.24 | 0.0376 | 1.2 | 0.23 | 1.86 | 0.0227 | 1.25 | 0.21 |
b_non_work_dad_par_act | b_log_income_k_kid_car | 0.083 | 0.0065 | 0.987 | 0.324 | -0.00138 | -0.000367 | 1.04 | 0.3 |
b_non_work_dad_par_act | b_log_income_k_par_act | 17.6 | 0.117 | 0.65 | 0.516 | 25.7 | 0.178 | 0.695 | 0.487 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 47.2 | 0.199 | 1.46 | 0.146 | 40.3 | 0.18 | 1.5 | 0.133 |
b_non_work_dad_par_act | b_non_work_dad_kid_car | 0.25 | 0.00693 | 0.991 | 0.322 | 0.0299 | 0.0031 | 1.04 | 0.296 |
b_non_work_mom_kid_act | asc_kid_act | -0.434 | -0.142 | -0.914 | 0.361 | -0.356 | -0.115 | -0.926 | 0.354 |
b_non_work_mom_kid_act | asc_kid_car | 0.654 | 0.145 | -1.59 | 0.111 | -0.00167 | -0.0027 | -1.6 | 0.109 |
b_non_work_mom_kid_act | asc_par_act | -0.187 | -0.0295 | -0.855 | 0.392 | -0.157 | -0.0226 | -0.865 | 0.387 |
b_non_work_mom_kid_act | b_age_kid_act | 0.454 | 0.0331 | -4.62 | 3.84e-06 | 0.59 | 0.0438 | -4.69 | 2.76e-06 |
b_non_work_mom_kid_act | b_age_kid_car | -2.37 | -0.145 | -1.51 | 0.13 | 0.00564 | 0.00244 | -1.64 | 0.1 |
b_non_work_mom_kid_act | b_age_par_act | 0.251 | 0.00842 | 1.46 | 0.145 | 0.63 | 0.0228 | 1.5 | 0.134 |
b_non_work_mom_kid_act | b_female_kid_act | -0.653 | -0.0116 | 1.8 | 0.0718 | -3.31 | -0.0594 | 1.77 | 0.0768 |
b_non_work_mom_kid_act | b_female_kid_car | 3.17 | 0.144 | -1.53 | 0.127 | -0.0227 | -0.00705 | -1.56 | 0.118 |
b_non_work_mom_kid_act | b_female_par_act | -0.128 | -0.00123 | 0.0542 | 0.957 | -0.863 | -0.00836 | 0.054 | 0.957 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -1.43 | -0.0241 | -4.2 | 2.63e-05 | -0.0452 | -0.000777 | -4.3 | 1.74e-05 |
b_non_work_mom_kid_act | b_has_big_sib_kid_car | -9.17 | -0.145 | -1.11 | 0.266 | 0.0167 | 0.00185 | -1.72 | 0.0854 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | -1.59 | -0.0146 | -1.03 | 0.303 | 1.53 | 0.0143 | -1.05 | 0.293 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -4.91 | -0.0827 | -2.98 | 0.0029 | -3.56 | -0.0611 | -3.04 | 0.0024 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_car | -9.99 | -0.145 | -1.07 | 0.284 | 0.0454 | 0.00477 | -1.73 | 0.0836 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | -2.29 | -0.021 | -2.55 | 0.0108 | -0.378 | -0.00352 | -2.58 | 0.00975 |
b_non_work_mom_kid_act | b_log_density_kid_act | -1.08 | -0.0492 | -3.53 | 0.000423 | -1.36 | -0.0599 | -3.53 | 0.000416 |
b_non_work_mom_kid_act | b_log_density_kid_car | 1.37 | 0.144 | -1.59 | 0.112 | -0.00504 | -0.00367 | -1.59 | 0.112 |
b_non_work_mom_kid_act | b_log_density_par_act | 0.00545 | 0.000107 | -5.2 | 2.03e-07 | -0.656 | -0.0111 | -4.83 | 1.35e-06 |
b_non_work_mom_kid_act | b_log_distance_kid_act | 1.97 | 0.0403 | 15.3 | 0 | 2.22 | 0.0445 | 15.3 | 0 |
b_non_work_mom_kid_act | b_log_distance_kid_car | 3.1 | 0.144 | -1.53 | 0.126 | -0.0113 | -0.00287 | -1.56 | 0.118 |
b_non_work_mom_kid_act | b_log_distance_par_act | -0.302 | -0.00353 | 11.9 | 0 | -0.244 | -0.0028 | 11.7 | 0 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 6.42 | 0.195 | -0.946 | 0.344 | 4.95 | 0.152 | -0.935 | 0.35 |
b_non_work_mom_kid_act | b_log_income_k_kid_car | 0.683 | 0.14 | -1.59 | 0.111 | 0.00983 | 0.00658 | -1.6 | 0.109 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 1.84 | 0.032 | -1.79 | 0.0735 | 1.36 | 0.0239 | -1.79 | 0.0736 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -2.57 | -0.0283 | -0.0977 | 0.922 | 0.239 | 0.00269 | -0.1 | 0.92 |
b_non_work_mom_kid_act | b_non_work_dad_kid_car | 1.94 | 0.14 | -1.57 | 0.116 | 0.0258 | 0.00673 | -1.58 | 0.114 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -1.78 | -0.0112 | -1.48 | 0.138 | 1.08 | 0.0072 | -1.56 | 0.119 |
b_non_work_mom_kid_car | asc_kid_act | -0.0228 | -0.00576 | 0.393 | 0.694 | -0.0061 | -0.0108 | 2.71 | 0.00677 |
b_non_work_mom_kid_car | asc_kid_car | 5.85 | 0.999 | -0.122 | 0.903 | 0.108 | 0.958 | -0.877 | 0.381 |
b_non_work_mom_kid_car | asc_par_act | -0.0506 | -0.00616 | 0.437 | 0.662 | -0.0281 | -0.0221 | 2.63 | 0.00862 |
b_non_work_mom_kid_car | b_age_kid_act | -2.57 | -0.144 | -2.43 | 0.0153 | -0.0638 | -0.0259 | -11.2 | 0 |
b_non_work_mom_kid_car | b_age_kid_car | -21.2 | -0.999 | -0.122 | 0.903 | -0.403 | -0.952 | -0.881 | 0.378 |
b_non_work_mom_kid_car | b_age_par_act | -2.14 | -0.0554 | 2.16 | 0.0307 | 0.00598 | 0.00118 | 6.19 | 5.9e-10 |
b_non_work_mom_kid_car | b_female_kid_act | 3.33 | 0.0456 | 2.5 | 0.0124 | 0.224 | 0.0219 | 4.15 | 3.35e-05 |
b_non_work_mom_kid_car | b_female_kid_car | 28.4 | 0.995 | -0.122 | 0.903 | 0.451 | 0.766 | -0.798 | 0.425 |
b_non_work_mom_kid_car | b_female_par_act | 2.69 | 0.0199 | 0.724 | 0.469 | 0.343 | 0.0182 | 0.894 | 0.371 |
b_non_work_mom_kid_car | b_has_big_sib_kid_act | -9.78 | -0.127 | -2.62 | 0.00872 | -0.0094 | -0.000883 | -4.58 | 4.6e-06 |
b_non_work_mom_kid_car | b_has_big_sib_kid_car | -82 | -0.999 | -0.122 | 0.903 | -1.57 | -0.948 | -0.876 | 0.381 |
b_non_work_mom_kid_car | b_has_big_sib_par_act | -8 | -0.0566 | -0.306 | 0.76 | -0.106 | -0.00541 | -0.388 | 0.698 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_act | -10.6 | -0.137 | -1.68 | 0.0933 | -0.00481 | -0.00045 | -2.94 | 0.00332 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_car | -89.4 | -0.999 | -0.123 | 0.902 | -1.66 | -0.956 | -0.888 | 0.374 |
b_non_work_mom_kid_car | b_has_lil_sib_par_act | -8.61 | -0.0608 | -1.69 | 0.0906 | 0.0605 | 0.00308 | -2.15 | 0.0319 |
b_non_work_mom_kid_car | b_log_density_kid_act | 1.66 | 0.0585 | -1.79 | 0.0734 | 0.114 | 0.0275 | -5.74 | 9.27e-09 |
b_non_work_mom_kid_car | b_log_density_kid_car | 12.2 | 0.996 | -0.122 | 0.903 | 0.207 | 0.827 | -0.862 | 0.389 |
b_non_work_mom_kid_car | b_log_density_par_act | 1.34 | 0.0203 | -3.49 | 0.000483 | 0.168 | 0.0156 | -5.36 | 8.24e-08 |
b_non_work_mom_kid_car | b_log_distance_kid_act | 3.34 | 0.0526 | 13.9 | 0 | 0.222 | 0.0243 | 24.5 | 0 |
b_non_work_mom_kid_car | b_log_distance_kid_car | 27.7 | 0.995 | -0.123 | 0.902 | 0.619 | 0.858 | -0.9 | 0.368 |
b_non_work_mom_kid_car | b_log_distance_par_act | 2.68 | 0.0241 | 11.6 | 0 | -0.0443 | -0.00277 | 15 | 0 |
b_non_work_mom_kid_car | b_log_income_k_kid_act | 0.98 | 0.0229 | 0.32 | 0.749 | 0.172 | 0.0287 | 0.787 | 0.431 |
b_non_work_mom_kid_car | b_log_income_k_kid_car | 6.11 | 0.963 | -0.123 | 0.902 | 0.132 | 0.481 | -0.879 | 0.38 |
b_non_work_mom_kid_car | b_log_income_k_par_act | 0.67 | 0.00897 | -0.621 | 0.535 | 0.184 | 0.0175 | -1.03 | 0.304 |
b_non_work_mom_kid_car | b_non_work_dad_kid_ace | 1.64 | 0.014 | 0.64 | 0.522 | -0.134 | -0.00822 | 0.842 | 0.4 |
b_non_work_mom_kid_car | b_non_work_dad_kid_car | 17.3 | 0.967 | -0.122 | 0.903 | 0.271 | 0.387 | -0.791 | 0.429 |
b_non_work_mom_kid_car | b_non_work_dad_par_act | 1.37 | 0.00665 | -0.938 | 0.348 | 0.172 | 0.00629 | -1.1 | 0.273 |
b_non_work_mom_kid_car | b_non_work_mom_kid_act | 11.5 | 0.145 | 0.942 | 0.346 | -0.00577 | -0.00053 | 1.43 | 0.154 |
b_non_work_mom_par_act | asc_kid_act | -0.14 | -0.0256 | 3.36 | 0.000783 | -0.116 | -0.0209 | 3.4 | 0.000683 |
b_non_work_mom_par_act | asc_kid_car | 0.541 | 0.0667 | 3 | 0.00269 | -0.0101 | -0.00906 | 3.03 | 0.00246 |
b_non_work_mom_par_act | asc_par_act | -1.65 | -0.145 | 3.36 | 0.000776 | -0.939 | -0.0753 | 3.41 | 0.000652 |
b_non_work_mom_par_act | b_age_kid_act | 0.107 | 0.00436 | 1.25 | 0.212 | 0.429 | 0.0177 | 1.26 | 0.206 |
b_non_work_mom_par_act | b_age_kid_car | -1.95 | -0.0666 | 2.91 | 0.0036 | 0.0415 | 0.00997 | 3 | 0.00266 |
b_non_work_mom_par_act | b_age_par_act | 1.2 | 0.0223 | 4.64 | 3.57e-06 | 0.655 | 0.0132 | 4.69 | 2.71e-06 |
b_non_work_mom_par_act | b_female_kid_act | 0.0993 | 0.000982 | 4.67 | 3.03e-06 | -0.892 | -0.00891 | 4.69 | 2.75e-06 |
b_non_work_mom_par_act | b_female_kid_car | 2.62 | 0.0664 | 2.99 | 0.00275 | -0.0707 | -0.0122 | 3.05 | 0.00232 |
b_non_work_mom_par_act | b_female_par_act | -8.92 | -0.0477 | 2.78 | 0.00536 | 0.752 | 0.00406 | 2.87 | 0.00412 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | -1.75 | -0.0164 | 0.496 | 0.62 | 1.41 | 0.0135 | 0.508 | 0.612 |
b_non_work_mom_par_act | b_has_big_sib_kid_car | -7.58 | -0.0666 | 2.46 | 0.014 | 0.117 | 0.00718 | 2.94 | 0.00325 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -2.5 | -0.0128 | 1.9 | 0.058 | 2.66 | 0.0139 | 1.94 | 0.0525 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -2.54 | -0.0238 | 1.27 | 0.202 | -0.519 | -0.00494 | 1.3 | 0.195 |
b_non_work_mom_par_act | b_has_lil_sib_kid_car | -8.25 | -0.0666 | 2.39 | 0.0167 | 0.162 | 0.00947 | 2.94 | 0.00333 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | -23 | -0.117 | 0.625 | 0.532 | -17.1 | -0.0887 | 0.638 | 0.523 |
b_non_work_mom_par_act | b_log_density_kid_act | -0.291 | -0.00739 | 1.72 | 0.0854 | -0.795 | -0.0195 | 1.73 | 0.0835 |
b_non_work_mom_par_act | b_log_density_kid_car | 1.13 | 0.0664 | 3.01 | 0.00264 | -0.0287 | -0.0117 | 3.03 | 0.00242 |
b_non_work_mom_par_act | b_log_density_par_act | -4.53 | -0.0497 | 0.0986 | 0.921 | -13.5 | -0.127 | 0.0931 | 0.926 |
b_non_work_mom_par_act | b_log_distance_kid_act | 0.755 | 0.00858 | 13.4 | 0 | 0.768 | 0.00854 | 13.4 | 0 |
b_non_work_mom_par_act | b_log_distance_kid_car | 2.56 | 0.0664 | 3 | 0.00274 | 0.00887 | 0.00125 | 3.05 | 0.00232 |
b_non_work_mom_par_act | b_log_distance_par_act | -6.27 | -0.0409 | 11.8 | 0 | -4.52 | -0.0288 | 11.8 | 0 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 1.87 | 0.0316 | 3.21 | 0.00131 | 1.25 | 0.0213 | 3.24 | 0.00121 |
b_non_work_mom_par_act | b_log_income_k_kid_car | 0.564 | 0.0642 | 3 | 0.00269 | -0.00217 | -0.000807 | 3.03 | 0.00246 |
b_non_work_mom_par_act | b_log_income_k_par_act | 22.5 | 0.217 | 2.47 | 0.0136 | 17.9 | 0.174 | 2.43 | 0.0149 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -1.78 | -0.0109 | 2.89 | 0.00382 | 1.17 | 0.00735 | 2.95 | 0.0032 |
b_non_work_mom_par_act | b_non_work_dad_kid_car | 1.6 | 0.0645 | 3.01 | 0.00265 | 0.0222 | 0.00322 | 3.04 | 0.00239 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -8.44 | -0.0295 | 0.871 | 0.384 | 9.03 | 0.0336 | 0.931 | 0.352 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 21.4 | 0.195 | 3.71 | 0.000209 | 20.4 | 0.191 | 3.74 | 0.000183 |
b_non_work_mom_par_act | b_non_work_mom_kid_car | 9.47 | 0.0667 | 2.58 | 0.00993 | -0.185 | -0.00947 | 3.09 | 0.00198 |
b_veh_per_driver_kid_act | asc_kid_act | -0.579 | -0.182 | -1.67 | 0.095 | -0.64 | -0.185 | -1.59 | 0.113 |
b_veh_per_driver_kid_act | asc_kid_car | -0.417 | -0.0885 | -2.3 | 0.0216 | -0.0448 | -0.065 | -2.2 | 0.0278 |
b_veh_per_driver_kid_act | asc_par_act | -0.151 | -0.0228 | -1.62 | 0.106 | -0.115 | -0.0149 | -1.54 | 0.124 |
b_veh_per_driver_kid_act | b_age_kid_act | -0.242 | -0.0169 | -5.17 | 2.37e-07 | -0.197 | -0.0131 | -4.92 | 8.47e-07 |
b_veh_per_driver_kid_act | b_age_kid_car | 1.51 | 0.0884 | -2.33 | 0.0196 | 0.163 | 0.0634 | -2.24 | 0.0249 |
b_veh_per_driver_kid_act | b_age_par_act | -0.421 | -0.0135 | 0.671 | 0.502 | -0.368 | -0.012 | 0.65 | 0.516 |
b_veh_per_driver_kid_act | b_female_kid_act | 0.58 | 0.00986 | 1.17 | 0.242 | 0.387 | 0.00624 | 1.13 | 0.257 |
b_veh_per_driver_kid_act | b_female_kid_car | -2.02 | -0.0881 | -2.1 | 0.0355 | -0.179 | -0.0499 | -2.16 | 0.0306 |
b_veh_per_driver_kid_act | b_female_par_act | 0.849 | 0.0078 | -0.367 | 0.713 | 0.812 | 0.00707 | -0.361 | 0.718 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 2.15 | 0.0347 | -4.83 | 1.37e-06 | 0.00561 | 8.65e-05 | -4.63 | 3.67e-06 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_car | 5.85 | 0.0884 | -1.82 | 0.069 | 0.644 | 0.064 | -2.32 | 0.0201 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | 0.62 | 0.00544 | -1.43 | 0.151 | 1.05 | 0.00883 | -1.43 | 0.154 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | 0.196 | 0.00316 | -3.62 | 0.000291 | -2.11 | -0.0325 | -3.47 | 0.000522 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_car | 6.37 | 0.0884 | -1.75 | 0.0806 | 0.676 | 0.0638 | -2.33 | 0.0197 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | 0.213 | 0.00187 | -2.95 | 0.00314 | -0.418 | -0.00349 | -2.91 | 0.00356 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 1.37 | 0.0599 | -4.28 | 1.84e-05 | 1.18 | 0.0469 | -4.05 | 5.05e-05 |
b_veh_per_driver_kid_act | b_log_density_kid_car | -0.871 | -0.0881 | -2.25 | 0.0242 | -0.093 | -0.0608 | -2.19 | 0.0286 |
b_veh_per_driver_kid_act | b_log_density_par_act | -0.0184 | -0.000347 | -5.69 | 1.27e-08 | -0.142 | -0.00216 | -5.15 | 2.56e-07 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 0.518 | 0.0101 | 14 | 0 | 1.26 | 0.0227 | 13.5 | 0 |
b_veh_per_driver_kid_act | b_log_distance_kid_car | -1.98 | -0.0881 | -2.11 | 0.0348 | -0.155 | -0.0352 | -2.16 | 0.0306 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 3.06 | 0.0343 | 11.5 | 0 | 3.96 | 0.0408 | 11 | 0 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -5.45 | -0.158 | -1.46 | 0.144 | -5.57 | -0.153 | -1.4 | 0.16 |
b_veh_per_driver_kid_act | b_log_income_k_kid_car | -0.435 | -0.0852 | -2.3 | 0.0217 | -0.0276 | -0.0166 | -2.2 | 0.0278 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -1.59 | -0.0264 | -2.29 | 0.0222 | -1.97 | -0.031 | -2.21 | 0.027 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 3.88 | 0.0409 | -0.571 | 0.568 | 3.18 | 0.0321 | -0.562 | 0.574 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_car | -1.23 | -0.0855 | -2.21 | 0.0271 | -0.112 | -0.0263 | -2.18 | 0.0294 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 2.16 | 0.013 | -1.79 | 0.0742 | 0.31 | 0.00186 | -1.84 | 0.0657 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | 0.596 | 0.00937 | -0.584 | 0.559 | 3.53 | 0.0533 | -0.584 | 0.559 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_car | -7.3 | -0.0884 | -1.31 | 0.191 | -0.808 | -0.0667 | -2.02 | 0.0438 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | 0.0372 | 0.000325 | -3.75 | 0.000173 | 1.35 | 0.0113 | -3.75 | 0.000175 |
b_veh_per_driver_kid_car | asc_kid_act | 0.0117 | 0.00569 | 1.11 | 0.268 | 0.00303 | 0.0123 | 8.04 | 8.88e-16 |
b_veh_per_driver_kid_car | asc_kid_car | -3.05 | -0.999 | 0.123 | 0.902 | -0.0453 | -0.919 | 1.04 | 0.297 |
b_veh_per_driver_kid_car | asc_par_act | 0.0263 | 0.00613 | 1.19 | 0.236 | 0.0145 | 0.0262 | 5.88 | 4.2e-09 |
b_veh_per_driver_kid_car | b_age_kid_act | 1.34 | 0.144 | -4.44 | 8.88e-06 | 0.0313 | 0.0291 | -12.9 | 0 |
b_veh_per_driver_kid_car | b_age_kid_car | 11 | 0.998 | 0.123 | 0.902 | 0.165 | 0.894 | 1.06 | 0.291 |
b_veh_per_driver_kid_car | b_age_par_act | 1.12 | 0.0554 | 4.05 | 5.12e-05 | -0.00143 | -0.000648 | 7.08 | 1.47e-12 |
b_veh_per_driver_kid_car | b_female_kid_act | -1.74 | -0.0456 | 3.54 | 0.000404 | -0.0927 | -0.0209 | 4.45 | 8.72e-06 |
b_veh_per_driver_kid_car | b_female_kid_car | -14.8 | -0.994 | 0.123 | 0.902 | -0.183 | -0.713 | 1.04 | 0.301 |
b_veh_per_driver_kid_car | b_female_par_act | -1.4 | -0.0199 | 0.962 | 0.336 | -0.163 | -0.0199 | 1.04 | 0.3 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_act | 5.1 | 0.127 | -3.83 | 0.000128 | -0.00532 | -0.00115 | -4.4 | 1.1e-05 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_car | 42.8 | 0.998 | -0.121 | 0.904 | 0.647 | 0.898 | -0.51 | 0.61 |
b_veh_per_driver_kid_car | b_has_big_sib_par_act | 4.17 | 0.0566 | -0.241 | 0.81 | 0.0254 | 0.00298 | -0.254 | 0.8 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_act | 5.51 | 0.137 | -2.4 | 0.0166 | -0.0119 | -0.00256 | -2.73 | 0.00637 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_car | 46.6 | 0.998 | -0.121 | 0.903 | 0.678 | 0.893 | -0.588 | 0.556 |
b_veh_per_driver_kid_car | b_has_lil_sib_par_act | 4.49 | 0.0607 | -1.92 | 0.0546 | -0.0542 | -0.00633 | -2.02 | 0.0436 |
b_veh_per_driver_kid_car | b_log_density_kid_act | -0.866 | -0.0584 | -2.72 | 0.0066 | -0.0584 | -0.0323 | -5.5 | 3.72e-08 |
b_veh_per_driver_kid_car | b_log_density_kid_car | -6.37 | -0.996 | 0.123 | 0.902 | -0.0829 | -0.758 | 1.05 | 0.294 |
b_veh_per_driver_kid_car | b_log_density_par_act | -0.696 | -0.0203 | -4.7 | 2.65e-06 | -0.0875 | -0.0186 | -5.17 | 2.39e-07 |
b_veh_per_driver_kid_car | b_log_distance_kid_act | -1.74 | -0.0526 | 19.4 | 0 | -0.0879 | -0.022 | 25 | 0 |
b_veh_per_driver_kid_car | b_log_distance_kid_car | -14.5 | -0.995 | 0.122 | 0.903 | -0.268 | -0.85 | 0.906 | 0.365 |
b_veh_per_driver_kid_car | b_log_distance_par_act | -1.39 | -0.0241 | 14.1 | 0 | 0.0553 | 0.00795 | 15.3 | 0 |
b_veh_per_driver_kid_car | b_log_income_k_kid_act | -0.511 | -0.0229 | 0.786 | 0.432 | -0.0635 | -0.0243 | 1.25 | 0.211 |
b_veh_per_driver_kid_car | b_log_income_k_kid_car | -3.18 | -0.961 | 0.123 | 0.902 | -0.0562 | -0.471 | 0.993 | 0.321 |
b_veh_per_driver_kid_car | b_log_income_k_par_act | -0.349 | -0.00896 | -0.642 | 0.521 | -0.0805 | -0.0177 | -0.785 | 0.433 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_ace | -0.856 | -0.014 | 0.911 | 0.363 | 0.0937 | 0.0132 | 1.01 | 0.311 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_car | -9.03 | -0.966 | 0.123 | 0.902 | -0.11 | -0.359 | 0.934 | 0.35 |
b_veh_per_driver_kid_car | b_non_work_dad_par_act | -0.716 | -0.00664 | -0.92 | 0.358 | -0.0565 | -0.00474 | -1 | 0.318 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_act | -5.97 | -0.145 | 1.3 | 0.193 | 0.0273 | 0.00576 | 1.69 | 0.091 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_car | -53.4 | -0.998 | 0.123 | 0.902 | -0.766 | -0.883 | 0.956 | 0.339 |
b_veh_per_driver_kid_car | b_non_work_mom_par_act | -4.93 | -0.0666 | -2.7 | 0.00702 | 0.114 | 0.0134 | -2.98 | 0.00293 |
b_veh_per_driver_kid_car | b_veh_per_driver_kid_act | 3.82 | 0.0886 | 2.11 | 0.0352 | 0.309 | 0.0585 | 2.29 | 0.0221 |
b_veh_per_driver_par_act | asc_kid_act | -0.241 | -0.0322 | -5.59 | 2.3e-08 | -0.202 | -0.0219 | -4.69 | 2.73e-06 |
b_veh_per_driver_par_act | asc_kid_car | -0.328 | -0.0295 | -5.85 | 4.82e-09 | 0.0166 | 0.00906 | -4.92 | 8.76e-07 |
b_veh_per_driver_par_act | asc_par_act | -3.06 | -0.196 | -5.52 | 3.42e-08 | -5.83 | -0.283 | -4.62 | 3.88e-06 |
b_veh_per_driver_par_act | b_age_kid_act | 0.0234 | 0.000694 | -7.1 | 1.24e-12 | -0.0681 | -0.0017 | -5.96 | 2.46e-09 |
b_veh_per_driver_par_act | b_age_kid_car | 1.19 | 0.0295 | -5.86 | 4.57e-09 | -0.0554 | -0.00807 | -4.93 | 8.18e-07 |
b_veh_per_driver_par_act | b_age_par_act | 2.64 | 0.036 | -4.5 | 6.68e-06 | 5.97 | 0.0729 | -3.82 | 0.000132 |
b_veh_per_driver_par_act | b_female_kid_act | 0.55 | 0.00397 | -3.95 | 7.75e-05 | 0.311 | 0.00188 | -3.38 | 0.000738 |
b_veh_per_driver_par_act | b_female_kid_car | -1.59 | -0.0294 | -5.76 | 8.37e-09 | 0.128 | 0.0134 | -4.91 | 9.29e-07 |
b_veh_per_driver_par_act | b_female_par_act | 9.41 | 0.0367 | -4.32 | 1.53e-05 | 14 | 0.0457 | -3.82 | 0.000131 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | 1.06 | 0.00723 | -7.11 | 1.13e-12 | 2.05 | 0.0119 | -6.1 | 1.04e-09 |
b_veh_per_driver_par_act | b_has_big_sib_kid_car | 4.6 | 0.0295 | -5.51 | 3.61e-08 | -0.232 | -0.00867 | -4.96 | 7.22e-07 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | -2.89 | -0.0108 | -4.89 | 9.87e-07 | 8.25 | 0.026 | -4.42 | 1e-05 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | 0.604 | 0.00413 | -6.5 | 8.24e-11 | 0.195 | 0.00113 | -5.56 | 2.69e-08 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_car | 5.01 | 0.0295 | -5.44 | 5.31e-08 | -0.27 | -0.00957 | -4.96 | 7.12e-07 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -7.44 | -0.0277 | -5.88 | 4.21e-09 | 6.58 | 0.0206 | -5.33 | 9.99e-08 |
b_veh_per_driver_par_act | b_log_density_kid_act | 0.142 | 0.00264 | -6.7 | 2.14e-11 | 0.49 | 0.00729 | -5.63 | 1.75e-08 |
b_veh_per_driver_par_act | b_log_density_kid_car | -0.685 | -0.0294 | -5.83 | 5.39e-09 | 0.0383 | 0.00941 | -4.91 | 8.91e-07 |
b_veh_per_driver_par_act | b_log_density_par_act | 11.8 | 0.0942 | -7.77 | 7.77e-15 | 22.2 | 0.127 | -6.6 | 4.25e-11 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.894 | 0.00742 | 2.49 | 0.0127 | -0.481 | -0.00324 | 2.11 | 0.035 |
b_veh_per_driver_par_act | b_log_distance_kid_car | -1.55 | -0.0294 | -5.76 | 8.19e-09 | 0.0782 | 0.00667 | -4.91 | 9.32e-07 |
b_veh_per_driver_par_act | b_log_distance_par_act | 1.54 | 0.00734 | 2.73 | 0.00629 | -18 | -0.0695 | 2.3 | 0.0217 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -1.22 | -0.015 | -5.47 | 4.5e-08 | -2.69 | -0.0277 | -4.61 | 3.98e-06 |
b_veh_per_driver_par_act | b_log_income_k_kid_car | -0.342 | -0.0284 | -5.85 | 4.85e-09 | 0.0191 | 0.00431 | -4.92 | 8.77e-07 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -39.9 | -0.282 | -5.31 | 1.09e-07 | -51.2 | -0.301 | -4.56 | 5.03e-06 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 2.16 | 0.00968 | -4.55 | 5.45e-06 | -0.0109 | -4.13e-05 | -3.96 | 7.35e-05 |
b_veh_per_driver_par_act | b_non_work_dad_kid_car | -0.971 | -0.0285 | -5.81 | 6.11e-09 | 0.0636 | 0.00559 | -4.91 | 9.07e-07 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 31.8 | 0.0812 | -4.94 | 7.76e-07 | -13.5 | -0.0304 | -4.36 | 1.32e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | -0.185 | -0.00124 | -4.83 | 1.35e-06 | 1.88 | 0.0106 | -4.16 | 3.15e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_car | -5.74 | -0.0295 | -5.07 | 4e-07 | 0.279 | 0.00866 | -4.86 | 1.17e-06 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | 9.78 | 0.0363 | -6.62 | 3.71e-11 | 17 | 0.0537 | -5.92 | 3.27e-09 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 26.2 | 0.167 | -4.79 | 1.7e-06 | 24.1 | 0.123 | -4 | 6.46e-05 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_car | 3 | 0.0296 | -5.73 | 1e-08 | -0.207 | -0.0147 | -4.95 | 7.6e-07 |
b_y2017_kid_act | asc_kid_act | -0.283 | -0.0963 | -1.98 | 0.0479 | -0.439 | -0.147 | -2 | 0.0455 |
b_y2017_kid_act | asc_kid_car | 0.201 | 0.0461 | -2.68 | 0.00744 | -0.0028 | -0.00471 | -2.71 | 0.00669 |
b_y2017_kid_act | asc_par_act | -0.361 | -0.0591 | -1.91 | 0.0565 | -0.253 | -0.0378 | -1.93 | 0.0531 |
b_y2017_kid_act | b_age_kid_act | 0.0963 | 0.00728 | -5.77 | 8.16e-09 | 1.56 | 0.12 | -6 | 2.02e-09 |
b_y2017_kid_act | b_age_kid_car | -0.726 | -0.0461 | -2.59 | 0.00964 | -0.00144 | -0.000645 | -2.75 | 0.00589 |
b_y2017_kid_act | b_age_par_act | 1.34 | 0.0466 | 0.584 | 0.559 | 1.05 | 0.0397 | 0.596 | 0.551 |
b_y2017_kid_act | b_female_kid_act | 1.26 | 0.0232 | 1.11 | 0.267 | -0.6 | -0.0112 | 1.1 | 0.272 |
b_y2017_kid_act | b_female_kid_car | 0.973 | 0.0459 | -2.51 | 0.0121 | 0.0105 | 0.00339 | -2.67 | 0.00755 |
b_y2017_kid_act | b_female_par_act | -1.18 | -0.0118 | -0.452 | 0.651 | -2.14 | -0.0215 | -0.451 | 0.652 |
b_y2017_kid_act | b_has_big_sib_kid_act | 2.74 | 0.0478 | -5.19 | 2.15e-07 | 4.99 | 0.089 | -5.36 | 8.37e-08 |
b_y2017_kid_act | b_has_big_sib_kid_car | -2.81 | -0.0461 | -1.87 | 0.061 | 0.0113 | 0.0013 | -2.82 | 0.00479 |
b_y2017_kid_act | b_has_big_sib_par_act | 2.1 | 0.0199 | -1.55 | 0.121 | 1.69 | 0.0164 | -1.56 | 0.118 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 6.48 | 0.113 | -4.12 | 3.71e-05 | 6.36 | 0.113 | -4.16 | 3.12e-05 |
b_y2017_kid_act | b_has_lil_sib_kid_car | -3.06 | -0.0461 | -1.79 | 0.0728 | 0.0924 | 0.0101 | -2.83 | 0.00461 |
b_y2017_kid_act | b_has_lil_sib_par_act | 2.85 | 0.027 | -3.12 | 0.0018 | 3.32 | 0.0321 | -3.15 | 0.00165 |
b_y2017_kid_act | b_log_density_kid_act | -0.413 | -0.0196 | -4.64 | 3.53e-06 | -0.134 | -0.00612 | -4.69 | 2.8e-06 |
b_y2017_kid_act | b_log_density_kid_car | 0.419 | 0.0459 | -2.65 | 0.00805 | 0.00657 | 0.00497 | -2.7 | 0.00691 |
b_y2017_kid_act | b_log_density_par_act | 0.409 | 0.00836 | -6.12 | 9.59e-10 | 0.139 | 0.00245 | -5.69 | 1.29e-08 |
b_y2017_kid_act | b_log_distance_kid_act | -4.78 | -0.101 | 13.9 | 0 | -4.93 | -0.102 | 13.8 | 0 |
b_y2017_kid_act | b_log_distance_kid_car | 0.95 | 0.0459 | -2.52 | 0.0118 | -0.0368 | -0.00969 | -2.67 | 0.00762 |
b_y2017_kid_act | b_log_distance_par_act | -10 | -0.122 | 10.9 | 0 | -7.48 | -0.0889 | 10.8 | 0 |
b_y2017_kid_act | b_log_income_k_kid_act | 0.092 | 0.00289 | -1.8 | 0.0726 | -0.281 | -0.00891 | -1.8 | 0.0713 |
b_y2017_kid_act | b_log_income_k_kid_car | 0.21 | 0.0444 | -2.68 | 0.00747 | 0.00626 | 0.00435 | -2.71 | 0.0067 |
b_y2017_kid_act | b_log_income_k_par_act | -0.226 | -0.00407 | -2.53 | 0.0114 | -1.21 | -0.022 | -2.52 | 0.0118 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 0.682 | 0.0078 | -0.666 | 0.506 | 0.995 | 0.0116 | -0.673 | 0.501 |
b_y2017_kid_act | b_non_work_dad_kid_car | 0.595 | 0.0446 | -2.61 | 0.009 | -0.0288 | -0.00779 | -2.69 | 0.00723 |
b_y2017_kid_act | b_non_work_dad_par_act | -0.507 | -0.0033 | -1.85 | 0.0642 | -5.32 | -0.0369 | -1.91 | 0.0555 |
b_y2017_kid_act | b_non_work_mom_kid_act | 2 | 0.034 | -0.732 | 0.464 | 0.0723 | 0.00126 | -0.729 | 0.466 |
b_y2017_kid_act | b_non_work_mom_kid_car | 3.51 | 0.0461 | -1.54 | 0.124 | -0.0885 | -0.00845 | -2.51 | 0.0122 |
b_y2017_kid_act | b_non_work_mom_par_act | 0.188 | 0.00179 | -3.91 | 9.34e-05 | 0.486 | 0.00472 | -3.96 | 7.56e-05 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -0.915 | -0.0149 | -0.111 | 0.912 | -0.338 | -0.0053 | -0.109 | 0.913 |
b_y2017_kid_act | b_veh_per_driver_kid_car | -1.83 | -0.0461 | -2.22 | 0.0264 | 0.0185 | 0.00405 | -2.8 | 0.0051 |
b_y2017_kid_act | b_veh_per_driver_par_act | -1.33 | -0.00921 | 4.47 | 7.96e-06 | 1.34 | 0.00789 | 3.85 | 0.000118 |
b_y2017_kid_car | asc_kid_act | -0.00662 | -0.00577 | 1.64 | 0.101 | -0.00225 | -0.01 | 7.04 | 1.86e-12 |
b_y2017_kid_car | asc_kid_car | 1.69 | 0.995 | -0.121 | 0.904 | 0.0389 | 0.869 | -0.584 | 0.559 |
b_y2017_kid_car | asc_par_act | -0.0147 | -0.00615 | 1.74 | 0.0814 | -0.00958 | -0.0191 | 4.98 | 6.24e-07 |
b_y2017_kid_car | b_age_kid_act | -0.743 | -0.144 | -6.78 | 1.21e-11 | -0.0336 | -0.0345 | -13.3 | 0 |
b_y2017_kid_car | b_age_kid_car | -6.12 | -0.995 | -0.122 | 0.903 | -0.143 | -0.851 | -0.74 | 0.459 |
b_y2017_kid_car | b_age_par_act | -0.619 | -0.0552 | 4.99 | 5.97e-07 | -0.0018 | -0.000904 | 6.82 | 9.23e-12 |
b_y2017_kid_car | b_female_kid_act | 0.963 | 0.0454 | 4.08 | 4.42e-05 | 0.0999 | 0.0248 | 4.33 | 1.51e-05 |
b_y2017_kid_car | b_female_kid_car | 8.2 | 0.991 | -0.0331 | 0.974 | 0.166 | 0.712 | -0.0336 | 0.973 |
b_y2017_kid_car | b_female_par_act | 0.776 | 0.0198 | 0.948 | 0.343 | 0.105 | 0.014 | 0.963 | 0.335 |
b_y2017_kid_car | b_has_big_sib_kid_act | -2.83 | -0.127 | -4.04 | 5.38e-05 | -0.0393 | -0.00934 | -4.53 | 5.9e-06 |
b_y2017_kid_car | b_has_big_sib_kid_car | -23.7 | -0.995 | -0.122 | 0.903 | -0.555 | -0.851 | -0.808 | 0.419 |
b_y2017_kid_car | b_has_big_sib_par_act | -2.31 | -0.0563 | -0.314 | 0.754 | -0.031 | -0.00401 | -0.326 | 0.744 |
b_y2017_kid_car | b_has_lil_sib_kid_act | -3.05 | -0.137 | -2.55 | 0.0108 | 0.038 | 0.00901 | -2.86 | 0.00417 |
b_y2017_kid_car | b_has_lil_sib_kid_car | -25.8 | -0.995 | -0.122 | 0.903 | -0.597 | -0.868 | -0.827 | 0.408 |
b_y2017_kid_car | b_has_lil_sib_par_act | -2.49 | -0.0605 | -2.02 | 0.0438 | 0.0718 | 0.00924 | -2.09 | 0.0364 |
b_y2017_kid_car | b_log_density_kid_act | 0.48 | 0.0582 | -4.47 | 7.68e-06 | 0.0511 | 0.0312 | -5.93 | 3.03e-09 |
b_y2017_kid_car | b_log_density_kid_car | 3.53 | 0.992 | -0.12 | 0.905 | 0.0753 | 0.759 | -0.476 | 0.634 |
b_y2017_kid_car | b_log_density_par_act | 0.386 | 0.0202 | -5.75 | 8.74e-09 | 0.0623 | 0.0146 | -5.31 | 1.08e-07 |
b_y2017_kid_car | b_log_distance_kid_act | 0.966 | 0.0524 | 23.9 | 0 | 0.05 | 0.0138 | 25 | 0 |
b_y2017_kid_car | b_log_distance_kid_car | 8.01 | 0.991 | -0.0519 | 0.959 | 0.212 | 0.741 | -0.058 | 0.954 |
b_y2017_kid_car | b_log_distance_par_act | 0.773 | 0.024 | 15.3 | 0 | -0.0426 | -0.00674 | 15.2 | 0 |
b_y2017_kid_car | b_log_income_k_kid_act | 0.283 | 0.0228 | 0.858 | 0.391 | 0.0525 | 0.0222 | 1.02 | 0.306 |
b_y2017_kid_car | b_log_income_k_kid_car | 1.77 | 0.959 | -0.121 | 0.904 | 0.0421 | 0.389 | -0.551 | 0.582 |
b_y2017_kid_car | b_log_income_k_par_act | 0.194 | 0.00893 | -0.866 | 0.386 | 0.0622 | 0.015 | -0.923 | 0.356 |
b_y2017_kid_car | b_non_work_dad_kid_ace | 0.475 | 0.0139 | 0.894 | 0.371 | -0.066 | -0.0103 | 0.925 | 0.355 |
b_y2017_kid_car | b_non_work_dad_kid_car | 5.01 | 0.963 | -0.111 | 0.912 | 0.106 | 0.383 | -0.249 | 0.803 |
b_y2017_kid_car | b_non_work_dad_par_act | 0.397 | 0.00663 | -0.992 | 0.321 | 0.044 | 0.00406 | -1.05 | 0.293 |
b_y2017_kid_car | b_non_work_mom_kid_act | 3.31 | 0.144 | 1.52 | 0.129 | -0.0343 | -0.00799 | 1.56 | 0.119 |
b_y2017_kid_car | b_non_work_mom_kid_car | 29.6 | 0.995 | 0.123 | 0.902 | 0.684 | 0.87 | 0.915 | 0.36 |
b_y2017_kid_car | b_non_work_mom_par_act | 2.73 | 0.0664 | -2.99 | 0.00278 | -0.105 | -0.0135 | -3.04 | 0.00233 |
b_y2017_kid_car | b_veh_per_driver_kid_act | -2.11 | -0.0881 | 2.09 | 0.0366 | -0.25 | -0.0522 | 2.16 | 0.0311 |
b_y2017_kid_car | b_veh_per_driver_kid_car | -15.4 | -0.995 | -0.122 | 0.903 | -0.293 | -0.855 | -0.89 | 0.373 |
b_y2017_kid_car | b_veh_per_driver_par_act | -1.66 | -0.0294 | 5.75 | 8.74e-09 | 0.0508 | 0.00398 | 4.9 | 9.39e-07 |
b_y2017_kid_car | b_y2017_kid_act | 1.02 | 0.0463 | 2.5 | 0.0126 | 0.00991 | 0.00239 | 2.67 | 0.00766 |
b_y2017_par_act | asc_kid_act | -0.107 | -0.0143 | 14.4 | 0 | -0.017 | -0.00223 | 14.5 | 0 |
b_y2017_par_act | asc_kid_car | 0.171 | 0.0155 | 14.1 | 0 | -0.00722 | -0.00475 | 14.2 | 0 |
b_y2017_par_act | asc_par_act | -3.8 | -0.245 | 14.3 | 0 | -4.67 | -0.274 | 14.3 | 0 |
b_y2017_par_act | b_age_kid_act | 0.445 | 0.0133 | 12.8 | 0 | 0.605 | 0.0183 | 12.9 | 0 |
b_y2017_par_act | b_age_kid_car | -0.619 | -0.0155 | 14 | 0 | 0.0167 | 0.00293 | 14.2 | 0 |
b_y2017_par_act | b_age_par_act | -5.39 | -0.0739 | 14.9 | 0 | -1.51 | -0.0223 | 15.2 | 0 |
b_y2017_par_act | b_female_kid_act | 0.301 | 0.00219 | 14.8 | 0 | -1.9 | -0.0138 | 14.8 | 0 |
b_y2017_par_act | b_female_kid_car | 0.83 | 0.0154 | 14 | 0 | -0.0251 | -0.00318 | 14.2 | 0 |
b_y2017_par_act | b_female_par_act | 0.641 | 0.00252 | 12.2 | 0 | 26 | 0.103 | 12.8 | 0 |
b_y2017_par_act | b_has_big_sib_kid_act | 0.342 | 0.00235 | 11.5 | 0 | 1.34 | 0.00935 | 11.6 | 0 |
b_y2017_par_act | b_has_big_sib_kid_car | -2.4 | -0.0155 | 12.9 | 0 | 0.0702 | 0.00317 | 14.2 | 0 |
b_y2017_par_act | b_has_big_sib_par_act | 16.1 | 0.0604 | 11.6 | 0 | 1.58 | 0.00603 | 11.3 | 0 |
b_y2017_par_act | b_has_lil_sib_kid_act | 1.38 | 0.00949 | 12.1 | 0 | 0.797 | 0.00556 | 12.2 | 0 |
b_y2017_par_act | b_has_lil_sib_kid_car | -2.61 | -0.0155 | 12.7 | 0 | 0.165 | 0.00704 | 14.2 | 0 |
b_y2017_par_act | b_has_lil_sib_par_act | 28.6 | 0.107 | 10.7 | 0 | 27.5 | 0.104 | 10.8 | 0 |
b_y2017_par_act | b_log_density_kid_act | -0.836 | -0.0156 | 13.1 | 0 | -0.627 | -0.0112 | 13.1 | 0 |
b_y2017_par_act | b_log_density_kid_car | 0.358 | 0.0155 | 14.1 | 0 | -0.00445 | -0.00132 | 14.2 | 0 |
b_y2017_par_act | b_log_density_par_act | 8.99 | 0.0724 | 11.6 | 0 | -4.81 | -0.0332 | 11.1 | 0 |
b_y2017_par_act | b_log_distance_kid_act | -1.63 | -0.0136 | 21.4 | 0 | 0.665 | 0.00541 | 21.6 | 0 |
b_y2017_par_act | b_log_distance_kid_car | 0.811 | 0.0154 | 14 | 0 | -0.0974 | -0.01 | 14.2 | 0 |
b_y2017_par_act | b_log_distance_par_act | -49.8 | -0.238 | 18.3 | 0 | -63.7 | -0.297 | 17.8 | 0 |
b_y2017_par_act | b_log_income_k_kid_act | 0.033 | 0.000409 | 14 | 0 | -1.82 | -0.0226 | 14.1 | 0 |
b_y2017_par_act | b_log_income_k_kid_car | 0.179 | 0.0149 | 14.1 | 0 | 0.000747 | 0.000203 | 14.2 | 0 |
b_y2017_par_act | b_log_income_k_par_act | -3.21 | -0.0228 | 12.8 | 0 | 23.9 | 0.17 | 13.8 | 0 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.985 | -0.00444 | 12.5 | 0 | -6.96 | -0.0319 | 12.5 | 0 |
b_y2017_par_act | b_non_work_dad_kid_car | 0.507 | 0.015 | 14.1 | 0 | 0.0091 | 0.000966 | 14.2 | 0 |
b_y2017_par_act | b_non_work_dad_par_act | 12.6 | 0.0323 | 9.09 | 0 | 14.3 | 0.0388 | 9.39 | 0 |
b_y2017_par_act | b_non_work_mom_kid_act | 0.173 | 0.00116 | 13.7 | 0 | -0.344 | -0.00236 | 13.8 | 0 |
b_y2017_par_act | b_non_work_mom_kid_car | 3 | 0.0155 | 12.6 | 0 | -0.184 | -0.00687 | 14.3 | 0 |
b_y2017_par_act | b_non_work_mom_par_act | 12.5 | 0.0468 | 9.84 | 0 | 31.2 | 0.119 | 10.3 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_act | -0.0575 | -0.000369 | 13.9 | 0 | 0.0887 | 0.000545 | 13.9 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_car | -1.56 | -0.0155 | 13.5 | 0 | 0.0514 | 0.00442 | 14.2 | 0 |
b_y2017_par_act | b_veh_per_driver_par_act | -10.5 | -0.0287 | 13.9 | 0 | 28.6 | 0.066 | 13.3 | 0 |
b_y2017_par_act | b_y2017_kid_act | 24.8 | 0.172 | 15 | 0 | 23 | 0.164 | 15.1 | 0 |
b_y2017_par_act | b_y2017_kid_car | 0.874 | 0.0156 | 14 | 0 | -0.0233 | -0.00221 | 14.2 | 0 |
mu_car | asc_kid_act | -0.802 | -0.00574 | 0.137 | 0.891 | -0.189 | -0.00964 | 1 | 0.316 |
mu_car | asc_kid_car | 207 | 1 | 0.123 | 0.902 | 3.86 | 0.986 | 0.898 | 0.369 |
mu_car | asc_par_act | -1.78 | -0.00615 | 0.138 | 0.89 | -0.99 | -0.0225 | 1.01 | 0.312 |
mu_car | b_age_kid_act | -90.7 | -0.144 | 0.0545 | 0.957 | -2.49 | -0.0291 | 0.398 | 0.691 |
mu_car | b_age_kid_car | -747 | -1 | 0.121 | 0.904 | -14.3 | -0.975 | 0.885 | 0.376 |
mu_car | b_age_par_act | -75.6 | -0.0554 | 0.193 | 0.847 | -0.179 | -0.00102 | 1.4 | 0.16 |
mu_car | b_female_kid_act | 118 | 0.0456 | 0.211 | 0.833 | 8.45 | 0.0239 | 1.53 | 0.126 |
mu_car | b_female_kid_car | 1e+03 | 0.996 | 0.124 | 0.901 | 16 | 0.784 | 0.908 | 0.364 |
mu_car | b_female_par_act | 94.8 | 0.0199 | 0.16 | 0.873 | 12.7 | 0.0194 | 1.13 | 0.258 |
mu_car | b_has_big_sib_kid_act | -345 | -0.127 | 0.0274 | 0.978 | -0.695 | -0.00188 | 0.199 | 0.843 |
mu_car | b_has_big_sib_kid_car | -2.9e+03 | -0.999 | 0.117 | 0.907 | -55.6 | -0.97 | 0.855 | 0.392 |
mu_car | b_has_big_sib_par_act | -282 | -0.0566 | 0.111 | 0.912 | -2.73 | -0.00403 | 0.778 | 0.436 |
mu_car | b_has_lil_sib_kid_act | -373 | -0.137 | 0.0625 | 0.95 | -1.21 | -0.00328 | 0.452 | 0.651 |
mu_car | b_has_lil_sib_kid_car | -3.15e+03 | -0.999 | 0.117 | 0.907 | -58.7 | -0.974 | 0.852 | 0.394 |
mu_car | b_has_lil_sib_par_act | -304 | -0.0608 | 0.0417 | 0.967 | 1.81 | 0.00265 | 0.294 | 0.769 |
mu_car | b_log_density_kid_act | 58.6 | 0.0585 | 0.0742 | 0.941 | 4.17 | 0.029 | 0.542 | 0.588 |
mu_car | b_log_density_kid_car | 432 | 0.997 | 0.123 | 0.902 | 7.42 | 0.853 | 0.901 | 0.368 |
mu_car | b_log_density_par_act | 47.1 | 0.0203 | 0.00955 | 0.992 | 6.17 | 0.0165 | 0.0691 | 0.945 |
mu_car | b_log_distance_kid_act | 118 | 0.0526 | 0.579 | 0.563 | 8.22 | 0.0259 | 4.2 | 2.62e-05 |
mu_car | b_log_distance_kid_car | 978 | 0.996 | 0.124 | 0.901 | 21.9 | 0.876 | 0.911 | 0.363 |
mu_car | b_log_distance_par_act | 94.4 | 0.0241 | 0.606 | 0.544 | -2.64 | -0.00476 | 4.31 | 1.62e-05 |
mu_car | b_log_income_k_kid_act | 34.6 | 0.0229 | 0.136 | 0.892 | 5.58 | 0.0269 | 0.991 | 0.322 |
mu_car | b_log_income_k_kid_car | 215 | 0.962 | 0.123 | 0.902 | 4.43 | 0.467 | 0.898 | 0.369 |
mu_car | b_log_income_k_par_act | 23.6 | 0.00896 | 0.104 | 0.917 | 6.07 | 0.0167 | 0.756 | 0.45 |
mu_car | b_non_work_dad_kid_ace | 58 | 0.014 | 0.153 | 0.878 | -5.96 | -0.0106 | 1.09 | 0.276 |
mu_car | b_non_work_dad_kid_car | 612 | 0.967 | 0.124 | 0.902 | 9.84 | 0.405 | 0.903 | 0.366 |
mu_car | b_non_work_dad_par_act | 48.5 | 0.00666 | 0.0663 | 0.947 | 3.99 | 0.0042 | 0.451 | 0.652 |
mu_car | b_non_work_mom_kid_act | 404 | 0.145 | 0.158 | 0.875 | -0.582 | -0.00154 | 1.13 | 0.256 |
mu_car | b_non_work_mom_kid_car | 3.62e+03 | 1 | 0.13 | 0.897 | 67.3 | 0.976 | 0.947 | 0.343 |
mu_car | b_non_work_mom_par_act | 334 | 0.0667 | 0.00521 | 0.996 | -6.09 | -0.00899 | 0.0365 | 0.971 |
mu_car | b_veh_per_driver_kid_act | -258 | -0.0885 | 0.175 | 0.861 | -27.8 | -0.0662 | 1.25 | 0.211 |
mu_car | b_veh_per_driver_kid_car | -1.88e+03 | -0.999 | 0.119 | 0.905 | -27.6 | -0.917 | 0.872 | 0.383 |
mu_car | b_veh_per_driver_par_act | -203 | -0.0295 | 0.436 | 0.663 | 10.5 | 0.00943 | 2.91 | 0.00364 |
mu_car | b_y2017_kid_act | 124 | 0.0461 | 0.179 | 0.858 | -1.3 | -0.00359 | 1.29 | 0.196 |
mu_car | b_y2017_kid_car | 1.05e+03 | 0.996 | 0.125 | 0.901 | 24.2 | 0.889 | 0.912 | 0.362 |
mu_car | b_y2017_par_act | 106 | 0.0155 | -0.632 | 0.527 | -4.11 | -0.00443 | -4.3 | 1.68e-05 |
Smallest eigenvalue: 7.8179e-06
+Largest eigenvalue: 581133
+Condition number: 7.43336e+10
+ \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/car-nest/mode_nests~00.pickle b/models/IATBR plan/4 alternatives/car-nest/mode_nests~00.pickle new file mode 100644 index 0000000..169c536 Binary files /dev/null and b/models/IATBR plan/4 alternatives/car-nest/mode_nests~00.pickle differ diff --git a/models/IATBR plan/4 alternatives/car-nest/model-car-nest.py b/models/IATBR plan/4 alternatives/car-nest/model-car-nest.py new file mode 100644 index 0000000..11ba69e --- /dev/null +++ b/models/IATBR plan/4 alternatives/car-nest/model-car-nest.py @@ -0,0 +1,212 @@ +# Model predicts the choice among four alternatives: +# * Car with a parent +# * Car without a parent (presumably a carpool) +# * Active with a parent +# * Active without a parent + +# In this model, the alternatives are independent + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable +from biogeme.nests import OneNestForNestedLogit, NestsForNestedLogit + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips_sc.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +y2017 = Variable('sc_y2017') +veh_per_driver = Variable('sc_veh_per_driver') +non_work_mom = Variable('sc_non_work_mom') +non_work_dad = Variable('sc_non_work_dad') +age = Variable('sc_age') +female = Variable('sc_female') +has_lil_sib = Variable('sc_has_lil_sib') +has_big_sib = Variable('sc_has_big_sib') +log_inc_k = Variable('sc_log_inc_k') +log_distance = Variable('sc_log_distance') +log_density = Variable('sc_log_density') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_car = Variable('av_kid_car') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car with parent is reference case) +asc_par_car = Beta('asc_par_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_car = Beta('asc_kid_car', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_par_car = Beta('b_log_income_k_par_car', 0, None, None, 1) +b_veh_per_driver_par_car = Beta('b_veh_per_driver_par_car', 0, None, None, 1) +b_non_work_mom_par_car = Beta('b_non_work_mom_par_car', 0, None, None, 1) +b_non_work_dad_par_car = Beta('b_non_work_dad_par_car', 0, None, None, 1) + +b_age_par_car = Beta('b_age_par_car', 0, None, None, 1) +b_female_par_car = Beta('b_female_par_car', 0, None, None, 1) +b_has_lil_sib_par_car = Beta('b_has_lil_sib_par_car', 0, None, None, 1) +b_has_big_sib_par_car = Beta('b_has_big_sib_par_car', 0, None, None, 1) + +b_log_distance_par_car = Beta('b_log_distance_par_car', 0, None, None, 1) +b_log_density_par_car = Beta('b_log_density_par_car', 0, None, None, 1) + +b_y2017_par_car = Beta('b_y2017_par_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) + +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for with kid car +b_log_income_k_kid_car = Beta('b_log_income_k_kid_car', 0, None, None, 0) +b_veh_per_driver_kid_car = Beta('b_veh_per_driver_kid_car', 0, None, None, 0) +b_non_work_mom_kid_car = Beta('b_non_work_mom_kid_car', 0, None, None, 0) +b_non_work_dad_kid_car = Beta('b_non_work_dad_kid_car', 0, None, None, 0) + +b_age_kid_car = Beta('b_age_kid_car', 0, None, None, 0) +b_female_kid_car = Beta('b_female_kid_car', 0, None, None, 0) +b_has_lil_sib_kid_car = Beta('b_has_lil_sib_kid_car', 0, None, None, 0) +b_has_big_sib_kid_car = Beta('b_has_big_sib_kid_car', 0, None, None, 0) + +b_log_distance_kid_car = Beta('b_log_distance_kid_car', 0, None, None, 0) +b_log_density_kid_car = Beta('b_log_density_kid_car', 0, None, None, 0) + +b_y2017_kid_car = Beta('b_y2017_kid_car', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) + +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# Definition of utility functions +V_par_car = ( + asc_par_car + + b_log_income_k_par_car * log_inc_k + + b_veh_per_driver_par_car * veh_per_driver + + b_non_work_mom_par_car * non_work_mom + + b_non_work_dad_par_car * non_work_dad + + b_age_par_car * age + + b_female_par_car * female + + b_has_lil_sib_par_car * has_lil_sib + + b_has_big_sib_par_car * has_big_sib + + b_log_distance_par_car * log_distance + + b_log_density_par_car * log_density + + b_y2017_par_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_inc_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_car = ( + asc_kid_car + + b_log_income_k_kid_car * log_inc_k + + b_veh_per_driver_kid_car * veh_per_driver + + b_non_work_mom_kid_car * non_work_mom + + b_non_work_dad_kid_car * non_work_dad + + b_age_kid_car * age + + b_female_kid_car * female + + b_has_lil_sib_kid_car * has_lil_sib + + b_has_big_sib_kid_car * has_big_sib + + b_log_distance_kid_car * log_distance + + b_log_density_kid_car * log_density + + b_y2017_kid_car * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_inc_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {17: V_par_car, + 18: V_par_act, + 27: V_kid_car, + 28: V_kid_act} + +# associate availability conditions with alternatives: + +av = {17: av_par_car, + 18: av_par_act, + 27: av_kid_car, + 28: av_kid_act} + +# Define nests based on mode +mu_car = Beta('mu_car', 1, 1.0, None, 0) + +car_nest = OneNestForNestedLogit( + nest_param=mu_car, + list_of_alternatives=[17,27], + name='car_nest' +) + +mode_nests = NestsForNestedLogit( + choice_set=list(V), + tuple_of_nests=(car_nest,) +) + +# Define model +my_model = models.lognested(V, av, mode_nests, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, my_model) +the_biogeme.modelName = 'mode_nests' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/cross-nest-reduced/__cross_nest.iter b/models/IATBR plan/4 alternatives/cross-nest-reduced/__cross_nest.iter new file mode 100644 index 0000000..f3cde81 --- /dev/null +++ b/models/IATBR plan/4 alternatives/cross-nest-reduced/__cross_nest.iter @@ -0,0 +1,39 @@ +alpha_kid_CAR = 0.8018004782870968 +asc_kid_act = -4.7003011818203415 +asc_kid_car = -1.0917707898243416 +asc_par_act = -5.505164004126013 +b_age_kid_act = 2.304147278498441 +b_age_kid_car = 0.5414349151895101 +b_age_par_act = -2.5374234332918824 +b_female_kid_act = -2.709168775485126 +b_female_kid_car = -0.6601024961273007 +b_female_par_act = -1.1949451366559996 +b_has_big_sib_kid_act = 36.352998710285576 +b_has_big_sib_kid_car = 15.510210594480535 +b_has_big_sib_par_act = 5.000691974388845 +b_has_lil_sib_kid_act = 2.0024459081665023 +b_has_lil_sib_kid_car = 1.547328717828519 +b_has_lil_sib_par_act = 2.8860304700009602 +b_log_density_kid_act = 13.002192565140634 +b_log_density_kid_car = -0.22490578188793878 +b_log_density_par_act = 38.88793179539146 +b_log_distance_kid_act = -1.5398566169330365 +b_log_distance_kid_car = -0.12209603283982441 +b_log_distance_par_act = -1.6901590523964862 +b_log_income_k_kid_act = -0.4081652271072767 +b_log_income_k_kid_car = -0.12072281893632686 +b_log_income_k_par_act = 0.6732089990699264 +b_non_work_dad_kid_ace = -1.5310674017696042 +b_non_work_dad_kid_car = -0.3995879374281845 +b_non_work_dad_par_act = 1.850131171215673 +b_non_work_mom_kid_act = -1.1478956884292029 +b_non_work_mom_kid_car = -1.7635200466160914 +b_non_work_mom_par_act = 4.1267293990627545 +b_veh_per_driver_kid_act = -1.413376566669609 +b_veh_per_driver_kid_car = 0.6822202760111857 +b_veh_per_driver_par_act = -11.001423158371027 +b_y2017_kid_act = -2.2548202911028628 +b_y2017_kid_car = -0.4937909342805004 +b_y2017_par_act = 26.85287258497452 +mu_motor = 3.5013724207039525 +mu_no_parent = 4.058163627111989 diff --git a/models/IATBR plan/4 alternatives/cross-nest-reduced/biogeme.toml b/models/IATBR plan/4 alternatives/cross-nest-reduced/biogeme.toml new file mode 100644 index 0000000..0902580 --- /dev/null +++ b/models/IATBR plan/4 alternatives/cross-nest-reduced/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on April 08, 2024. 16:34:04 + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 10000 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + diff --git a/models/IATBR plan/4 alternatives/cross-nest-reduced/cross-nest4-redu.py b/models/IATBR plan/4 alternatives/cross-nest-reduced/cross-nest4-redu.py new file mode 100644 index 0000000..35dc4db --- /dev/null +++ b/models/IATBR plan/4 alternatives/cross-nest-reduced/cross-nest4-redu.py @@ -0,0 +1,221 @@ +# Cross-nested model + + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable +from biogeme.nests import OneNestForCrossNestedLogit, NestsForCrossNestedLogit + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips_sc3.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +veh_per_driver = Variable('sc3_veh_per_driver') +non_work_mom = Variable('sc3_non_work_mom') +non_work_dad = Variable('sc3_non_work_dad') +age = Variable('sc3_age') +female = Variable('sc3_female') +has_lil_sib = Variable('sc3_has_lil_sib') +has_big_sib = Variable('sc3_has_big_sib') +log_income_k = Variable('sc3_log_inc_k') +log_distance = Variable('log_distance') +log_density = Variable('sc3_log_density') +y2017 = Variable('sc3_y2017') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_car = Variable('av_kid_car') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car with parent is reference case) +asc_par_car = Beta('asc_par_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_car = Beta('asc_kid_car', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_par_car = Beta('b_log_income_k_par_car', 0, None, None, 1) +b_veh_per_driver_par_car = Beta('b_veh_per_driver_par_car', 0, None, None, 1) +b_non_work_mom_par_car = Beta('b_non_work_mom_par_car', 0, None, None, 1) +b_non_work_dad_par_car = Beta('b_non_work_dad_par_car', 0, None, None, 1) + +b_age_par_car = Beta('b_age_par_car', 0, None, None, 1) +b_female_par_car = Beta('b_female_par_car', 0, None, None, 1) +b_has_lil_sib_par_car = Beta('b_has_lil_sib_par_car', 0, None, None, 1) +b_has_big_sib_par_car = Beta('b_has_big_sib_par_car', 0, None, None, 1) + +b_log_distance_par_car = Beta('b_log_distance_par_car', 0, None, None, 1) +b_log_density_par_car = Beta('b_log_density_par_car', 0, None, None, 1) +b_y2017_par_car = Beta('b_y2017_par_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for with kid car +b_log_income_k_kid_car = Beta('b_log_income_k_kid_car', 0, None, None, 0) +b_veh_per_driver_kid_car = Beta('b_veh_per_driver_kid_car', 0, None, None, 0) +b_non_work_mom_kid_car = Beta('b_non_work_mom_kid_car', 0, None, None, 0) +b_non_work_dad_kid_car = Beta('b_non_work_dad_kid_car', 0, None, None, 0) + +b_age_kid_car = Beta('b_age_kid_car', 0, None, None, 0) +b_female_kid_car = Beta('b_female_kid_car', 0, None, None, 0) +b_has_lil_sib_kid_car = Beta('b_has_lil_sib_kid_car', 0, None, None, 0) +b_has_big_sib_kid_car = Beta('b_has_big_sib_kid_car', 0, None, None, 0) + +b_log_distance_kid_car = Beta('b_log_distance_kid_car', 0, None, None, 0) +b_log_density_kid_car = Beta('b_log_density_kid_car', 0, None, None, 0) +b_y2017_kid_car = Beta('b_y2017_kid_car', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# MU parameters for nests +mu_parent = Beta('mu_parent', 1, 1, None, 0) +mu_no_parent = Beta('mu_no_parent', 1, 1, None, 0) +mu_motor = Beta('mu_motor', 1, 1, None, 0) +mu_active = Beta('mu_active', 1, 1, None, 0) + +# nest membership parameters +alpha_kid_CAR = Beta('alpha_kid_CAR', 0.5, 0, 1, 0) +alpha_KID_car = 1 - alpha_kid_CAR + +# Definition of utility functions +V_par_car = ( + asc_par_car + + b_log_income_k_par_car * log_income_k + + b_veh_per_driver_par_car * veh_per_driver + + b_non_work_mom_par_car * non_work_mom + + b_non_work_dad_par_car * non_work_dad + + b_age_par_car * age + + b_female_par_car * female + + b_has_lil_sib_par_car * has_lil_sib + + b_has_big_sib_par_car * has_big_sib + + b_log_distance_par_car * log_distance + + b_log_density_par_car * log_density + + b_y2017_par_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_income_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_car = ( + asc_kid_car + + b_log_income_k_kid_car * log_income_k + + b_veh_per_driver_kid_car * veh_per_driver + + b_non_work_mom_kid_car * non_work_mom + + b_non_work_dad_kid_car * non_work_dad + + b_age_kid_car * age + + b_female_kid_car * female + + b_has_lil_sib_kid_car * has_lil_sib + + b_has_big_sib_kid_car * has_big_sib + + b_log_distance_kid_car * log_distance + + b_log_density_kid_car * log_density + + b_y2017_kid_car * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_income_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {17: V_par_car, + 18: V_par_act, + 27: V_kid_car, + 28: V_kid_act} + +# associate availability conditions with alternatives: + +av = {17: av_par_car, + 18: av_par_act, + 27: av_kid_car, + 28: av_kid_act} + +# Definition of nests + +kid_nest = OneNestForCrossNestedLogit( + nest_param=mu_no_parent, + dict_of_alpha={27: alpha_KID_car, + 28: 1}, + name='kid' +) + +motor_nest = OneNestForCrossNestedLogit( + nest_param=mu_motor, + dict_of_alpha={17: 1, + 27: alpha_kid_CAR}, + name='motor' +) + +nests = NestsForCrossNestedLogit( + choice_set=[17, 18, 27, 28], + tuple_of_nests=(kid_nest, + motor_nest) +) + +# Define model1 +cross_nest = models.logcnl(V, av, nests, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, cross_nest) +the_biogeme.modelName = 'cross_nest' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/cross-nest-reduced/cross_nest.html b/models/IATBR plan/4 alternatives/cross-nest-reduced/cross_nest.html new file mode 100644 index 0000000..d3f1be1 --- /dev/null +++ b/models/IATBR plan/4 alternatives/cross-nest-reduced/cross_nest.html @@ -0,0 +1,849 @@ + + + + +biogeme 3.2.13 [2024-04-09]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-09 17:24:46.341950
+Report file: | cross_nest.html |
Database name: | est |
Number of estimated parameters: | 39 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -6806.705 |
Final log likelihood: | -4210.791 |
Likelihood ratio test for the init. model: | 5191.828 |
Rho-square for the init. model: | 0.381 |
Rho-square-bar for the init. model: | 0.376 |
Akaike Information Criterion: | 8499.582 |
Bayesian Information Criterion: | 8753.044 |
Final gradient norm: | 3.1671E-02 |
Nbr of threads: | 12 |
Relative gradient: | 4.010641260761988e-06 |
Cause of termination: | Relative gradient = 4e-06 <= 6.1e-06 |
Number of function evaluations: | 52 |
Number of gradient evaluations: | 35 |
Number of hessian evaluations: | 34 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 51 |
Proportion of Hessian calculation: | 34/34 = 100.0% |
Optimization time: | 0:03:06.659523 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
alpha_kid_CAR | 0.802 | 0.324 | 2.47 | 0.0134 |
asc_kid_act | -4.7 | 0.382 | -12.3 | 0 |
asc_kid_car | -1.09 | 2.55 | -0.429 | 0.668 |
asc_par_act | -5.51 | 0.896 | -6.14 | 8.06e-10 |
b_age_kid_act | 2.3 | 0.196 | 11.8 | 0 |
b_age_kid_car | 0.541 | 1.15 | 0.472 | 0.637 |
b_age_par_act | -2.54 | 0.37 | -6.85 | 7.43e-12 |
b_female_kid_act | -2.71 | 0.652 | -4.15 | 3.26e-05 |
b_female_kid_car | -0.66 | 1.67 | -0.394 | 0.693 |
b_female_par_act | -1.19 | 1.34 | -0.894 | 0.371 |
b_has_big_sib_kid_act | 36.4 | 8.17 | 4.45 | 8.52e-06 |
b_has_big_sib_kid_car | 15.5 | 30.3 | 0.512 | 0.609 |
b_has_big_sib_par_act | 5 | 14.2 | 0.351 | 0.726 |
b_has_lil_sib_kid_act | 2 | 1.04 | 1.93 | 0.0537 |
b_has_lil_sib_kid_car | 1.55 | 3.31 | 0.467 | 0.64 |
b_has_lil_sib_par_act | 2.89 | 1.46 | 1.97 | 0.0484 |
b_log_density_kid_act | 13 | 3.21 | 4.05 | 5.15e-05 |
b_log_density_kid_car | -0.225 | 2.29 | -0.0984 | 0.922 |
b_log_density_par_act | 38.9 | 7.64 | 5.09 | 3.58e-07 |
b_log_distance_kid_act | -1.54 | 0.0689 | -22.3 | 0 |
b_log_distance_kid_car | -0.122 | 0.315 | -0.388 | 0.698 |
b_log_distance_par_act | -1.69 | 0.113 | -15 | 0 |
b_log_income_k_kid_act | -0.408 | 0.437 | -0.933 | 0.351 |
b_log_income_k_kid_car | -0.121 | 0.417 | -0.289 | 0.772 |
b_log_income_k_par_act | 0.673 | 0.745 | 0.903 | 0.366 |
b_non_work_dad_kid_ace | -1.53 | 1.03 | -1.49 | 0.136 |
b_non_work_dad_kid_car | -0.4 | 0.642 | -0.623 | 0.534 |
b_non_work_dad_par_act | 1.85 | 1.93 | 0.957 | 0.339 |
b_non_work_mom_kid_act | -1.15 | 1.21 | -0.946 | 0.344 |
b_non_work_mom_kid_car | -1.76 | 3.71 | -0.475 | 0.634 |
b_non_work_mom_par_act | 4.13 | 1.48 | 2.79 | 0.00533 |
b_veh_per_driver_kid_act | -1.41 | 1.13 | -1.25 | 0.213 |
b_veh_per_driver_kid_car | 0.682 | 1.17 | 0.581 | 0.561 |
b_veh_per_driver_par_act | -11 | 2.31 | -4.75 | 1.99e-06 |
b_y2017_kid_act | -2.25 | 0.676 | -3.33 | 0.000853 |
b_y2017_kid_car | -0.494 | 1.17 | -0.422 | 0.673 |
b_y2017_par_act | 26.9 | 1.89 | 14.2 | 0 |
mu_motor | 3.5 | 7.49 | 0.467 | 0.64 |
mu_no_parent | 4.06 | 1.02 | 3.96 | 7.52e-05 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_kid_act | alpha_kid_CAR | -0.0112 | -0.179 | -12.8 | 0 | -0.0395 | -0.319 | -9.58 | 0 |
asc_kid_car | alpha_kid_CAR | 0.232 | 0.984 | -1.58 | 0.115 | 0.822 | 0.996 | -0.851 | 0.395 |
asc_kid_car | asc_kid_act | -0.0425 | -0.0851 | 2.49 | 0.0127 | -0.264 | -0.271 | 1.35 | 0.177 |
asc_par_act | alpha_kid_CAR | 0.00135 | 0.0097 | -7.64 | 2.2e-14 | 0.00351 | 0.0121 | -6.64 | 3.04e-11 |
asc_par_act | asc_kid_act | 0.044 | 0.149 | -0.962 | 0.336 | 0.0443 | 0.129 | -0.868 | 0.386 |
asc_par_act | asc_kid_car | 0.0267 | 0.024 | -2.8 | 0.00508 | 0.046 | 0.0201 | -1.65 | 0.0999 |
b_age_kid_act | alpha_kid_CAR | -0.00885 | -0.287 | 5.33 | 9.66e-08 | -0.031 | -0.489 | 3.31 | 0.000918 |
b_age_kid_act | asc_kid_act | -0.0349 | -0.536 | 14.5 | 0 | -0.0259 | -0.346 | 14.4 | 0 |
b_age_kid_act | asc_kid_car | -0.0879 | -0.359 | 2.35 | 0.0188 | -0.261 | -0.523 | 1.28 | 0.201 |
b_age_kid_act | asc_par_act | -0.0117 | -0.081 | 9.27 | 0 | -0.0136 | -0.0778 | 8.38 | 0 |
b_age_kid_car | alpha_kid_CAR | -0.106 | -0.988 | -0.328 | 0.743 | -0.371 | -0.996 | -0.177 | 0.859 |
b_age_kid_car | asc_kid_act | 0.0272 | 0.12 | 7.68 | 1.64e-14 | 0.127 | 0.289 | 4.77 | 1.89e-06 |
b_age_kid_car | asc_kid_car | -0.846 | -0.991 | 0.821 | 0.412 | -2.92 | -0.997 | 0.442 | 0.658 |
b_age_kid_car | asc_par_act | -0.00908 | -0.018 | 5.87 | 4.35e-09 | -0.0172 | -0.0167 | 4.12 | 3.79e-05 |
b_age_kid_car | b_age_kid_act | 0.0397 | 0.356 | -3.02 | 0.00253 | 0.117 | 0.522 | -1.66 | 0.0959 |
b_age_par_act | alpha_kid_CAR | -0.00917 | -0.138 | -7.54 | 4.77e-14 | -0.0318 | -0.265 | -6.04 | 1.57e-09 |
b_age_par_act | asc_kid_act | -0.011 | -0.0785 | 3.93 | 8.48e-05 | -0.0016 | -0.0113 | 4.04 | 5.33e-05 |
b_age_par_act | asc_kid_car | -0.0795 | -0.151 | -0.977 | 0.328 | -0.256 | -0.271 | -0.541 | 0.588 |
b_age_par_act | asc_par_act | -0.136 | -0.438 | 2.86 | 0.00422 | -0.138 | -0.417 | 2.69 | 0.00714 |
b_age_par_act | b_age_kid_act | 0.0134 | 0.194 | -12.4 | 0 | 0.0191 | 0.264 | -13.1 | 0 |
b_age_par_act | b_age_kid_car | 0.0362 | 0.151 | -4.52 | 6.18e-06 | 0.115 | 0.271 | -2.78 | 0.00539 |
b_female_kid_act | alpha_kid_CAR | -0.00226 | -0.0204 | -5.24 | 1.59e-07 | -0.0184 | -0.0869 | -4.66 | 3.13e-06 |
b_female_kid_act | asc_kid_act | 0.00743 | 0.0317 | 2.73 | 0.00634 | 0.0237 | 0.095 | 2.75 | 0.00595 |
b_female_kid_act | asc_kid_car | 0.00137 | 0.00156 | -1.07 | 0.285 | -0.123 | -0.0741 | -0.605 | 0.545 |
b_female_kid_act | asc_par_act | -0.000271 | -0.000521 | 2.7 | 0.00686 | 0.0078 | 0.0134 | 2.54 | 0.0111 |
b_female_kid_act | b_age_kid_act | -0.00794 | -0.069 | -7.37 | 1.66e-13 | -0.00526 | -0.0412 | -7.28 | 3.32e-13 |
b_female_kid_act | b_age_kid_car | 0.00164 | 0.00409 | -3.64 | 0.000277 | 0.0585 | 0.0782 | -2.55 | 0.0108 |
b_female_kid_act | b_age_par_act | -0.00276 | -0.0111 | -0.228 | 0.82 | -0.00263 | -0.0109 | -0.228 | 0.82 |
b_female_kid_car | alpha_kid_CAR | 0.146 | 0.919 | -1.91 | 0.0557 | 0.529 | 0.976 | -1.08 | 0.282 |
b_female_kid_car | asc_kid_act | -0.0422 | -0.126 | 3.92 | 8.87e-05 | -0.183 | -0.287 | 2.22 | 0.0264 |
b_female_kid_car | asc_kid_car | 1.15 | 0.912 | 0.661 | 0.509 | 4.16 | 0.975 | 0.437 | 0.662 |
b_female_kid_car | asc_par_act | 0.00954 | 0.0128 | 3.98 | 6.85e-05 | 0.0223 | 0.0149 | 2.57 | 0.0102 |
b_female_kid_car | b_age_kid_act | -0.0511 | -0.311 | -2.99 | 0.00275 | -0.166 | -0.505 | -1.66 | 0.0959 |
b_female_kid_car | b_age_kid_car | -0.524 | -0.915 | -0.796 | 0.426 | -1.87 | -0.975 | -0.429 | 0.668 |
b_female_kid_car | b_age_par_act | -0.0479 | -0.135 | 1.8 | 0.0721 | -0.164 | -0.265 | 1.04 | 0.299 |
b_female_kid_car | b_female_kid_act | 0.0651 | 0.11 | 1.93 | 0.0539 | -0.0132 | -0.0121 | 1.14 | 0.256 |
b_female_par_act | alpha_kid_CAR | 0.00747 | 0.0326 | -1.5 | 0.135 | 0.0238 | 0.0549 | -1.47 | 0.141 |
b_female_par_act | asc_kid_act | -0.00163 | -0.00337 | 2.54 | 0.0111 | 0.00462 | 0.00906 | 2.53 | 0.0115 |
b_female_par_act | asc_kid_car | 0.0648 | 0.0355 | -0.055 | 0.956 | 0.198 | 0.0582 | -0.0368 | 0.971 |
b_female_par_act | asc_par_act | -0.0649 | -0.0603 | 2.7 | 0.00699 | -0.0924 | -0.0772 | 2.59 | 0.00964 |
b_female_par_act | b_age_kid_act | -0.00406 | -0.0171 | -2.6 | 0.00927 | -0.0144 | -0.0549 | -2.57 | 0.0101 |
b_female_par_act | b_age_kid_car | -0.0287 | -0.0347 | -1.17 | 0.243 | -0.0878 | -0.0573 | -0.959 | 0.338 |
b_female_par_act | b_age_par_act | 0.00076 | 0.00148 | 0.97 | 0.332 | 0.03 | 0.0607 | 0.984 | 0.325 |
b_female_par_act | b_female_kid_act | 0.146 | 0.171 | 1.1 | 0.271 | 0.149 | 0.171 | 1.09 | 0.274 |
b_female_par_act | b_female_kid_car | 0.0696 | 0.0569 | -0.34 | 0.734 | 0.156 | 0.0696 | -0.259 | 0.796 |
b_has_big_sib_kid_act | alpha_kid_CAR | -0.471 | -0.377 | 4.85 | 1.21e-06 | -1.55 | -0.585 | 4.25 | 2.11e-05 |
b_has_big_sib_kid_act | asc_kid_act | -0.476 | -0.18 | 5.6 | 2.15e-08 | 0.0494 | 0.0158 | 5.03 | 5.02e-07 |
b_has_big_sib_kid_act | asc_kid_car | -3.89 | -0.391 | 4.74 | 2.11e-06 | -12.2 | -0.588 | 3.79 | 0.000151 |
b_has_big_sib_kid_act | asc_par_act | -0.224 | -0.0382 | 5.71 | 1.14e-08 | -0.209 | -0.0286 | 5.08 | 3.79e-07 |
b_has_big_sib_kid_act | b_age_kid_act | 0.402 | 0.31 | 4.73 | 2.28e-06 | 0.647 | 0.405 | 4.21 | 2.56e-05 |
b_has_big_sib_kid_act | b_age_kid_car | 1.75 | 0.388 | 5.09 | 3.62e-07 | 5.49 | 0.586 | 4.74 | 2.11e-06 |
b_has_big_sib_kid_act | b_age_par_act | 0.23 | 0.0822 | 5.38 | 7.66e-08 | 0.544 | 0.18 | 4.8 | 1.61e-06 |
b_has_big_sib_kid_act | b_female_kid_act | -0.19 | -0.0407 | 5.34 | 9.16e-08 | 0.121 | 0.0227 | 4.78 | 1.78e-06 |
b_has_big_sib_kid_act | b_female_kid_car | -2.41 | -0.362 | 4.85 | 1.26e-06 | -7.88 | -0.576 | 4.01 | 6.1e-05 |
b_has_big_sib_kid_act | b_female_par_act | -0.179 | -0.0185 | 5.07 | 3.92e-07 | -0.444 | -0.0407 | 4.51 | 6.53e-06 |
b_has_big_sib_kid_car | alpha_kid_CAR | -2.79 | -0.969 | 0.871 | 0.384 | -9.74 | -0.991 | 0.48 | 0.631 |
b_has_big_sib_kid_car | asc_kid_act | 0.692 | 0.114 | 1.21 | 0.226 | 3.35 | 0.29 | 0.669 | 0.503 |
b_has_big_sib_kid_car | asc_kid_car | -22.3 | -0.973 | 0.92 | 0.358 | -76.6 | -0.992 | 0.506 | 0.613 |
b_has_big_sib_kid_car | asc_par_act | -0.24 | -0.0178 | 1.25 | 0.21 | -0.429 | -0.0158 | 0.693 | 0.488 |
b_has_big_sib_kid_car | b_age_kid_act | 1.02 | 0.341 | 0.793 | 0.428 | 3.01 | 0.508 | 0.437 | 0.662 |
b_has_big_sib_kid_car | b_age_kid_car | 10.1 | 0.971 | 0.929 | 0.353 | 34.5 | 0.992 | 0.513 | 0.608 |
b_has_big_sib_kid_car | b_age_par_act | 0.936 | 0.145 | 1.08 | 0.279 | 2.99 | 0.266 | 0.598 | 0.55 |
b_has_big_sib_kid_car | b_female_kid_act | -0.0605 | -0.00562 | 1.09 | 0.276 | 1.47 | 0.0744 | 0.602 | 0.547 |
b_has_big_sib_kid_car | b_female_kid_car | -13.9 | -0.904 | 0.921 | 0.357 | -49.2 | -0.971 | 0.506 | 0.613 |
b_has_big_sib_kid_car | b_female_par_act | -0.798 | -0.0359 | 0.993 | 0.321 | -2.34 | -0.0578 | 0.549 | 0.583 |
b_has_big_sib_kid_car | b_has_big_sib_kid_act | 52.8 | 0.435 | -1.38 | 0.166 | 150 | 0.608 | -0.797 | 0.425 |
b_has_big_sib_par_act | alpha_kid_CAR | -0.329 | -0.136 | 0.299 | 0.765 | -1.14 | -0.247 | 0.293 | 0.769 |
b_has_big_sib_par_act | asc_kid_act | -0.129 | -0.0252 | 0.691 | 0.489 | 0.229 | 0.0421 | 0.682 | 0.495 |
b_has_big_sib_par_act | asc_kid_car | -2.67 | -0.139 | 0.427 | 0.67 | -8.96 | -0.247 | 0.404 | 0.686 |
b_has_big_sib_par_act | asc_par_act | -2.18 | -0.192 | 0.74 | 0.459 | -1.67 | -0.131 | 0.73 | 0.465 |
b_has_big_sib_par_act | b_age_kid_act | 0.182 | 0.0724 | 0.192 | 0.847 | 0.411 | 0.148 | 0.19 | 0.85 |
b_has_big_sib_par_act | b_age_kid_car | 1.2 | 0.138 | 0.32 | 0.749 | 4.03 | 0.246 | 0.318 | 0.75 |
b_has_big_sib_par_act | b_age_par_act | 0.68 | 0.126 | 0.539 | 0.59 | 0.774 | 0.147 | 0.531 | 0.595 |
b_has_big_sib_par_act | b_female_kid_act | -0.0691 | -0.00765 | 0.549 | 0.583 | 0.124 | 0.0133 | 0.541 | 0.588 |
b_has_big_sib_par_act | b_female_kid_car | -1.66 | -0.129 | 0.399 | 0.69 | -5.78 | -0.242 | 0.384 | 0.701 |
b_has_big_sib_par_act | b_female_par_act | -0.524 | -0.0281 | 0.439 | 0.661 | -1.36 | -0.0713 | 0.43 | 0.667 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 21.6 | 0.212 | -2.18 | 0.029 | 33.1 | 0.284 | -2.2 | 0.0279 |
b_has_big_sib_par_act | b_has_big_sib_kid_car | 34.9 | 0.149 | -0.521 | 0.602 | 109 | 0.252 | -0.35 | 0.727 |
b_has_lil_sib_kid_act | alpha_kid_CAR | -0.0694 | -0.512 | 1.35 | 0.176 | -0.253 | -0.751 | 0.924 | 0.355 |
b_has_lil_sib_kid_act | asc_kid_act | -0.0361 | -0.126 | 7.39 | 1.51e-13 | 0.0295 | 0.0744 | 6.21 | 5.28e-10 |
b_has_lil_sib_kid_act | asc_kid_car | -0.57 | -0.529 | 1.62 | 0.105 | -2.01 | -0.76 | 0.909 | 0.363 |
b_has_lil_sib_kid_act | asc_par_act | -0.0258 | -0.0405 | 6.52 | 6.92e-11 | -0.0279 | -0.03 | 5.4 | 6.85e-08 |
b_has_lil_sib_kid_act | b_age_kid_act | 0.0328 | 0.233 | -0.394 | 0.693 | 0.0842 | 0.414 | -0.31 | 0.757 |
b_has_lil_sib_kid_act | b_age_kid_car | 0.254 | 0.519 | 2.07 | 0.0385 | 0.9 | 0.755 | 1.89 | 0.0583 |
b_has_lil_sib_kid_act | b_age_par_act | 0.0269 | 0.0887 | 5.38 | 7.63e-08 | 0.0772 | 0.201 | 4.41 | 1.04e-05 |
b_has_lil_sib_kid_act | b_female_kid_act | -0.0212 | -0.0419 | 4.54 | 5.54e-06 | -0.0104 | -0.0154 | 3.82 | 0.000135 |
b_has_lil_sib_kid_act | b_female_kid_car | -0.351 | -0.486 | 1.81 | 0.0705 | -1.29 | -0.741 | 1.05 | 0.295 |
b_has_lil_sib_kid_act | b_female_par_act | -0.0257 | -0.0246 | 2.05 | 0.0406 | -0.0829 | -0.0598 | 1.84 | 0.0662 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 2.45 | 0.429 | -4.94 | 7.87e-07 | 4.99 | 0.589 | -4.52 | 6.21e-06 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_car | 6.94 | 0.527 | -0.828 | 0.408 | 23.9 | 0.759 | -0.458 | 0.647 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 1.33 | 0.12 | -0.215 | 0.83 | 3.3 | 0.223 | -0.213 | 0.831 |
b_has_lil_sib_kid_car | alpha_kid_CAR | -0.294 | -0.967 | 0.386 | 0.7 | -1.06 | -0.991 | 0.205 | 0.837 |
b_has_lil_sib_kid_car | asc_kid_act | 0.0656 | 0.102 | 3.54 | 0.000404 | 0.354 | 0.28 | 1.94 | 0.0527 |
b_has_lil_sib_kid_car | asc_kid_car | -2.36 | -0.974 | 0.847 | 0.397 | -8.37 | -0.993 | 0.451 | 0.652 |
b_has_lil_sib_kid_car | asc_par_act | -0.0276 | -0.0193 | 3.6 | 0.000312 | -0.051 | -0.0172 | 2.05 | 0.0406 |
b_has_lil_sib_kid_car | b_age_kid_act | 0.109 | 0.346 | -0.442 | 0.658 | 0.334 | 0.516 | -0.235 | 0.814 |
b_has_lil_sib_kid_car | b_age_kid_car | 1.06 | 0.967 | 0.857 | 0.391 | 3.76 | 0.99 | 0.461 | 0.645 |
b_has_lil_sib_kid_car | b_age_par_act | 0.0994 | 0.146 | 2.33 | 0.0197 | 0.329 | 0.268 | 1.26 | 0.206 |
b_has_lil_sib_kid_car | b_female_kid_act | -0.00902 | -0.00793 | 2.26 | 0.0239 | 0.152 | 0.0702 | 1.28 | 0.201 |
b_has_lil_sib_kid_car | b_female_kid_car | -1.47 | -0.904 | 0.84 | 0.401 | -5.38 | -0.972 | 0.446 | 0.656 |
b_has_lil_sib_kid_car | b_female_par_act | -0.085 | -0.0362 | 1.22 | 0.223 | -0.258 | -0.0584 | 0.753 | 0.451 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_act | 5.05 | 0.394 | -5.15 | 2.61e-07 | 16 | 0.59 | -5.15 | 2.65e-07 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_car | 28.5 | 0.965 | -0.93 | 0.353 | 99.3 | 0.99 | -0.517 | 0.605 |
b_has_lil_sib_kid_car | b_has_big_sib_par_act | 3.45 | 0.139 | -0.249 | 0.804 | 11.7 | 0.248 | -0.25 | 0.802 |
b_has_lil_sib_kid_car | b_has_lil_sib_kid_act | 0.791 | 0.57 | -0.31 | 0.756 | 2.67 | 0.777 | -0.176 | 0.86 |
b_has_lil_sib_par_act | alpha_kid_CAR | -0.0404 | -0.166 | 1.44 | 0.151 | -0.147 | -0.309 | 1.31 | 0.191 |
b_has_lil_sib_par_act | asc_kid_act | -0.01 | -0.0195 | 5.18 | 2.24e-07 | 0.0308 | 0.0552 | 5.09 | 3.6e-07 |
b_has_lil_sib_par_act | asc_kid_car | -0.329 | -0.17 | 1.87 | 0.0617 | -1.16 | -0.312 | 1.2 | 0.229 |
b_has_lil_sib_par_act | asc_par_act | -0.173 | -0.151 | 4.85 | 1.24e-06 | -0.201 | -0.153 | 4.59 | 4.43e-06 |
b_has_lil_sib_par_act | b_age_kid_act | 0.017 | 0.0674 | 0.412 | 0.68 | 0.0448 | 0.157 | 0.403 | 0.687 |
b_has_lil_sib_par_act | b_age_kid_car | 0.147 | 0.167 | 1.62 | 0.105 | 0.52 | 0.31 | 1.51 | 0.131 |
b_has_lil_sib_par_act | b_age_par_act | 0.0215 | 0.0396 | 3.74 | 0.000181 | 0.101 | 0.187 | 3.77 | 0.000165 |
b_has_lil_sib_par_act | b_female_kid_act | -0.00689 | -0.00758 | 3.6 | 0.000324 | 0.0018 | 0.00188 | 3.5 | 0.00047 |
b_has_lil_sib_par_act | b_female_kid_car | -0.203 | -0.156 | 1.97 | 0.049 | -0.744 | -0.304 | 1.4 | 0.162 |
b_has_lil_sib_par_act | b_female_par_act | -0.0451 | -0.024 | 2.08 | 0.0376 | -0.0968 | -0.0496 | 2.01 | 0.0443 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 1.18 | 0.115 | -4.63 | 3.69e-06 | 2.68 | 0.225 | -4.2 | 2.66e-05 |
b_has_lil_sib_par_act | b_has_big_sib_kid_car | 3.99 | 0.169 | -0.763 | 0.445 | 13.8 | 0.312 | -0.423 | 0.673 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 5.49 | 0.277 | -0.154 | 0.877 | 6.36 | 0.305 | -0.152 | 0.879 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 0.26 | 0.234 | 0.611 | 0.541 | 0.524 | 0.345 | 0.6 | 0.548 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_car | 0.447 | 0.179 | 0.652 | 0.514 | 1.53 | 0.317 | 0.423 | 0.673 |
b_log_density_kid_act | alpha_kid_CAR | 0.172 | 0.376 | 4.69 | 2.71e-06 | 0.581 | 0.558 | 4.01 | 6.07e-05 |
b_log_density_kid_act | asc_kid_act | -0.608 | -0.628 | 6.1 | 1.07e-09 | -0.828 | -0.675 | 5.09 | 3.67e-07 |
b_log_density_kid_act | asc_kid_car | 1.18 | 0.322 | 5.48 | 4.18e-08 | 4.35 | 0.531 | 4.95 | 7.41e-07 |
b_log_density_kid_act | asc_par_act | -0.197 | -0.0916 | 6.49 | 8.45e-11 | -0.246 | -0.0856 | 5.43 | 5.59e-08 |
b_log_density_kid_act | b_age_kid_act | -0.00548 | -0.0115 | 4.01 | 6.09e-05 | -0.125 | -0.199 | 3.29 | 0.00102 |
b_log_density_kid_act | b_age_kid_car | -0.585 | -0.353 | 4.24 | 2.23e-05 | -2.01 | -0.545 | 3.15 | 0.00163 |
b_log_density_kid_act | b_age_par_act | -0.0253 | -0.0247 | 5.76 | 8.36e-09 | -0.138 | -0.116 | 4.74 | 2.09e-06 |
b_log_density_kid_act | b_female_kid_act | -0.187 | -0.109 | 5.6 | 2.12e-08 | -0.373 | -0.178 | 4.64 | 3.55e-06 |
b_log_density_kid_act | b_female_kid_car | 0.795 | 0.325 | 5.43 | 5.67e-08 | 2.87 | 0.534 | 5.03 | 4.87e-07 |
b_log_density_kid_act | b_female_par_act | -0.0253 | -0.00716 | 4.76 | 1.94e-06 | 0.0315 | 0.00734 | 4.09 | 4.27e-05 |
b_log_density_kid_act | b_has_big_sib_kid_act | -2.2 | -0.114 | -2.92 | 0.00355 | -8.76 | -0.334 | -2.4 | 0.0163 |
b_log_density_kid_act | b_has_big_sib_kid_car | -15.2 | -0.342 | -0.141 | 0.888 | -52.6 | -0.54 | -0.078 | 0.938 |
b_log_density_kid_act | b_has_big_sib_par_act | -1.51 | -0.0405 | 0.557 | 0.578 | -6.57 | -0.144 | 0.532 | 0.595 |
b_log_density_kid_act | b_has_lil_sib_kid_act | -0.284 | -0.136 | 3.83 | 0.00013 | -1.17 | -0.351 | 2.97 | 0.00299 |
b_log_density_kid_act | b_has_lil_sib_kid_car | -1.58 | -0.337 | 3.13 | 0.00172 | -5.74 | -0.54 | 2 | 0.0454 |
b_log_density_kid_act | b_has_lil_sib_par_act | -0.177 | -0.047 | 3.3 | 0.000983 | -0.711 | -0.151 | 2.72 | 0.00661 |
b_log_density_kid_car | alpha_kid_CAR | -0.153 | -0.562 | -0.609 | 0.542 | -0.625 | -0.844 | -0.4 | 0.689 |
b_log_density_kid_car | asc_kid_act | -0.00161 | -0.00279 | 2.75 | 0.00589 | 0.16 | 0.183 | 1.99 | 0.0464 |
b_log_density_kid_car | asc_kid_car | -1.31 | -0.605 | 0.327 | 0.743 | -5 | -0.858 | 0.186 | 0.852 |
b_log_density_kid_car | asc_par_act | -0.0394 | -0.0308 | 2.93 | 0.00335 | -0.0651 | -0.0318 | 2.13 | 0.0333 |
b_log_density_kid_car | b_age_kid_act | 0.0323 | 0.114 | -1.61 | 0.108 | 0.182 | 0.406 | -1.14 | 0.253 |
b_log_density_kid_car | b_age_kid_car | 0.544 | 0.551 | -0.57 | 0.569 | 2.21 | 0.841 | -0.525 | 0.599 |
b_log_density_kid_car | b_age_par_act | 0.0437 | 0.0718 | 1.44 | 0.149 | 0.194 | 0.229 | 1.04 | 0.3 |
b_log_density_kid_car | b_female_kid_act | 0.027 | 0.0265 | 1.47 | 0.142 | 0.108 | 0.0723 | 1.07 | 0.286 |
b_log_density_kid_car | b_female_kid_car | -0.751 | -0.516 | 0.198 | 0.843 | -3.16 | -0.826 | 0.115 | 0.908 |
b_log_density_kid_car | b_female_par_act | -0.0349 | -0.0166 | 0.465 | 0.642 | -0.129 | -0.0421 | 0.36 | 0.719 |
b_log_density_kid_car | b_has_big_sib_kid_act | 2.13 | 0.186 | -5.13 | 2.94e-07 | 9.24 | 0.495 | -5 | 5.6e-07 |
b_log_density_kid_car | b_has_big_sib_kid_car | 14 | 0.531 | -0.987 | 0.323 | 57.5 | 0.83 | -0.553 | 0.58 |
b_log_density_kid_car | b_has_big_sib_par_act | 1.6 | 0.0723 | -0.373 | 0.709 | 6.76 | 0.208 | -0.375 | 0.708 |
b_log_density_kid_car | b_has_lil_sib_kid_act | 0.332 | 0.267 | -1.42 | 0.156 | 1.47 | 0.62 | -1.22 | 0.224 |
b_log_density_kid_car | b_has_lil_sib_kid_car | 1.48 | 0.528 | -1.08 | 0.278 | 6.3 | 0.833 | -0.936 | 0.349 |
b_log_density_kid_car | b_has_lil_sib_par_act | 0.199 | 0.0891 | -1.54 | 0.124 | 0.856 | 0.256 | -1.31 | 0.19 |
b_log_density_kid_car | b_log_density_kid_act | -0.0259 | -0.00615 | -4.26 | 2.03e-05 | -2.62 | -0.357 | -2.9 | 0.00371 |
b_log_density_par_act | alpha_kid_CAR | 0.0527 | 0.0472 | 5.88 | 3.99e-09 | 0.189 | 0.0765 | 5 | 5.83e-07 |
b_log_density_par_act | asc_kid_act | -0.204 | -0.0865 | 6.69 | 2.3e-11 | -0.342 | -0.117 | 5.67 | 1.47e-08 |
b_log_density_par_act | asc_kid_car | 0.355 | 0.04 | 6.09 | 1.15e-09 | 1.37 | 0.0703 | 5.07 | 3.92e-07 |
b_log_density_par_act | asc_par_act | -3.75 | -0.716 | 6.27 | 3.6e-10 | -5.09 | -0.743 | 5.33 | 9.77e-08 |
b_log_density_par_act | b_age_kid_act | -0.0123 | -0.0106 | 5.64 | 1.67e-08 | -0.0193 | -0.0129 | 4.79 | 1.71e-06 |
b_log_density_par_act | b_age_kid_car | -0.182 | -0.0451 | 5.87 | 4.44e-09 | -0.643 | -0.0734 | 4.91 | 9.07e-07 |
b_log_density_par_act | b_age_par_act | -0.0989 | -0.0397 | 6.37 | 1.91e-10 | 0.00557 | 0.00197 | 5.42 | 6.08e-08 |
b_log_density_par_act | b_female_kid_act | -0.0523 | -0.0125 | 6.38 | 1.75e-10 | -0.0979 | -0.0197 | 5.42 | 6.1e-08 |
b_log_density_par_act | b_female_kid_car | 0.248 | 0.0416 | 6.08 | 1.21e-09 | 0.941 | 0.0736 | 5.14 | 2.8e-07 |
b_log_density_par_act | b_female_par_act | -0.141 | -0.0163 | 6.04 | 1.53e-09 | -0.456 | -0.0447 | 5.13 | 2.91e-07 |
b_log_density_par_act | b_has_big_sib_kid_act | -0.752 | -0.016 | 0.259 | 0.796 | -3.37 | -0.054 | 0.221 | 0.825 |
b_log_density_par_act | b_has_big_sib_kid_car | -4.73 | -0.0437 | 1.29 | 0.199 | -16.9 | -0.0729 | 0.736 | 0.462 |
b_log_density_par_act | b_has_big_sib_par_act | 0.875 | 0.00963 | 2.2 | 0.0277 | -0.814 | -0.00748 | 2.09 | 0.0366 |
b_log_density_par_act | b_has_lil_sib_kid_act | -0.0823 | -0.0162 | 5.64 | 1.69e-08 | -0.359 | -0.0453 | 4.76 | 1.98e-06 |
b_log_density_par_act | b_has_lil_sib_kid_car | -0.494 | -0.0432 | 5.5 | 3.77e-08 | -1.84 | -0.0726 | 4.37 | 1.24e-05 |
b_log_density_par_act | b_has_lil_sib_par_act | 0.134 | 0.0146 | 5.45 | 5.13e-08 | -0.612 | -0.0548 | 4.58 | 4.6e-06 |
b_log_density_par_act | b_log_density_kid_act | 2.57 | 0.149 | 3.91 | 9.37e-05 | 3.97 | 0.162 | 3.32 | 0.000896 |
b_log_density_par_act | b_log_density_kid_car | 0.15 | 0.0146 | 5.88 | 3.98e-09 | -0.708 | -0.0406 | 4.85 | 1.23e-06 |
b_log_distance_kid_act | alpha_kid_CAR | -0.00195 | -0.17 | -12 | 0 | -0.00507 | -0.227 | -6.76 | 1.37e-11 |
b_log_distance_kid_act | asc_kid_act | 0.00925 | 0.38 | 9.18 | 0 | 0.0103 | 0.393 | 8.76 | 0 |
b_log_distance_kid_act | asc_kid_car | -0.00829 | -0.0906 | -0.325 | 0.745 | -0.0332 | -0.189 | -0.175 | 0.861 |
b_log_distance_kid_act | asc_par_act | 0.00304 | 0.0562 | 4.91 | 9.26e-07 | 0.0032 | 0.0518 | 4.43 | 9.43e-06 |
b_log_distance_kid_act | b_age_kid_act | -0.00335 | -0.281 | -18.5 | 0 | -0.00241 | -0.178 | -17.6 | 0 |
b_log_distance_kid_act | b_age_kid_car | 0.00467 | 0.112 | -3.36 | 0.000773 | 0.0155 | 0.196 | -1.83 | 0.067 |
b_log_distance_kid_act | b_age_par_act | -0.00146 | -0.0569 | 2.53 | 0.0114 | -0.000267 | -0.0105 | 2.64 | 0.00823 |
b_log_distance_kid_act | b_female_kid_act | 0.00489 | 0.114 | 1.83 | 0.0675 | 0.00662 | 0.147 | 1.81 | 0.0701 |
b_log_distance_kid_act | b_female_kid_car | -0.00575 | -0.0936 | -0.948 | 0.343 | -0.0212 | -0.184 | -0.521 | 0.602 |
b_log_distance_kid_act | b_female_par_act | 0.00169 | 0.019 | -0.259 | 0.795 | 0.00462 | 0.0501 | -0.258 | 0.796 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -0.00378 | -0.0078 | -5.22 | 1.78e-07 | 0.0562 | 0.0998 | -4.64 | 3.42e-06 |
b_log_distance_kid_act | b_has_big_sib_kid_car | 0.113 | 0.101 | -1.02 | 0.308 | 0.414 | 0.198 | -0.563 | 0.573 |
b_log_distance_kid_act | b_has_big_sib_par_act | -0.00388 | -0.00415 | -0.466 | 0.641 | 0.0438 | 0.0446 | -0.459 | 0.646 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -0.000328 | -0.00625 | -4.48 | 7.3e-06 | 0.00601 | 0.084 | -3.42 | 0.000618 |
b_log_distance_kid_act | b_has_lil_sib_kid_car | 0.00989 | 0.0839 | -1.75 | 0.0796 | 0.0427 | 0.187 | -0.936 | 0.349 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -0.000234 | -0.00249 | -3.13 | 0.00174 | 0.00265 | 0.0263 | -3.03 | 0.00247 |
b_log_distance_kid_act | b_log_density_kid_act | -0.0232 | -0.131 | -5.45 | 5.13e-08 | -0.0421 | -0.19 | -4.51 | 6.53e-06 |
b_log_distance_kid_act | b_log_density_kid_car | 0.0143 | 0.135 | -0.835 | 0.404 | 0.0336 | 0.213 | -0.579 | 0.563 |
b_log_distance_kid_act | b_log_density_par_act | -0.00372 | -0.0086 | -6.24 | 4.38e-10 | -0.029 | -0.055 | -5.29 | 1.23e-07 |
b_log_distance_kid_car | alpha_kid_CAR | 0.0287 | 0.98 | -26.7 | 0 | 0.102 | 0.994 | -25.8 | 0 |
b_log_distance_kid_car | asc_kid_act | -0.0088 | -0.142 | 10.8 | 0 | -0.0353 | -0.293 | 8.15 | 4.44e-16 |
b_log_distance_kid_car | asc_kid_car | 0.226 | 0.972 | 0.804 | 0.422 | 0.797 | 0.993 | 0.434 | 0.664 |
b_log_distance_kid_car | asc_par_act | 0.00205 | 0.0149 | 6.53 | 6.54e-11 | 0.00468 | 0.0166 | 5.7 | 1.22e-08 |
b_log_distance_kid_car | b_age_kid_act | -0.00941 | -0.31 | -8.6 | 0 | -0.0313 | -0.508 | -5.42 | 5.9e-08 |
b_log_distance_kid_car | b_age_kid_car | -0.103 | -0.974 | -0.841 | 0.401 | -0.359 | -0.992 | -0.454 | 0.65 |
b_log_distance_kid_car | b_age_par_act | -0.00926 | -0.142 | 5.46 | 4.72e-08 | -0.0315 | -0.27 | 4.41 | 1.02e-05 |
b_log_distance_kid_car | b_female_kid_act | -0.000774 | -0.00708 | 3.88 | 0.000105 | -0.0151 | -0.0734 | 3.47 | 0.000514 |
b_log_distance_kid_car | b_female_kid_car | 0.141 | 0.903 | 0.699 | 0.485 | 0.512 | 0.971 | 0.393 | 0.694 |
b_log_distance_kid_car | b_female_par_act | 0.00773 | 0.0342 | 0.804 | 0.422 | 0.0248 | 0.059 | 0.792 | 0.428 |
b_log_distance_kid_car | b_has_big_sib_kid_act | -0.46 | -0.373 | -4.98 | 6.3e-07 | -1.5 | -0.584 | -4.37 | 1.27e-05 |
b_log_distance_kid_car | b_has_big_sib_kid_car | -2.7 | -0.953 | -0.926 | 0.354 | -9.43 | -0.988 | -0.511 | 0.61 |
b_log_distance_kid_car | b_has_big_sib_par_act | -0.321 | -0.135 | -0.365 | 0.715 | -1.11 | -0.247 | -0.358 | 0.721 |
b_log_distance_kid_car | b_has_lil_sib_kid_act | -0.0681 | -0.51 | -2.4 | 0.0164 | -0.247 | -0.755 | -1.64 | 0.1 |
b_log_distance_kid_car | b_has_lil_sib_kid_car | -0.285 | -0.951 | -0.866 | 0.387 | -1.03 | -0.988 | -0.461 | 0.645 |
b_log_distance_kid_car | b_has_lil_sib_par_act | -0.0395 | -0.165 | -2.08 | 0.038 | -0.143 | -0.311 | -1.89 | 0.0583 |
b_log_distance_kid_car | b_log_density_kid_act | 0.157 | 0.348 | -5.04 | 4.76e-07 | 0.548 | 0.541 | -4.3 | 1.71e-05 |
b_log_distance_kid_car | b_log_density_kid_car | -0.147 | -0.549 | 0.0611 | 0.951 | -0.601 | -0.835 | 0.0403 | 0.968 |
b_log_distance_kid_car | b_log_density_par_act | 0.0483 | 0.0439 | -6.03 | 1.67e-09 | 0.176 | 0.0731 | -5.12 | 3.1e-07 |
b_log_distance_kid_car | b_log_distance_kid_act | -0.00133 | -0.118 | 7.48 | 7.68e-14 | -0.00401 | -0.185 | 4.24 | 2.28e-05 |
b_log_distance_par_act | alpha_kid_CAR | 0.000446 | 0.0237 | -12.4 | 0 | 0.00285 | 0.0778 | -7.44 | 9.88e-14 |
b_log_distance_par_act | asc_kid_act | 0.00303 | 0.0762 | 8.09 | 6.66e-16 | 0.00167 | 0.0387 | 7.63 | 2.26e-14 |
b_log_distance_par_act | asc_kid_car | 0.00641 | 0.0428 | -0.437 | 0.662 | 0.0249 | 0.0865 | -0.236 | 0.814 |
b_log_distance_par_act | asc_par_act | 0.0199 | 0.226 | 4.82 | 1.44e-06 | 0.0306 | 0.302 | 4.39 | 1.12e-05 |
b_log_distance_par_act | b_age_kid_act | -0.00118 | -0.0604 | -18.6 | 0 | -0.00191 | -0.0863 | -17.1 | 0 |
b_log_distance_par_act | b_age_kid_car | -0.0025 | -0.0368 | -3.51 | 0.000454 | -0.0111 | -0.0855 | -1.92 | 0.0549 |
b_log_distance_par_act | b_age_par_act | -0.00207 | -0.0491 | 2.09 | 0.0366 | -0.0077 | -0.184 | 2.08 | 0.0372 |
b_log_distance_par_act | b_female_kid_act | 0.00183 | 0.026 | 1.57 | 0.117 | 0.00409 | 0.0555 | 1.55 | 0.12 |
b_log_distance_par_act | b_female_kid_car | 0.00372 | 0.037 | -1.12 | 0.264 | 0.0165 | 0.0875 | -0.618 | 0.537 |
b_log_distance_par_act | b_female_par_act | 0.00489 | 0.0337 | -0.372 | 0.71 | 0.00179 | 0.0119 | -0.37 | 0.712 |
b_log_distance_par_act | b_has_big_sib_kid_act | -0.0165 | -0.0208 | -5.24 | 1.6e-07 | -0.0432 | -0.0469 | -4.66 | 3.24e-06 |
b_log_distance_par_act | b_has_big_sib_kid_car | -0.071 | -0.0389 | -1.03 | 0.304 | -0.288 | -0.0842 | -0.567 | 0.57 |
b_log_distance_par_act | b_has_big_sib_par_act | -0.0326 | -0.0213 | -0.477 | 0.633 | 0.00215 | 0.00134 | -0.47 | 0.639 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -0.00354 | -0.0412 | -4.62 | 3.76e-06 | -0.0102 | -0.0872 | -3.5 | 0.000459 |
b_log_distance_par_act | b_has_lil_sib_kid_car | -0.00833 | -0.0432 | -1.83 | 0.068 | -0.0322 | -0.0862 | -0.974 | 0.33 |
b_log_distance_par_act | b_has_lil_sib_par_act | -0.00669 | -0.0434 | -3.22 | 0.00128 | -0.0148 | -0.09 | -3.1 | 0.00194 |
b_log_distance_par_act | b_log_density_kid_act | -0.00656 | -0.0226 | -5.51 | 3.53e-08 | -0.00191 | -0.00526 | -4.57 | 4.85e-06 |
b_log_distance_par_act | b_log_density_kid_car | -0.000981 | -0.00567 | -0.923 | 0.356 | -0.0163 | -0.0634 | -0.638 | 0.523 |
b_log_distance_par_act | b_log_density_par_act | -0.0226 | -0.0319 | -6.26 | 3.86e-10 | -0.037 | -0.043 | -5.31 | 1.11e-07 |
b_log_distance_par_act | b_log_distance_kid_act | 0.00235 | 0.322 | -1.39 | 0.164 | 0.00232 | 0.298 | -1.33 | 0.185 |
b_log_distance_par_act | b_log_distance_kid_car | 0.000752 | 0.0405 | -7.91 | 2.44e-15 | 0.00331 | 0.0932 | -4.83 | 1.36e-06 |
b_log_income_k_kid_act | alpha_kid_CAR | 0.0166 | 0.247 | -3.13 | 0.00176 | 0.069 | 0.487 | -3.04 | 0.00236 |
b_log_income_k_kid_act | asc_kid_act | -0.0694 | -0.487 | 6.59 | 4.5e-11 | -0.0879 | -0.526 | 5.99 | 2.09e-09 |
b_log_income_k_kid_act | asc_kid_car | 0.12 | 0.224 | 0.511 | 0.61 | 0.529 | 0.475 | 0.288 | 0.773 |
b_log_income_k_kid_act | asc_par_act | -0.0228 | -0.0721 | 5.52 | 3.45e-08 | -0.0125 | -0.0319 | 5.05 | 4.45e-07 |
b_log_income_k_kid_act | b_age_kid_act | -0.00191 | -0.0273 | -6.24 | 4.41e-10 | -0.017 | -0.198 | -5.28 | 1.27e-07 |
b_log_income_k_kid_act | b_age_kid_car | -0.0596 | -0.244 | -1.17 | 0.243 | -0.244 | -0.487 | -0.672 | 0.502 |
b_log_income_k_kid_act | b_age_par_act | -0.00489 | -0.0325 | 3.82 | 0.000135 | -0.0212 | -0.131 | 3.5 | 0.000473 |
b_log_income_k_kid_act | b_female_kid_act | -0.000622 | -0.00247 | 3.05 | 0.00228 | -0.00723 | -0.0253 | 2.9 | 0.00377 |
b_log_income_k_kid_act | b_female_kid_car | 0.0819 | 0.228 | 0.276 | 0.783 | 0.346 | 0.472 | 0.166 | 0.868 |
b_log_income_k_kid_act | b_female_par_act | 0.00431 | 0.00828 | 0.569 | 0.569 | 0.013 | 0.0222 | 0.563 | 0.573 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | -0.223 | -0.0787 | -5.04 | 4.73e-07 | -0.892 | -0.25 | -4.44 | 9.15e-06 |
b_log_income_k_kid_act | b_has_big_sib_kid_car | -1.59 | -0.243 | -0.946 | 0.344 | -6.45 | -0.487 | -0.522 | 0.602 |
b_log_income_k_kid_act | b_has_big_sib_par_act | -0.151 | -0.0275 | -0.385 | 0.7 | -0.705 | -0.113 | -0.378 | 0.705 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | -0.0274 | -0.089 | -2.65 | 0.00802 | -0.158 | -0.347 | -1.92 | 0.0555 |
b_log_income_k_kid_act | b_has_lil_sib_kid_car | -0.163 | -0.236 | -1.03 | 0.303 | -0.692 | -0.478 | -0.552 | 0.581 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | -0.0178 | -0.0322 | -2.23 | 0.0258 | -0.0941 | -0.147 | -2.08 | 0.0379 |
b_log_income_k_kid_act | b_log_density_kid_act | 0.081 | 0.0778 | -5.04 | 4.56e-07 | 0.335 | 0.238 | -4.28 | 1.9e-05 |
b_log_income_k_kid_act | b_log_density_kid_car | -0.0731 | -0.118 | -0.109 | 0.913 | -0.384 | -0.384 | -0.0737 | 0.941 |
b_log_income_k_kid_act | b_log_density_par_act | 0.0288 | 0.0113 | -6.06 | 1.37e-09 | 0.103 | 0.0308 | -5.14 | 2.69e-07 |
b_log_income_k_kid_act | b_log_distance_kid_act | -0.00266 | -0.102 | 2.8 | 0.00506 | -0.00492 | -0.163 | 2.49 | 0.0126 |
b_log_income_k_kid_act | b_log_distance_kid_car | 0.0161 | 0.242 | -0.739 | 0.46 | 0.067 | 0.486 | -0.723 | 0.47 |
b_log_income_k_kid_act | b_log_distance_par_act | -4.3e-05 | -0.00101 | 3.15 | 0.00161 | 0.00363 | 0.0736 | 2.89 | 0.00386 |
b_log_income_k_kid_car | alpha_kid_CAR | 0.0303 | 0.622 | -4.16 | 3.18e-05 | 0.115 | 0.849 | -4.15 | 3.39e-05 |
b_log_income_k_kid_car | asc_kid_act | -0.0186 | -0.181 | 9.16 | 0 | -0.0497 | -0.311 | 7.07 | 1.54e-12 |
b_log_income_k_kid_car | asc_kid_car | 0.219 | 0.563 | 0.787 | 0.431 | 0.883 | 0.831 | 0.439 | 0.661 |
b_log_income_k_kid_car | asc_par_act | -0.00277 | -0.0121 | 6.26 | 3.9e-10 | -0.000353 | -0.000945 | 5.45 | 5.17e-08 |
b_log_income_k_kid_car | b_age_kid_act | -0.0108 | -0.214 | -6.63 | 3.38e-11 | -0.0364 | -0.446 | -4.54 | 5.62e-06 |
b_log_income_k_kid_car | b_age_kid_car | -0.109 | -0.617 | -0.8 | 0.424 | -0.406 | -0.849 | -0.436 | 0.663 |
b_log_income_k_kid_car | b_age_par_act | -0.0101 | -0.0929 | 4.85 | 1.25e-06 | -0.0351 | -0.227 | 3.91 | 9.15e-05 |
b_log_income_k_kid_car | b_female_kid_act | 0.00115 | 0.00632 | 3.69 | 0.000225 | -0.0152 | -0.0559 | 3.26 | 0.00111 |
b_log_income_k_kid_car | b_female_kid_car | 0.152 | 0.582 | 0.684 | 0.494 | 0.578 | 0.828 | 0.4 | 0.689 |
b_log_income_k_kid_car | b_female_par_act | 0.00883 | 0.0235 | 0.794 | 0.427 | 0.026 | 0.0466 | 0.778 | 0.437 |
b_log_income_k_kid_car | b_has_big_sib_kid_act | -0.507 | -0.247 | -4.97 | 6.53e-07 | -1.73 | -0.507 | -4.35 | 1.36e-05 |
b_log_income_k_kid_car | b_has_big_sib_kid_car | -2.89 | -0.612 | -0.925 | 0.355 | -10.7 | -0.844 | -0.51 | 0.61 |
b_log_income_k_kid_car | b_has_big_sib_par_act | -0.344 | -0.0867 | -0.365 | 0.715 | -1.24 | -0.208 | -0.357 | 0.721 |
b_log_income_k_kid_car | b_has_lil_sib_kid_act | -0.0715 | -0.321 | -2.31 | 0.0207 | -0.277 | -0.639 | -1.58 | 0.114 |
b_log_income_k_kid_car | b_has_lil_sib_kid_car | -0.302 | -0.605 | -0.855 | 0.392 | -1.16 | -0.841 | -0.455 | 0.649 |
b_log_income_k_kid_car | b_has_lil_sib_par_act | -0.0415 | -0.104 | -2.05 | 0.0406 | -0.16 | -0.262 | -1.85 | 0.0638 |
b_log_income_k_kid_car | b_log_density_kid_act | 0.175 | 0.233 | -5.03 | 4.91e-07 | 0.647 | 0.483 | -4.33 | 1.51e-05 |
b_log_income_k_kid_car | b_log_density_kid_car | -0.146 | -0.326 | 0.0614 | 0.951 | -0.683 | -0.716 | 0.0401 | 0.968 |
b_log_income_k_kid_car | b_log_density_par_act | 0.0563 | 0.0307 | -6.02 | 1.7e-09 | 0.212 | 0.0665 | -5.12 | 3.11e-07 |
b_log_income_k_kid_car | b_log_distance_kid_act | -0.00133 | -0.0705 | 4.8 | 1.55e-06 | -0.00468 | -0.163 | 3.27 | 0.00107 |
b_log_income_k_kid_car | b_log_distance_kid_car | 0.0286 | 0.595 | 0.00604 | 0.995 | 0.11 | 0.84 | 0.00599 | 0.995 |
b_log_income_k_kid_car | b_log_distance_par_act | 0.000713 | 0.0231 | 5.21 | 1.85e-07 | 0.00381 | 0.0808 | 3.71 | 0.00021 |
b_log_income_k_kid_car | b_log_income_k_kid_act | 0.0396 | 0.358 | 0.732 | 0.464 | 0.0963 | 0.528 | 0.691 | 0.489 |
b_log_income_k_par_act | alpha_kid_CAR | 0.00663 | 0.0523 | -0.172 | 0.863 | 0.0265 | 0.11 | -0.165 | 0.869 |
b_log_income_k_par_act | asc_kid_act | -0.0252 | -0.094 | 6.31 | 2.73e-10 | -0.0259 | -0.0908 | 6.19 | 5.98e-10 |
b_log_income_k_par_act | asc_kid_car | 0.0477 | 0.0472 | 1.16 | 0.247 | 0.204 | 0.108 | 0.685 | 0.493 |
b_log_income_k_par_act | asc_par_act | -0.244 | -0.409 | 4.76 | 1.91e-06 | -0.225 | -0.337 | 4.59 | 4.35e-06 |
b_log_income_k_par_act | b_age_kid_act | -0.00148 | -0.0113 | -2.15 | 0.0317 | -0.00781 | -0.0535 | -2.09 | 0.0367 |
b_log_income_k_par_act | b_age_kid_car | -0.0239 | -0.0522 | 0.133 | 0.894 | -0.0944 | -0.11 | 0.0918 | 0.927 |
b_log_income_k_par_act | b_age_par_act | 0.0216 | 0.0763 | 3.99 | 6.51e-05 | -0.00549 | -0.0199 | 3.83 | 0.00013 |
b_log_income_k_par_act | b_female_kid_act | -0.000492 | -0.00104 | 3.46 | 0.000544 | -0.00426 | -0.00876 | 3.4 | 0.000673 |
b_log_income_k_par_act | b_female_kid_car | 0.0329 | 0.0486 | 1.16 | 0.246 | 0.132 | 0.106 | 0.758 | 0.448 |
b_log_income_k_par_act | b_female_par_act | -0.0218 | -0.0223 | 1.22 | 0.223 | -0.0313 | -0.0315 | 1.21 | 0.228 |
b_log_income_k_par_act | b_has_big_sib_kid_act | -0.0782 | -0.0146 | -4.88 | 1.04e-06 | -0.357 | -0.0587 | -4.33 | 1.5e-05 |
b_log_income_k_par_act | b_has_big_sib_kid_car | -0.637 | -0.0518 | -0.885 | 0.376 | -2.49 | -0.11 | -0.488 | 0.625 |
b_log_income_k_par_act | b_has_big_sib_par_act | 0.616 | 0.0597 | -0.309 | 0.757 | -0.151 | -0.0142 | -0.303 | 0.762 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | -0.011 | -0.019 | -1.22 | 0.221 | -0.0653 | -0.0844 | -1 | 0.317 |
b_log_income_k_par_act | b_has_lil_sib_kid_car | -0.0657 | -0.0506 | -0.449 | 0.653 | -0.269 | -0.109 | -0.252 | 0.801 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 0.015 | 0.0144 | -1.4 | 0.162 | 0.025 | 0.023 | -1.36 | 0.174 |
b_log_income_k_par_act | b_log_density_kid_act | 0.0336 | 0.0172 | -4.49 | 7.24e-06 | 0.114 | 0.0476 | -3.78 | 0.000157 |
b_log_income_k_par_act | b_log_density_kid_car | -0.0287 | -0.0246 | 0.51 | 0.61 | -0.146 | -0.0856 | 0.365 | 0.715 |
b_log_income_k_par_act | b_log_density_par_act | 0.203 | 0.0427 | -5.89 | 3.87e-09 | 0.0359 | 0.0063 | -4.98 | 6.31e-07 |
b_log_income_k_par_act | b_log_distance_kid_act | -0.000617 | -0.0126 | 2.99 | 0.00277 | 0.00088 | 0.0171 | 2.96 | 0.00307 |
b_log_income_k_par_act | b_log_distance_kid_car | 0.00642 | 0.0513 | 1.07 | 0.287 | 0.0262 | 0.112 | 1.02 | 0.306 |
b_log_income_k_par_act | b_log_distance_par_act | -0.006 | -0.0747 | 3.14 | 0.00167 | -0.00808 | -0.0961 | 3.09 | 0.00199 |
b_log_income_k_par_act | b_log_income_k_kid_act | 0.0566 | 0.197 | 1.42 | 0.156 | 0.0653 | 0.2 | 1.38 | 0.168 |
b_log_income_k_par_act | b_log_income_k_kid_car | 0.0175 | 0.0842 | 1.04 | 0.3 | 0.0405 | 0.13 | 0.986 | 0.324 |
b_non_work_dad_kid_ace | alpha_kid_CAR | 0.0141 | 0.0788 | -2.24 | 0.025 | 0.0411 | 0.124 | -2.25 | 0.0245 |
b_non_work_dad_kid_ace | asc_kid_act | -0.0295 | -0.0779 | 2.81 | 0.00497 | -0.056 | -0.143 | 2.77 | 0.00564 |
b_non_work_dad_kid_ace | asc_kid_car | 0.109 | 0.0764 | -0.265 | 0.791 | 0.31 | 0.119 | -0.167 | 0.867 |
b_non_work_dad_kid_ace | asc_par_act | -0.0113 | -0.0134 | 3 | 0.00273 | -0.0139 | -0.0151 | 2.9 | 0.00379 |
b_non_work_dad_kid_ace | b_age_kid_act | -0.0133 | -0.0715 | -3.59 | 0.000329 | -0.0158 | -0.0788 | -3.62 | 0.000296 |
b_non_work_dad_kid_ace | b_age_kid_car | -0.0539 | -0.0831 | -1.65 | 0.0989 | -0.145 | -0.123 | -1.27 | 0.204 |
b_non_work_dad_kid_ace | b_age_par_act | -0.00783 | -0.0196 | 0.902 | 0.367 | -0.0052 | -0.0137 | 0.918 | 0.358 |
b_non_work_dad_kid_ace | b_female_kid_act | 0.00152 | 0.00227 | 0.964 | 0.335 | -0.0219 | -0.0328 | 0.955 | 0.34 |
b_non_work_dad_kid_ace | b_female_kid_car | 0.0754 | 0.0789 | -0.654 | 0.513 | 0.215 | 0.125 | -0.471 | 0.638 |
b_non_work_dad_kid_ace | b_female_par_act | 0.0144 | 0.0104 | -0.2 | 0.841 | 0.0181 | 0.0132 | -0.201 | 0.841 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | -0.215 | -0.0285 | -5.15 | 2.64e-07 | -0.502 | -0.0599 | -4.57 | 4.9e-06 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_car | -1.33 | -0.0766 | -1.01 | 0.311 | -3.65 | -0.117 | -0.56 | 0.576 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | -0.142 | -0.00972 | -0.464 | 0.643 | -0.359 | -0.0245 | -0.457 | 0.648 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 0.01 | 0.0123 | -2.73 | 0.00641 | -0.0329 | -0.0309 | -2.38 | 0.0171 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_car | -0.138 | -0.0751 | -1.46 | 0.146 | -0.404 | -0.119 | -0.86 | 0.39 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | -0.00287 | -0.00196 | -2.52 | 0.0119 | -0.0519 | -0.0346 | -2.43 | 0.015 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 0.0517 | 0.0187 | -5.12 | 3.05e-07 | 0.359 | 0.109 | -4.45 | 8.45e-06 |
b_non_work_dad_kid_ace | b_log_density_kid_car | -0.0639 | -0.0388 | -0.678 | 0.498 | -0.243 | -0.104 | -0.502 | 0.615 |
b_non_work_dad_kid_ace | b_log_density_par_act | 0.0259 | 0.00384 | -6.16 | 7.09e-10 | 0.116 | 0.0148 | -5.25 | 1.49e-07 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | 0.000781 | 0.0112 | 0.00844 | 0.993 | -0.00119 | -0.0169 | 0.00854 | 0.993 |
b_non_work_dad_kid_ace | b_log_distance_kid_car | 0.0131 | 0.0741 | -1.35 | 0.176 | 0.0385 | 0.119 | -1.36 | 0.174 |
b_non_work_dad_kid_ace | b_log_distance_par_act | 0.000457 | 0.00403 | 0.152 | 0.879 | 0.0017 | 0.0147 | 0.154 | 0.877 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 0.0605 | 0.149 | -1.06 | 0.287 | 0.0741 | 0.165 | -1.07 | 0.283 |
b_non_work_dad_kid_ace | b_log_income_k_kid_car | 0.0251 | 0.0853 | -1.34 | 0.181 | 0.0584 | 0.136 | -1.34 | 0.181 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 0.0255 | 0.0333 | -1.76 | 0.0787 | 0.0251 | 0.0328 | -1.77 | 0.0774 |
b_non_work_dad_kid_car | alpha_kid_CAR | 0.0324 | 0.301 | -2.02 | 0.0437 | 0.084 | 0.404 | -2.03 | 0.042 |
b_non_work_dad_kid_car | asc_kid_act | -0.0189 | -0.083 | 5.75 | 9.12e-09 | -0.044 | -0.179 | 5.35 | 8.77e-08 |
b_non_work_dad_kid_car | asc_kid_car | 0.24 | 0.281 | 0.517 | 0.605 | 0.649 | 0.397 | 0.293 | 0.77 |
b_non_work_dad_kid_car | asc_par_act | -0.00212 | -0.0042 | 4.99 | 6.18e-07 | -0.00289 | -0.00502 | 4.62 | 3.82e-06 |
b_non_work_dad_kid_car | b_age_kid_act | -0.0113 | -0.101 | -4.06 | 5e-05 | -0.0236 | -0.188 | -3.83 | 0.000127 |
b_non_work_dad_kid_car | b_age_kid_car | -0.118 | -0.304 | -0.934 | 0.35 | -0.3 | -0.407 | -0.617 | 0.537 |
b_non_work_dad_kid_car | b_age_par_act | -0.0106 | -0.0439 | 2.86 | 0.00425 | -0.024 | -0.101 | 2.77 | 0.00567 |
b_non_work_dad_kid_car | b_female_kid_act | 0.000978 | 0.00243 | 2.58 | 0.00992 | -0.0144 | -0.0343 | 2.48 | 0.0131 |
b_non_work_dad_kid_car | b_female_kid_car | 0.161 | 0.28 | 0.272 | 0.785 | 0.432 | 0.402 | 0.17 | 0.865 |
b_non_work_dad_kid_car | b_female_par_act | 0.0107 | 0.0129 | 0.544 | 0.586 | 0.0227 | 0.0264 | 0.542 | 0.588 |
b_non_work_dad_kid_car | b_has_big_sib_kid_act | -0.491 | -0.108 | -5 | 5.74e-07 | -1.11 | -0.212 | -4.41 | 1.01e-05 |
b_non_work_dad_kid_car | b_has_big_sib_kid_car | -3.03 | -0.291 | -0.941 | 0.347 | -7.71 | -0.397 | -0.521 | 0.603 |
b_non_work_dad_kid_car | b_has_big_sib_par_act | -0.344 | -0.0393 | -0.384 | 0.701 | -0.868 | -0.095 | -0.377 | 0.706 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_act | -0.0668 | -0.136 | -2.25 | 0.0246 | -0.191 | -0.287 | -1.76 | 0.0792 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_car | -0.302 | -0.274 | -0.96 | 0.337 | -0.823 | -0.387 | -0.54 | 0.59 |
b_non_work_dad_kid_car | b_has_lil_sib_par_act | -0.0394 | -0.0447 | -2.09 | 0.0363 | -0.111 | -0.119 | -1.97 | 0.0485 |
b_non_work_dad_kid_car | b_log_density_kid_act | 0.19 | 0.115 | -5.03 | 4.79e-07 | 0.477 | 0.231 | -4.29 | 1.81e-05 |
b_non_work_dad_kid_car | b_log_density_kid_car | -0.157 | -0.159 | -0.0975 | 0.922 | -0.595 | -0.406 | -0.0669 | 0.947 |
b_non_work_dad_kid_car | b_log_density_par_act | 0.0606 | 0.015 | -6.05 | 1.49e-09 | 0.157 | 0.032 | -5.14 | 2.78e-07 |
b_non_work_dad_kid_car | b_log_distance_kid_act | -0.00255 | -0.0611 | 1.8 | 0.0712 | -0.00413 | -0.0933 | 1.75 | 0.0803 |
b_non_work_dad_kid_car | b_log_distance_kid_car | 0.0315 | 0.297 | -0.465 | 0.642 | 0.0806 | 0.398 | -0.469 | 0.639 |
b_non_work_dad_kid_car | b_log_distance_par_act | 0.000135 | 0.00197 | 2.04 | 0.0417 | 0.00259 | 0.0358 | 1.99 | 0.0463 |
b_non_work_dad_kid_car | b_log_income_k_kid_act | 0.0296 | 0.121 | 0.0123 | 0.99 | 0.0725 | 0.258 | 0.0127 | 0.99 |
b_non_work_dad_kid_car | b_log_income_k_kid_car | 0.0525 | 0.297 | -0.462 | 0.644 | 0.113 | 0.423 | -0.465 | 0.642 |
b_non_work_dad_kid_car | b_log_income_k_par_act | 0.0127 | 0.0277 | -1.13 | 0.26 | 0.0282 | 0.059 | -1.12 | 0.261 |
b_non_work_dad_kid_car | b_non_work_dad_kid_ace | 0.192 | 0.295 | 1.08 | 0.278 | 0.203 | 0.308 | 1.1 | 0.272 |
b_non_work_dad_par_act | alpha_kid_CAR | 0.00532 | 0.0152 | 0.515 | 0.606 | 0.0176 | 0.0282 | 0.537 | 0.591 |
b_non_work_dad_par_act | asc_kid_act | -0.014 | -0.0189 | 3.17 | 0.00155 | -0.0238 | -0.0322 | 3.3 | 0.000953 |
b_non_work_dad_par_act | asc_kid_car | 0.0392 | 0.0141 | 1.21 | 0.227 | 0.131 | 0.0266 | 0.932 | 0.351 |
b_non_work_dad_par_act | asc_par_act | -0.123 | -0.0751 | 3.28 | 0.00103 | -0.0966 | -0.0557 | 3.38 | 0.000722 |
b_non_work_dad_par_act | b_age_kid_act | -0.00414 | -0.0114 | -0.223 | 0.824 | 0.00139 | 0.00368 | -0.234 | 0.815 |
b_non_work_dad_par_act | b_age_kid_car | -0.02 | -0.0158 | 0.614 | 0.539 | -0.0612 | -0.0276 | 0.575 | 0.565 |
b_non_work_dad_par_act | b_age_par_act | -0.0346 | -0.0442 | 2.11 | 0.0351 | -0.0636 | -0.0888 | 2.19 | 0.0283 |
b_non_work_dad_par_act | b_female_kid_act | 0.00864 | 0.00661 | 2.15 | 0.0319 | 0.00278 | 0.00221 | 2.24 | 0.0253 |
b_non_work_dad_par_act | b_female_kid_car | 0.0292 | 0.0156 | 1.13 | 0.257 | 0.092 | 0.0284 | 0.996 | 0.319 |
b_non_work_dad_par_act | b_female_par_act | 0.0616 | 0.0228 | 1.27 | 0.205 | 0.0208 | 0.00806 | 1.3 | 0.193 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | -0.0717 | -0.00487 | -4.57 | 4.81e-06 | -0.13 | -0.00827 | -4.1 | 4.06e-05 |
b_non_work_dad_par_act | b_has_big_sib_kid_car | -0.494 | -0.0145 | -0.81 | 0.418 | -1.56 | -0.0266 | -0.449 | 0.653 |
b_non_work_dad_par_act | b_has_big_sib_par_act | -0.0593 | -0.00208 | -0.222 | 0.824 | 0.266 | 0.00966 | -0.219 | 0.826 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 0.00383 | 0.0024 | -0.07 | 0.944 | -0.0359 | -0.0179 | -0.0689 | 0.945 |
b_non_work_dad_par_act | b_has_lil_sib_kid_car | -0.0497 | -0.0139 | 0.112 | 0.911 | -0.168 | -0.0263 | 0.0781 | 0.938 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 0.0855 | 0.0298 | -0.425 | 0.671 | 0.175 | 0.062 | -0.441 | 0.659 |
b_non_work_dad_par_act | b_log_density_kid_act | 0.0106 | 0.00197 | -3.34 | 0.00085 | 0.135 | 0.0218 | -3 | 0.00266 |
b_non_work_dad_par_act | b_log_density_kid_car | -0.0257 | -0.00801 | 0.803 | 0.422 | -0.111 | -0.0251 | 0.685 | 0.493 |
b_non_work_dad_par_act | b_log_density_par_act | -0.274 | -0.0208 | -5.42 | 5.84e-08 | -0.244 | -0.0165 | -4.68 | 2.85e-06 |
b_non_work_dad_par_act | b_log_distance_kid_act | -0.000374 | -0.00276 | 1.67 | 0.0951 | 0.000609 | 0.00457 | 1.75 | 0.0796 |
b_non_work_dad_par_act | b_log_distance_kid_car | 0.00492 | 0.0143 | 0.969 | 0.332 | 0.0167 | 0.0274 | 1.01 | 0.312 |
b_non_work_dad_par_act | b_log_distance_par_act | -0.00928 | -0.0419 | 1.74 | 0.0823 | 0.00457 | 0.021 | 1.83 | 0.0672 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 0.0268 | 0.0337 | 1.1 | 0.272 | 0.0221 | 0.0261 | 1.15 | 0.252 |
b_non_work_dad_par_act | b_log_income_k_kid_car | 0.0108 | 0.0188 | 0.964 | 0.335 | 0.0231 | 0.0286 | 1 | 0.316 |
b_non_work_dad_par_act | b_log_income_k_par_act | 0.174 | 0.117 | 0.567 | 0.571 | 0.26 | 0.18 | 0.606 | 0.545 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 0.376 | 0.178 | 1.6 | 0.109 | 0.306 | 0.154 | 1.65 | 0.0981 |
b_non_work_dad_par_act | b_non_work_dad_kid_car | 0.0834 | 0.0658 | 1.08 | 0.28 | 0.0856 | 0.069 | 1.13 | 0.259 |
b_non_work_mom_kid_act | alpha_kid_CAR | 0.0919 | 0.612 | -2.51 | 0.0122 | 0.323 | 0.823 | -2.02 | 0.0431 |
b_non_work_mom_kid_act | asc_kid_act | -0.0545 | -0.172 | 3.55 | 0.000384 | -0.126 | -0.272 | 2.6 | 0.00938 |
b_non_work_mom_kid_act | asc_kid_car | 0.731 | 0.611 | -0.0517 | 0.959 | 2.54 | 0.824 | -0.0331 | 0.974 |
b_non_work_mom_kid_act | asc_par_act | -0.006 | -0.00851 | 3.65 | 0.000264 | 0.00668 | 0.00614 | 2.9 | 0.00376 |
b_non_work_mom_kid_act | b_age_kid_act | -0.029 | -0.186 | -3.75 | 0.00018 | -0.1 | -0.422 | -2.64 | 0.00829 |
b_non_work_mom_kid_act | b_age_kid_car | -0.333 | -0.613 | -1.25 | 0.21 | -1.15 | -0.823 | -0.749 | 0.454 |
b_non_work_mom_kid_act | b_age_par_act | -0.0275 | -0.082 | 1.42 | 0.157 | -0.0972 | -0.216 | 1.03 | 0.301 |
b_non_work_mom_kid_act | b_female_kid_act | 0.022 | 0.0393 | 1.47 | 0.142 | -0.0293 | -0.0371 | 1.12 | 0.264 |
b_non_work_mom_kid_act | b_female_kid_car | 0.454 | 0.567 | -0.585 | 0.559 | 1.63 | 0.804 | -0.486 | 0.627 |
b_non_work_mom_kid_act | b_female_par_act | 0.0323 | 0.0279 | 0.03 | 0.976 | 0.0872 | 0.0538 | 0.0268 | 0.979 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -1.62 | -0.257 | -4.98 | 6.3e-07 | -4.91 | -0.496 | -4.25 | 2.17e-05 |
b_non_work_mom_kid_act | b_has_big_sib_kid_car | -8.84 | -0.606 | -0.965 | 0.335 | -30.1 | -0.82 | -0.532 | 0.595 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | -1.13 | -0.0922 | -0.435 | 0.663 | -3.45 | -0.2 | -0.423 | 0.672 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -0.259 | -0.378 | -2.29 | 0.0222 | -0.83 | -0.659 | -1.54 | 0.125 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_car | -0.939 | -0.611 | -1.12 | 0.261 | -3.31 | -0.823 | -0.618 | 0.537 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | -0.142 | -0.116 | -2.31 | 0.0206 | -0.465 | -0.262 | -1.89 | 0.0583 |
b_non_work_mom_kid_act | b_log_density_kid_act | 0.358 | 0.155 | -5.3 | 1.14e-07 | 1.51 | 0.388 | -4.78 | 1.76e-06 |
b_non_work_mom_kid_act | b_log_density_kid_car | -0.469 | -0.34 | -0.45 | 0.653 | -1.92 | -0.694 | -0.284 | 0.776 |
b_non_work_mom_kid_act | b_log_density_par_act | 0.127 | 0.0226 | -6.14 | 8.08e-10 | 0.458 | 0.0495 | -5.22 | 1.83e-07 |
b_non_work_mom_kid_act | b_log_distance_kid_act | -0.00179 | -0.0308 | 0.447 | 0.655 | -0.0102 | -0.122 | 0.32 | 0.749 |
b_non_work_mom_kid_act | b_log_distance_kid_car | 0.0899 | 0.607 | -1.32 | 0.188 | 0.314 | 0.822 | -1.06 | 0.291 |
b_non_work_mom_kid_act | b_log_distance_par_act | 0.00218 | 0.0229 | 0.619 | 0.536 | 0.0105 | 0.0765 | 0.448 | 0.654 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 0.105 | 0.309 | -0.883 | 0.377 | 0.261 | 0.491 | -0.692 | 0.489 |
b_non_work_mom_kid_act | b_log_income_k_kid_car | 0.105 | 0.424 | -1.29 | 0.196 | 0.362 | 0.716 | -1.07 | 0.284 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 0.0364 | 0.0568 | -1.64 | 0.1 | 0.0985 | 0.109 | -1.35 | 0.178 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | 0.00867 | 0.00957 | 0.284 | 0.777 | 0.112 | 0.0898 | 0.253 | 0.801 |
b_non_work_mom_kid_act | b_non_work_dad_kid_car | 0.101 | 0.185 | -0.769 | 0.442 | 0.261 | 0.335 | -0.641 | 0.521 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -0.00295 | -0.00167 | -1.36 | 0.175 | 0.0588 | 0.0251 | -1.33 | 0.184 |
b_non_work_mom_kid_car | alpha_kid_CAR | 0.33 | 0.968 | -1.42 | 0.157 | 1.19 | 0.992 | -0.757 | 0.449 |
b_non_work_mom_kid_car | asc_kid_act | -0.084 | -0.117 | 1.43 | 0.153 | -0.41 | -0.289 | 0.765 | 0.444 |
b_non_work_mom_kid_car | asc_kid_car | 2.62 | 0.966 | -0.902 | 0.367 | 9.36 | 0.991 | -0.544 | 0.586 |
b_non_work_mom_kid_car | asc_par_act | 0.0257 | 0.016 | 1.76 | 0.0783 | 0.0522 | 0.0157 | 0.984 | 0.325 |
b_non_work_mom_kid_car | b_age_kid_act | -0.123 | -0.348 | -1.99 | 0.0469 | -0.374 | -0.515 | -1.07 | 0.286 |
b_non_work_mom_kid_car | b_age_kid_car | -1.19 | -0.967 | -0.892 | 0.373 | -4.22 | -0.991 | -0.475 | 0.635 |
b_non_work_mom_kid_car | b_age_par_act | -0.111 | -0.146 | 0.374 | 0.708 | -0.367 | -0.267 | 0.202 | 0.84 |
b_non_work_mom_kid_car | b_female_kid_act | 0.00558 | 0.00438 | 0.455 | 0.649 | -0.182 | -0.0751 | 0.248 | 0.804 |
b_non_work_mom_kid_car | b_female_kid_car | 1.65 | 0.905 | -0.911 | 0.362 | 6.04 | 0.973 | -0.521 | 0.602 |
b_non_work_mom_kid_car | b_female_par_act | 0.094 | 0.0357 | -0.243 | 0.808 | 0.285 | 0.0575 | -0.147 | 0.883 |
b_non_work_mom_kid_car | b_has_big_sib_kid_act | -5.49 | -0.383 | -4.64 | 3.53e-06 | -17.7 | -0.583 | -3.54 | 0.000396 |
b_non_work_mom_kid_car | b_has_big_sib_kid_car | -31.6 | -0.955 | -0.928 | 0.353 | -111 | -0.987 | -0.509 | 0.611 |
b_non_work_mom_kid_car | b_has_big_sib_par_act | -3.79 | -0.137 | -0.469 | 0.639 | -13 | -0.246 | -0.434 | 0.664 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_act | -0.812 | -0.522 | -1.52 | 0.129 | -2.91 | -0.757 | -0.828 | 0.407 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_car | -3.35 | -0.96 | -0.893 | 0.372 | -12.1 | -0.989 | -0.473 | 0.636 |
b_non_work_mom_kid_car | b_has_lil_sib_par_act | -0.468 | -0.167 | -1.78 | 0.0755 | -1.68 | -0.31 | -1.06 | 0.289 |
b_non_work_mom_kid_car | b_log_density_kid_act | 1.75 | 0.333 | -5.4 | 6.73e-08 | 6.42 | 0.539 | -4.41 | 1.05e-05 |
b_non_work_mom_kid_car | b_log_density_kid_car | -1.68 | -0.536 | -0.492 | 0.623 | -7.08 | -0.835 | -0.267 | 0.789 |
b_non_work_mom_kid_car | b_log_density_par_act | 0.549 | 0.0429 | -6.07 | 1.24e-09 | 2.03 | 0.0718 | -4.93 | 8.32e-07 |
b_non_work_mom_kid_car | b_log_distance_kid_act | -0.0105 | -0.0796 | -0.113 | 0.91 | -0.0481 | -0.188 | -0.0601 | 0.952 |
b_non_work_mom_kid_car | b_log_distance_kid_car | 0.32 | 0.953 | -0.903 | 0.366 | 1.16 | 0.989 | -0.483 | 0.629 |
b_non_work_mom_kid_car | b_log_distance_par_act | 0.00954 | 0.0442 | -0.0371 | 0.97 | 0.0361 | 0.0862 | -0.0198 | 0.984 |
b_non_work_mom_kid_car | b_log_income_k_kid_act | 0.194 | 0.25 | -0.707 | 0.48 | 0.784 | 0.483 | -0.385 | 0.7 |
b_non_work_mom_kid_car | b_log_income_k_kid_car | 0.36 | 0.643 | -0.908 | 0.364 | 1.32 | 0.854 | -0.489 | 0.625 |
b_non_work_mom_kid_car | b_log_income_k_par_act | 0.0782 | 0.0537 | -1.18 | 0.24 | 0.306 | 0.111 | -0.658 | 0.51 |
b_non_work_mom_kid_car | b_non_work_dad_kid_ace | 0.166 | 0.0808 | -0.108 | 0.914 | 0.472 | 0.124 | -0.0624 | 0.95 |
b_non_work_mom_kid_car | b_non_work_dad_kid_car | 0.344 | 0.278 | -0.717 | 0.473 | 0.938 | 0.394 | -0.389 | 0.697 |
b_non_work_mom_kid_car | b_non_work_dad_par_act | 0.059 | 0.0147 | -1.28 | 0.199 | 0.203 | 0.0283 | -0.874 | 0.382 |
b_non_work_mom_kid_car | b_non_work_mom_kid_act | 1.13 | 0.655 | -0.396 | 0.692 | 3.78 | 0.84 | -0.222 | 0.824 |
b_non_work_mom_par_act | alpha_kid_CAR | 0.0497 | 0.203 | 2.38 | 0.0175 | 0.172 | 0.359 | 2.38 | 0.0174 |
b_non_work_mom_par_act | asc_kid_act | -0.0227 | -0.0437 | 5.95 | 2.76e-09 | -0.0621 | -0.11 | 5.62 | 1.87e-08 |
b_non_work_mom_par_act | asc_kid_car | 0.394 | 0.202 | 2.96 | 0.00313 | 1.36 | 0.36 | 2.14 | 0.0326 |
b_non_work_mom_par_act | asc_par_act | -0.159 | -0.138 | 5.56 | 2.68e-08 | -0.0853 | -0.0643 | 5.41 | 6.22e-08 |
b_non_work_mom_par_act | b_age_kid_act | -0.0159 | -0.0623 | 1.26 | 0.207 | -0.0532 | -0.184 | 1.19 | 0.233 |
b_non_work_mom_par_act | b_age_kid_car | -0.179 | -0.202 | 2.15 | 0.0313 | -0.609 | -0.359 | 1.65 | 0.0992 |
b_non_work_mom_par_act | b_age_par_act | -0.0032 | -0.00584 | 4.51 | 6.41e-06 | -0.0478 | -0.0872 | 4.28 | 1.88e-05 |
b_non_work_mom_par_act | b_female_kid_act | 0.00856 | 0.00934 | 4.39 | 1.13e-05 | -0.0154 | -0.016 | 4.2 | 2.68e-05 |
b_non_work_mom_par_act | b_female_kid_car | 0.246 | 0.188 | 3.1 | 0.00192 | 0.87 | 0.351 | 2.65 | 0.00796 |
b_non_work_mom_par_act | b_female_par_act | -0.0735 | -0.0388 | 2.68 | 0.00736 | 0.0569 | 0.0287 | 2.71 | 0.00679 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | -0.909 | -0.088 | -4.29 | 1.81e-05 | -2.5 | -0.206 | -3.75 | 0.000177 |
b_non_work_mom_par_act | b_has_big_sib_kid_car | -4.77 | -0.2 | -0.667 | 0.505 | -16.1 | -0.358 | -0.369 | 0.712 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -0.742 | -0.0372 | -0.0618 | 0.951 | -1.68 | -0.0798 | -0.0605 | 0.952 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -0.135 | -0.121 | 1.24 | 0.214 | -0.431 | -0.28 | 1.04 | 0.296 |
b_non_work_mom_par_act | b_has_lil_sib_kid_car | -0.506 | -0.201 | 1.04 | 0.299 | -1.76 | -0.36 | 0.632 | 0.528 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | -0.293 | -0.146 | 0.578 | 0.563 | -0.42 | -0.194 | 0.546 | 0.585 |
b_non_work_mom_par_act | b_log_density_kid_act | 0.22 | 0.0581 | -3.02 | 0.00257 | 0.818 | 0.172 | -2.69 | 0.00711 |
b_non_work_mom_par_act | b_log_density_kid_car | -0.256 | -0.113 | 1.94 | 0.0526 | -1.03 | -0.306 | 1.41 | 0.158 |
b_non_work_mom_par_act | b_log_density_par_act | -0.38 | -0.0412 | -5.2 | 2.03e-07 | -1.04 | -0.0922 | -4.39 | 1.12e-05 |
b_non_work_mom_par_act | b_log_distance_kid_act | -0.00138 | -0.0145 | 3.97 | 7.08e-05 | -0.00525 | -0.0514 | 3.81 | 0.000137 |
b_non_work_mom_par_act | b_log_distance_kid_car | 0.0485 | 0.2 | 3.04 | 0.0024 | 0.168 | 0.36 | 3.04 | 0.00239 |
b_non_work_mom_par_act | b_log_distance_par_act | -0.0053 | -0.0341 | 4.06 | 4.83e-05 | 0.000606 | 0.00363 | 3.92 | 8.96e-05 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 0.0435 | 0.0781 | 3.13 | 0.00172 | 0.128 | 0.198 | 3.11 | 0.00188 |
b_non_work_mom_par_act | b_log_income_k_kid_car | 0.0551 | 0.137 | 3.01 | 0.00265 | 0.193 | 0.313 | 3.02 | 0.00255 |
b_non_work_mom_par_act | b_log_income_k_par_act | 0.235 | 0.224 | 2.38 | 0.0171 | 0.225 | 0.204 | 2.28 | 0.0228 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | 0.00462 | 0.00312 | 3.21 | 0.00131 | 0.0752 | 0.0495 | 3.22 | 0.0013 |
b_non_work_mom_par_act | b_non_work_dad_kid_car | 0.0522 | 0.0588 | 2.98 | 0.00291 | 0.143 | 0.15 | 2.97 | 0.00296 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -0.0743 | -0.0257 | 0.907 | 0.364 | 0.121 | 0.0423 | 0.955 | 0.34 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 0.319 | 0.257 | 3.6 | 0.000319 | 0.7 | 0.39 | 3.51 | 0.000456 |
b_non_work_mom_par_act | b_non_work_mom_kid_car | 0.6 | 0.213 | 2.71 | 0.00681 | 2.01 | 0.365 | 1.7 | 0.0883 |
b_veh_per_driver_kid_act | alpha_kid_CAR | -0.0833 | -0.594 | -2.39 | 0.0168 | -0.295 | -0.803 | -1.57 | 0.115 |
b_veh_per_driver_kid_act | asc_kid_act | -0.00249 | -0.00842 | 3.68 | 0.000237 | 0.0779 | 0.18 | 2.91 | 0.00361 |
b_veh_per_driver_kid_act | asc_kid_car | -0.651 | -0.584 | -0.164 | 0.87 | -2.3 | -0.798 | -0.0914 | 0.927 |
b_veh_per_driver_kid_act | asc_par_act | -0.013 | -0.0198 | 3.53 | 0.000414 | -0.0158 | -0.0155 | 2.81 | 0.00495 |
b_veh_per_driver_kid_act | b_age_kid_act | 0.0156 | 0.107 | -4.57 | 4.96e-06 | 0.0776 | 0.35 | -3.44 | 0.000583 |
b_veh_per_driver_kid_act | b_age_kid_car | 0.295 | 0.582 | -2.88 | 0.00395 | 1.04 | 0.797 | -2.69 | 0.00714 |
b_veh_per_driver_kid_act | b_age_par_act | 0.0194 | 0.062 | 1.28 | 0.201 | 0.0841 | 0.2 | 1 | 0.316 |
b_veh_per_driver_kid_act | b_female_kid_act | 0.0144 | 0.0275 | 1.27 | 0.206 | 0.0555 | 0.0751 | 1.02 | 0.306 |
b_veh_per_driver_kid_act | b_female_kid_car | -0.408 | -0.545 | -0.494 | 0.621 | -1.48 | -0.782 | -0.284 | 0.777 |
b_veh_per_driver_kid_act | b_female_par_act | -0.0136 | -0.0126 | -0.139 | 0.889 | -0.0613 | -0.0405 | -0.122 | 0.903 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 1.46 | 0.248 | -5.32 | 1.04e-07 | 4.43 | 0.479 | -4.91 | 9e-07 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_car | 7.75 | 0.57 | -1.04 | 0.298 | 27.2 | 0.792 | -0.575 | 0.565 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | 0.935 | 0.0819 | -0.459 | 0.646 | 3.28 | 0.203 | -0.456 | 0.648 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | 0.198 | 0.309 | -3.63 | 0.000283 | 0.706 | 0.6 | -3.5 | 0.000462 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_car | 0.814 | 0.567 | -2.02 | 0.0435 | 2.97 | 0.791 | -1.18 | 0.239 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | 0.112 | 0.0978 | -2.76 | 0.00582 | 0.412 | 0.248 | -2.67 | 0.00767 |
b_veh_per_driver_kid_act | b_log_density_kid_act | -0.372 | -0.172 | -4.95 | 7.45e-07 | -1.57 | -0.431 | -3.76 | 0.000173 |
b_veh_per_driver_kid_act | b_log_density_kid_car | 0.449 | 0.349 | -0.789 | 0.43 | 1.77 | 0.683 | -0.69 | 0.49 |
b_veh_per_driver_kid_act | b_log_density_par_act | -0.131 | -0.0249 | -6.15 | 7.57e-10 | -0.536 | -0.0619 | -5.17 | 2.32e-07 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 0.00633 | 0.117 | 0.156 | 0.876 | 0.0157 | 0.201 | 0.113 | 0.91 |
b_veh_per_driver_kid_act | b_log_distance_kid_car | -0.08 | -0.579 | -1.4 | 0.162 | -0.284 | -0.794 | -0.924 | 0.355 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 0.000945 | 0.0106 | 0.338 | 0.736 | -0.00547 | -0.0427 | 0.242 | 0.809 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -0.0809 | -0.254 | -1.02 | 0.309 | -0.226 | -0.456 | -0.724 | 0.469 |
b_veh_per_driver_kid_act | b_log_income_k_kid_car | -0.087 | -0.378 | -1.35 | 0.177 | -0.325 | -0.686 | -0.89 | 0.373 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -0.0282 | -0.0471 | -1.86 | 0.063 | -0.085 | -0.101 | -1.47 | 0.141 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | -0.0147 | -0.0174 | 0.0884 | 0.93 | -0.108 | -0.0925 | 0.0736 | 0.941 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_car | -0.0897 | -0.177 | -0.914 | 0.361 | -0.239 | -0.328 | -0.687 | 0.492 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | -5.66e-05 | -3.43e-05 | -1.49 | 0.136 | -0.0515 | -0.0235 | -1.44 | 0.149 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | -0.247 | -0.348 | -0.192 | 0.848 | -0.892 | -0.648 | -0.125 | 0.901 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_car | -0.904 | -0.562 | 0.139 | 0.89 | -3.32 | -0.789 | 0.0752 | 0.94 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | -0.133 | -0.115 | -3.22 | 0.00127 | -0.475 | -0.283 | -2.63 | 0.00848 |
b_veh_per_driver_kid_car | alpha_kid_CAR | -0.104 | -0.876 | -0.141 | 0.888 | -0.364 | -0.956 | -0.0804 | 0.936 |
b_veh_per_driver_kid_car | asc_kid_act | 0.0128 | 0.0508 | 7.03 | 2.05e-12 | 0.112 | 0.249 | 4.72 | 2.4e-06 |
b_veh_per_driver_kid_car | asc_kid_car | -0.85 | -0.895 | 0.881 | 0.379 | -2.87 | -0.961 | 0.481 | 0.631 |
b_veh_per_driver_kid_car | asc_par_act | -0.0131 | -0.0233 | 5.75 | 9.17e-09 | -0.0201 | -0.0191 | 4.15 | 3.33e-05 |
b_veh_per_driver_kid_car | b_age_kid_act | 0.042 | 0.339 | -2.48 | 0.0131 | 0.117 | 0.509 | -1.49 | 0.136 |
b_veh_per_driver_kid_car | b_age_kid_car | 0.379 | 0.879 | 0.426 | 0.67 | 1.29 | 0.955 | 0.402 | 0.688 |
b_veh_per_driver_kid_car | b_age_par_act | 0.0361 | 0.136 | 4.32 | 1.55e-05 | 0.113 | 0.26 | 2.83 | 0.0046 |
b_veh_per_driver_kid_car | b_female_kid_act | -0.0107 | -0.024 | 3.55 | 0.000391 | 0.0445 | 0.0581 | 2.59 | 0.00964 |
b_veh_per_driver_kid_car | b_female_kid_car | -0.524 | -0.824 | 0.871 | 0.383 | -1.86 | -0.944 | 0.478 | 0.633 |
b_veh_per_driver_kid_car | b_female_par_act | -0.0321 | -0.0349 | 1.23 | 0.217 | -0.091 | -0.058 | 1.03 | 0.305 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_act | 1.8 | 0.358 | -5.07 | 4.02e-07 | 5.41 | 0.563 | -4.71 | 2.43e-06 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_car | 10.1 | 0.874 | -0.92 | 0.358 | 33.9 | 0.953 | -0.508 | 0.611 |
b_veh_per_driver_kid_car | b_has_big_sib_par_act | 1.22 | 0.125 | -0.31 | 0.757 | 3.97 | 0.237 | -0.308 | 0.758 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_act | 0.262 | 0.482 | -1.74 | 0.0812 | 0.894 | 0.733 | -1.61 | 0.107 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_car | 1.07 | 0.877 | -0.718 | 0.473 | 3.72 | 0.956 | -0.391 | 0.696 |
b_veh_per_driver_kid_car | b_has_lil_sib_par_act | 0.15 | 0.154 | -1.5 | 0.135 | 0.516 | 0.3 | -1.4 | 0.162 |
b_veh_per_driver_kid_car | b_log_density_kid_act | -0.529 | -0.287 | -4.2 | 2.7e-05 | -1.93 | -0.512 | -3.12 | 0.00179 |
b_veh_per_driver_kid_car | b_log_density_kid_car | 0.531 | 0.485 | 0.654 | 0.513 | 2.17 | 0.81 | 0.604 | 0.546 |
b_veh_per_driver_kid_car | b_log_density_par_act | -0.168 | -0.0375 | -5.84 | 5.18e-09 | -0.612 | -0.0682 | -4.89 | 9.94e-07 |
b_veh_per_driver_kid_car | b_log_distance_kid_act | 0.00222 | 0.0481 | 3.21 | 0.00133 | 0.0138 | 0.17 | 1.91 | 0.0565 |
b_veh_per_driver_kid_car | b_log_distance_kid_car | -0.102 | -0.864 | 0.954 | 0.34 | -0.353 | -0.955 | 0.544 | 0.586 |
b_veh_per_driver_kid_car | b_log_distance_par_act | -0.00326 | -0.0432 | 3.36 | 0.00077 | -0.0111 | -0.0835 | 1.99 | 0.0461 |
b_veh_per_driver_kid_car | b_log_income_k_kid_act | -0.0627 | -0.232 | 1.25 | 0.21 | -0.243 | -0.473 | 0.76 | 0.447 |
b_veh_per_driver_kid_car | b_log_income_k_kid_car | -0.113 | -0.576 | 0.906 | 0.365 | -0.409 | -0.835 | 0.521 | 0.602 |
b_veh_per_driver_kid_car | b_log_income_k_par_act | -0.0252 | -0.0495 | 0.00871 | 0.993 | -0.095 | -0.108 | 0.00618 | 0.995 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_ace | -0.0508 | -0.0705 | 1.72 | 0.086 | -0.14 | -0.116 | 1.34 | 0.179 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_car | -0.107 | -0.247 | 1.04 | 0.298 | -0.285 | -0.378 | 0.704 | 0.482 |
b_veh_per_driver_kid_car | b_non_work_dad_par_act | -0.0172 | -0.0122 | -0.543 | 0.587 | -0.0592 | -0.0261 | -0.51 | 0.61 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_act | -0.331 | -0.549 | 1.33 | 0.184 | -1.12 | -0.789 | 0.81 | 0.418 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_car | -1.19 | -0.871 | 0.939 | 0.347 | -4.15 | -0.953 | 0.505 | 0.613 |
b_veh_per_driver_kid_car | b_non_work_mom_par_act | -0.178 | -0.181 | -2.04 | 0.0417 | -0.6 | -0.345 | -1.58 | 0.115 |
b_veh_per_driver_kid_car | b_veh_per_driver_kid_act | 0.352 | 0.625 | 3.17 | 0.00154 | 1.08 | 0.813 | 2.97 | 0.00303 |
b_veh_per_driver_par_act | alpha_kid_CAR | -0.0388 | -0.117 | -6.05 | 1.42e-09 | -0.129 | -0.172 | -4.94 | 7.97e-07 |
b_veh_per_driver_par_act | asc_kid_act | -0.000903 | -0.00129 | -3.22 | 0.00128 | 0.0368 | 0.0417 | -2.7 | 0.00683 |
b_veh_per_driver_par_act | asc_kid_car | -0.304 | -0.116 | -3.99 | 6.74e-05 | -1.01 | -0.172 | -2.66 | 0.00778 |
b_veh_per_driver_par_act | asc_par_act | -0.307 | -0.198 | -2.47 | 0.0136 | -0.589 | -0.284 | -2.03 | 0.0424 |
b_veh_per_driver_par_act | b_age_kid_act | 0.00863 | 0.0251 | -6.91 | 4.89e-12 | 0.0357 | 0.0787 | -5.77 | 8.02e-09 |
b_veh_per_driver_par_act | b_age_kid_car | 0.138 | 0.115 | -5.92 | 3.3e-09 | 0.456 | 0.172 | -4.81 | 1.51e-06 |
b_veh_per_driver_par_act | b_age_par_act | 0.0374 | 0.0505 | -4.36 | 1.3e-05 | 0.0992 | 0.116 | -3.68 | 0.000234 |
b_veh_per_driver_par_act | b_female_kid_act | 0.00882 | 0.00713 | -4.1 | 4.14e-05 | 0.0255 | 0.0169 | -3.46 | 0.000531 |
b_veh_per_driver_par_act | b_female_kid_car | -0.19 | -0.107 | -4.66 | 3.12e-06 | -0.65 | -0.168 | -3.36 | 0.00077 |
b_veh_per_driver_par_act | b_female_par_act | 0.0848 | 0.0332 | -4.26 | 2.02e-05 | 0.112 | 0.0363 | -3.73 | 0.000192 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | 0.669 | 0.0479 | -6.38 | 1.72e-10 | 2.09 | 0.111 | -5.75 | 9.01e-09 |
b_veh_per_driver_par_act | b_has_big_sib_kid_car | 3.62 | 0.113 | -1.6 | 0.111 | 12 | 0.171 | -0.884 | 0.377 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | 0.12 | 0.00447 | -1.13 | 0.258 | 2.25 | 0.0682 | -1.12 | 0.262 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | 0.0937 | 0.0619 | -6.4 | 1.53e-10 | 0.32 | 0.133 | -5.4 | 6.55e-08 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_car | 0.381 | 0.112 | -5.1 | 3.36e-07 | 1.31 | 0.171 | -3.39 | 0.000699 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -0.0233 | -0.00859 | -5.8 | 6.66e-09 | 0.252 | 0.0745 | -5.25 | 1.49e-07 |
b_veh_per_driver_par_act | b_log_density_kid_act | -0.207 | -0.0405 | -7.18 | 7.11e-13 | -0.674 | -0.0907 | -5.82 | 5.92e-09 |
b_veh_per_driver_par_act | b_log_density_kid_car | 0.207 | 0.0679 | -4.48 | 7.47e-06 | 0.784 | 0.148 | -3.59 | 0.00033 |
b_veh_per_driver_par_act | b_log_density_par_act | 1.13 | 0.0906 | -7.57 | 3.66e-14 | 2 | 0.113 | -6.46 | 1.07e-10 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.0033 | 0.0257 | -4.92 | 8.48e-07 | 0.00494 | 0.031 | -4.09 | 4.3e-05 |
b_veh_per_driver_par_act | b_log_distance_kid_car | -0.0372 | -0.114 | -5.58 | 2.37e-08 | -0.125 | -0.171 | -4.56 | 5.23e-06 |
b_veh_per_driver_par_act | b_log_distance_par_act | 0.000224 | 0.00107 | -4.84 | 1.32e-06 | -0.0232 | -0.0889 | -4 | 6.28e-05 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -0.0271 | -0.036 | -5.36 | 8.18e-08 | -0.103 | -0.101 | -4.42 | 9.99e-06 |
b_veh_per_driver_par_act | b_log_income_k_kid_car | -0.0398 | -0.0731 | -5.54 | 2.98e-08 | -0.146 | -0.151 | -4.51 | 6.47e-06 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -0.404 | -0.286 | -5.2 | 2.01e-07 | -0.539 | -0.312 | -4.42 | 1e-05 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | -0.00335 | -0.00168 | -4.33 | 1.49e-05 | -0.0569 | -0.0239 | -3.71 | 0.000208 |
b_veh_per_driver_par_act | b_non_work_dad_kid_car | -0.0403 | -0.0336 | -5.2 | 2.05e-07 | -0.103 | -0.0692 | -4.34 | 1.44e-05 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 0.306 | 0.0785 | -4.79 | 1.68e-06 | -0.166 | -0.037 | -4.19 | 2.83e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | -0.116 | -0.0691 | -4.55 | 5.31e-06 | -0.389 | -0.139 | -3.57 | 0.000352 |
b_veh_per_driver_par_act | b_non_work_mom_kid_car | -0.423 | -0.111 | -3.18 | 0.00149 | -1.46 | -0.17 | -1.97 | 0.0491 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | 0.0372 | 0.0136 | -6.37 | 1.93e-10 | -0.0472 | -0.0138 | -5.47 | 4.44e-08 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 0.276 | 0.177 | -4.92 | 8.82e-07 | 0.507 | 0.193 | -4.04 | 5.29e-05 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_car | 0.165 | 0.124 | -5.96 | 2.54e-09 | 0.472 | 0.174 | -4.86 | 1.2e-06 |
b_y2017_kid_act | alpha_kid_CAR | -0.011 | -0.0951 | -4.32 | 1.58e-05 | -0.0564 | -0.257 | -3.72 | 0.000199 |
b_y2017_kid_act | asc_kid_act | -0.003 | -0.0123 | 3.19 | 0.00143 | 0.00585 | 0.0226 | 3.18 | 0.00147 |
b_y2017_kid_act | asc_kid_car | -0.0853 | -0.0928 | -0.736 | 0.462 | -0.443 | -0.257 | -0.416 | 0.678 |
b_y2017_kid_act | asc_par_act | -0.0238 | -0.044 | 3.03 | 0.00246 | -0.0138 | -0.0227 | 2.86 | 0.00418 |
b_y2017_kid_act | b_age_kid_act | -0.00595 | -0.0496 | -6.49 | 8.59e-11 | 0.0139 | 0.105 | -6.67 | 2.62e-11 |
b_y2017_kid_act | b_age_kid_car | 0.0396 | 0.0949 | -3.21 | 0.00132 | 0.203 | 0.261 | -2.39 | 0.0168 |
b_y2017_kid_act | b_age_par_act | 0.0108 | 0.042 | 0.372 | 0.71 | 0.0202 | 0.0807 | 0.38 | 0.704 |
b_y2017_kid_act | b_female_kid_act | 0.0178 | 0.0411 | 0.499 | 0.618 | 0.013 | 0.0296 | 0.491 | 0.623 |
b_y2017_kid_act | b_female_kid_car | -0.0487 | -0.079 | -1.35 | 0.177 | -0.277 | -0.245 | -0.817 | 0.414 |
b_y2017_kid_act | b_female_par_act | -0.00942 | -0.0106 | -0.709 | 0.479 | -0.0237 | -0.0262 | -0.7 | 0.484 |
b_y2017_kid_act | b_has_big_sib_kid_act | 0.325 | 0.0667 | -5.33 | 9.8e-08 | 1.11 | 0.201 | -4.79 | 1.66e-06 |
b_y2017_kid_act | b_has_big_sib_kid_car | 1.02 | 0.0909 | -1.07 | 0.287 | 5.32 | 0.26 | -0.59 | 0.555 |
b_y2017_kid_act | b_has_big_sib_par_act | 0.297 | 0.0316 | -0.518 | 0.605 | 0.714 | 0.0742 | -0.511 | 0.61 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 0.0757 | 0.144 | -4.45 | 8.74e-06 | 0.182 | 0.259 | -3.93 | 8.33e-05 |
b_y2017_kid_act | b_has_lil_sib_kid_car | 0.103 | 0.0872 | -2.07 | 0.0381 | 0.561 | 0.251 | -1.18 | 0.236 |
b_y2017_kid_act | b_has_lil_sib_par_act | 0.0377 | 0.0398 | -3.34 | 0.000835 | 0.106 | 0.107 | -3.33 | 0.000868 |
b_y2017_kid_act | b_log_density_kid_act | -0.0876 | -0.0491 | -5.5 | 3.85e-08 | -0.264 | -0.122 | -4.54 | 5.66e-06 |
b_y2017_kid_act | b_log_density_kid_car | 0.0647 | 0.061 | -1.21 | 0.227 | 0.323 | 0.209 | -0.905 | 0.366 |
b_y2017_kid_act | b_log_density_par_act | 0.00847 | 0.00195 | -6.32 | 2.64e-10 | -0.1 | -0.0194 | -5.36 | 8.55e-08 |
b_y2017_kid_act | b_log_distance_kid_act | -0.00105 | -0.0235 | -1.06 | 0.29 | 5.31e-05 | 0.00114 | -1.05 | 0.293 |
b_y2017_kid_act | b_log_distance_kid_car | -0.0118 | -0.103 | -3.01 | 0.00261 | -0.0554 | -0.26 | -2.61 | 0.00903 |
b_y2017_kid_act | b_log_distance_par_act | -0.00752 | -0.103 | -0.818 | 0.413 | -0.00755 | -0.099 | -0.811 | 0.417 |
b_y2017_kid_act | b_log_income_k_kid_act | -0.0127 | -0.0484 | -2.33 | 0.0198 | -0.056 | -0.189 | -2.12 | 0.0342 |
b_y2017_kid_act | b_log_income_k_kid_car | -0.0105 | -0.0553 | -2.88 | 0.00403 | -0.0588 | -0.209 | -2.47 | 0.0137 |
b_y2017_kid_act | b_log_income_k_par_act | -0.0066 | -0.0134 | -2.92 | 0.00348 | -0.03 | -0.0594 | -2.83 | 0.0047 |
b_y2017_kid_act | b_non_work_dad_kid_ace | -0.00717 | -0.0103 | -0.582 | 0.56 | -0.0255 | -0.0367 | -0.579 | 0.562 |
b_y2017_kid_act | b_non_work_dad_kid_car | -0.0116 | -0.0277 | -2 | 0.0458 | -0.0553 | -0.127 | -1.87 | 0.0609 |
b_y2017_kid_act | b_non_work_dad_par_act | -0.0108 | -0.00793 | -1.92 | 0.0554 | -0.061 | -0.0467 | -1.98 | 0.0482 |
b_y2017_kid_act | b_non_work_mom_kid_act | -0.016 | -0.0274 | -0.994 | 0.32 | -0.175 | -0.214 | -0.733 | 0.463 |
b_y2017_kid_act | b_non_work_mom_kid_car | -0.114 | -0.086 | -0.229 | 0.819 | -0.631 | -0.252 | -0.125 | 0.901 |
b_y2017_kid_act | b_non_work_mom_par_act | -0.0171 | -0.0179 | -4.03 | 5.63e-05 | -0.091 | -0.0909 | -3.79 | 0.00015 |
b_y2017_kid_act | b_veh_per_driver_kid_act | 0.0289 | 0.053 | -0.82 | 0.412 | 0.168 | 0.219 | -0.71 | 0.478 |
b_y2017_kid_act | b_veh_per_driver_kid_car | 0.0328 | 0.0706 | -3.16 | 0.00157 | 0.19 | 0.239 | -2.43 | 0.015 |
b_y2017_kid_act | b_veh_per_driver_par_act | 0.00749 | 0.00581 | 4.3 | 1.67e-05 | 0.0905 | 0.0579 | 3.69 | 0.000228 |
b_y2017_kid_car | alpha_kid_CAR | 0.0998 | 0.841 | -2.35 | 0.0188 | 0.36 | 0.949 | -1.49 | 0.136 |
b_y2017_kid_car | asc_kid_act | -0.031 | -0.124 | 5.15 | 2.67e-07 | -0.129 | -0.289 | 3.16 | 0.0016 |
b_y2017_kid_car | asc_kid_car | 0.786 | 0.833 | 0.676 | 0.499 | 2.83 | 0.948 | 0.403 | 0.687 |
b_y2017_kid_car | asc_par_act | 0.00309 | 0.00554 | 4.73 | 2.24e-06 | 0.0109 | 0.0104 | 3.42 | 0.000635 |
b_y2017_kid_car | b_age_kid_act | -0.0343 | -0.279 | -3.69 | 0.000223 | -0.109 | -0.477 | -2.19 | 0.0283 |
b_y2017_kid_car | b_age_kid_car | -0.359 | -0.837 | -0.824 | 0.41 | -1.27 | -0.947 | -0.453 | 0.651 |
b_y2017_kid_car | b_age_par_act | -0.0309 | -0.117 | 2.47 | 0.0135 | -0.108 | -0.25 | 1.56 | 0.12 |
b_y2017_kid_car | b_female_kid_act | 0.0036 | 0.00812 | 2.36 | 0.0183 | -0.0518 | -0.0678 | 1.61 | 0.108 |
b_y2017_kid_car | b_female_kid_car | 0.5 | 0.79 | 0.294 | 0.769 | 1.82 | 0.929 | 0.229 | 0.819 |
b_y2017_kid_car | b_female_par_act | 0.0273 | 0.0298 | 0.474 | 0.635 | 0.0832 | 0.0532 | 0.406 | 0.685 |
b_y2017_kid_car | b_has_big_sib_kid_act | -1.62 | -0.324 | -4.91 | 9.22e-07 | -5.28 | -0.553 | -4.16 | 3.25e-05 |
b_y2017_kid_car | b_has_big_sib_kid_car | -9.48 | -0.824 | -0.926 | 0.355 | -33.4 | -0.942 | -0.51 | 0.61 |
b_y2017_kid_car | b_has_big_sib_par_act | -1.1 | -0.114 | -0.389 | 0.697 | -3.88 | -0.232 | -0.377 | 0.706 |
b_y2017_kid_car | b_has_lil_sib_kid_act | -0.239 | -0.442 | -1.99 | 0.0464 | -0.877 | -0.721 | -1.22 | 0.223 |
b_y2017_kid_car | b_has_lil_sib_kid_car | -0.994 | -0.817 | -0.864 | 0.387 | -3.66 | -0.945 | -0.46 | 0.645 |
b_y2017_kid_car | b_has_lil_sib_par_act | -0.136 | -0.14 | -2.04 | 0.0412 | -0.499 | -0.292 | -1.59 | 0.111 |
b_y2017_kid_car | b_log_density_kid_act | 0.535 | 0.292 | -5.3 | 1.15e-07 | 1.94 | 0.515 | -4.83 | 1.38e-06 |
b_y2017_kid_car | b_log_density_kid_car | -0.516 | -0.473 | -0.134 | 0.893 | -2.15 | -0.804 | -0.0815 | 0.935 |
b_y2017_kid_car | b_log_density_par_act | 0.167 | 0.0374 | -6.07 | 1.29e-09 | 0.626 | 0.07 | -5.15 | 2.61e-07 |
b_y2017_kid_car | b_log_distance_kid_act | -0.0046 | -0.1 | 1.5 | 0.134 | -0.0155 | -0.192 | 0.882 | 0.378 |
b_y2017_kid_car | b_log_distance_kid_car | 0.0959 | 0.821 | -0.667 | 0.505 | 0.348 | 0.944 | -0.423 | 0.673 |
b_y2017_kid_car | b_log_distance_par_act | 0.0015 | 0.0199 | 1.72 | 0.0851 | 0.00974 | 0.0737 | 1.02 | 0.306 |
b_y2017_kid_car | b_log_income_k_kid_act | 0.0563 | 0.209 | -0.119 | 0.905 | 0.236 | 0.46 | -0.082 | 0.935 |
b_y2017_kid_car | b_log_income_k_kid_car | 0.106 | 0.544 | -0.638 | 0.524 | 0.391 | 0.8 | -0.427 | 0.669 |
b_y2017_kid_car | b_log_income_k_par_act | 0.0224 | 0.0443 | -1.18 | 0.236 | 0.091 | 0.104 | -0.884 | 0.377 |
b_y2017_kid_car | b_non_work_dad_kid_ace | 0.0499 | 0.0696 | 0.86 | 0.39 | 0.139 | 0.116 | 0.708 | 0.479 |
b_y2017_kid_car | b_non_work_dad_kid_car | 0.111 | 0.259 | -0.118 | 0.906 | 0.289 | 0.384 | -0.0858 | 0.932 |
b_y2017_kid_car | b_non_work_dad_par_act | 0.0174 | 0.0124 | -1.1 | 0.272 | 0.0546 | 0.0241 | -1.05 | 0.294 |
b_y2017_kid_car | b_non_work_mom_kid_act | 0.314 | 0.523 | 0.84 | 0.401 | 1.11 | 0.784 | 0.834 | 0.404 |
b_y2017_kid_car | b_non_work_mom_kid_car | 1.13 | 0.831 | 0.871 | 0.384 | 4.11 | 0.947 | 0.483 | 0.629 |
b_y2017_kid_car | b_non_work_mom_par_act | 0.167 | 0.171 | -3.14 | 0.00169 | 0.586 | 0.338 | -2.99 | 0.00281 |
b_y2017_kid_car | b_veh_per_driver_kid_act | -0.276 | -0.492 | 0.708 | 0.479 | -1.01 | -0.757 | 0.426 | 0.67 |
b_y2017_kid_car | b_veh_per_driver_kid_car | -0.364 | -0.763 | -0.907 | 0.364 | -1.26 | -0.914 | -0.513 | 0.608 |
b_y2017_kid_car | b_veh_per_driver_par_act | -0.129 | -0.0974 | 4.99 | 5.89e-07 | -0.443 | -0.164 | 3.81 | 0.00014 |
b_y2017_kid_car | b_y2017_kid_act | 0.0348 | 0.0753 | 1.91 | 0.0567 | -0.121 | -0.153 | 1.22 | 0.221 |
b_y2017_par_act | alpha_kid_CAR | -0.00135 | -0.00412 | 13.6 | 0 | -0.0171 | -0.0279 | 13.5 | 0 |
b_y2017_par_act | asc_kid_act | -0.00169 | -0.00244 | 16.3 | 0 | 0.0151 | 0.0209 | 16.4 | 0 |
b_y2017_par_act | asc_kid_car | -0.0112 | -0.0043 | 11.9 | 0 | -0.13 | -0.0269 | 8.7 | 0 |
b_y2017_par_act | asc_par_act | -0.376 | -0.244 | 14.4 | 0 | -0.466 | -0.275 | 14 | 0 |
b_y2017_par_act | b_age_kid_act | -0.000128 | -0.000377 | 12.8 | 0 | 0.00156 | 0.00422 | 12.9 | 0 |
b_y2017_par_act | b_age_kid_car | 0.00584 | 0.00492 | 13.2 | 0 | 0.0607 | 0.028 | 12.1 | 0 |
b_y2017_par_act | b_age_par_act | -0.056 | -0.0764 | 14.9 | 0 | -0.0131 | -0.0188 | 15.2 | 0 |
b_y2017_par_act | b_female_kid_act | 0.0058 | 0.00473 | 14.7 | 0 | -0.00357 | -0.0029 | 14.8 | 0 |
b_y2017_par_act | b_female_kid_car | -0.00518 | -0.00296 | 13 | 0 | -0.0839 | -0.0265 | 10.8 | 0 |
b_y2017_par_act | b_female_par_act | 0.00621 | 0.00245 | 12.1 | 0 | 0.259 | 0.103 | 12.8 | 0 |
b_y2017_par_act | b_has_big_sib_kid_act | 0.0417 | 0.00302 | -1.27 | 0.205 | 0.291 | 0.0188 | -1.14 | 0.255 |
b_y2017_par_act | b_has_big_sib_kid_car | 0.123 | 0.00388 | 0.674 | 0.5 | 1.56 | 0.0273 | 0.374 | 0.708 |
b_y2017_par_act | b_has_big_sib_par_act | 1.61 | 0.0602 | 1.56 | 0.12 | 0.274 | 0.0102 | 1.52 | 0.128 |
b_y2017_par_act | b_has_lil_sib_kid_act | 0.0151 | 0.0101 | 12.1 | 0 | 0.0435 | 0.0221 | 11.6 | 0 |
b_y2017_par_act | b_has_lil_sib_kid_car | 0.0113 | 0.00336 | 9.76 | 0 | 0.165 | 0.0263 | 6.71 | 1.89e-11 |
b_y2017_par_act | b_has_lil_sib_par_act | 0.289 | 0.107 | 10.7 | 0 | 0.301 | 0.109 | 10.6 | 0 |
b_y2017_par_act | b_log_density_kid_act | -0.0722 | -0.0143 | 4.21 | 2.6e-05 | -0.122 | -0.0201 | 3.68 | 0.000229 |
b_y2017_par_act | b_log_density_kid_car | 0.00196 | 0.000649 | 10.9 | 0 | 0.0983 | 0.0228 | 9.24 | 0 |
b_y2017_par_act | b_log_density_par_act | 0.914 | 0.0741 | -1.82 | 0.0689 | -0.469 | -0.0325 | -1.52 | 0.129 |
b_y2017_par_act | b_log_distance_kid_act | -0.000241 | -0.0019 | 14.9 | 0 | 0.00247 | 0.019 | 15 | 0 |
b_y2017_par_act | b_log_distance_kid_car | -0.0018 | -0.00557 | 14.1 | 0 | -0.0172 | -0.0289 | 14 | 0 |
b_y2017_par_act | b_log_distance_par_act | -0.0485 | -0.233 | 14.8 | 0 | -0.0636 | -0.298 | 14.8 | 0 |
b_y2017_par_act | b_log_income_k_kid_act | -0.00302 | -0.00406 | 14 | 0 | -0.0318 | -0.0384 | 13.9 | 0 |
b_y2017_par_act | b_log_income_k_kid_car | -0.00122 | -0.00226 | 14 | 0 | -0.0194 | -0.0245 | 13.9 | 0 |
b_y2017_par_act | b_log_income_k_par_act | -0.033 | -0.0236 | 12.7 | 0 | 0.236 | 0.167 | 13.7 | 0 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.0108 | -0.00548 | 13.1 | 0 | -0.0662 | -0.0341 | 13 | 0 |
b_y2017_par_act | b_non_work_dad_kid_car | -0.00289 | -0.00243 | 13.6 | 0 | -0.0231 | -0.0191 | 13.6 | 0 |
b_y2017_par_act | b_non_work_dad_par_act | 0.128 | 0.0331 | 9.14 | 0 | 0.154 | 0.0421 | 9.45 | 0 |
b_y2017_par_act | b_non_work_mom_kid_act | -0.00328 | -0.00198 | 13.4 | 0 | -0.0566 | -0.0247 | 12.3 | 0 |
b_y2017_par_act | b_non_work_mom_kid_car | -0.0141 | -0.00375 | 10.4 | 0 | -0.19 | -0.0271 | 6.8 | 1.04e-11 |
b_y2017_par_act | b_non_work_mom_par_act | 0.118 | 0.0435 | 9.77 | 0 | 0.276 | 0.0988 | 9.95 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_act | 0.0054 | 0.00349 | 13.7 | 0 | 0.0546 | 0.0255 | 13 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_car | 0.00319 | 0.00242 | 12.9 | 0 | 0.0536 | 0.0241 | 11.9 | 0 |
b_y2017_par_act | b_veh_per_driver_par_act | -0.104 | -0.0284 | 13.8 | 0 | 0.303 | 0.0693 | 13.1 | 0 |
b_y2017_par_act | b_y2017_kid_act | 0.194 | 0.152 | 15.2 | 0 | 0.188 | 0.147 | 15.2 | 0 |
b_y2017_par_act | b_y2017_kid_car | 0.0329 | 0.0251 | 13.6 | 0 | -0.0204 | -0.0092 | 12.3 | 0 |
mu_motor | alpha_kid_CAR | 0.68 | 0.984 | 0.703 | 0.482 | 2.42 | 0.996 | 0.377 | 0.706 |
mu_motor | asc_kid_act | -0.148 | -0.102 | 2.02 | 0.0436 | -0.804 | -0.281 | 1.08 | 0.281 |
mu_motor | asc_kid_car | 5.44 | 0.988 | 1.72 | 0.0847 | 19 | 0.997 | 0.927 | 0.354 |
mu_motor | asc_par_act | 0.0615 | 0.0189 | 2.21 | 0.0272 | 0.117 | 0.0174 | 1.2 | 0.232 |
mu_motor | b_age_kid_act | -0.263 | -0.366 | 0.293 | 0.769 | -0.77 | -0.525 | 0.158 | 0.875 |
mu_motor | b_age_kid_car | -2.46 | -0.985 | 0.64 | 0.522 | -8.56 | -0.996 | 0.343 | 0.732 |
mu_motor | b_age_par_act | -0.233 | -0.151 | 1.48 | 0.14 | -0.752 | -0.271 | 0.795 | 0.427 |
mu_motor | b_female_kid_act | 0.032 | 0.0124 | 1.53 | 0.126 | -0.339 | -0.0695 | 0.821 | 0.412 |
mu_motor | b_female_kid_car | 3.4 | 0.922 | 1.31 | 0.191 | 12.3 | 0.978 | 0.71 | 0.478 |
mu_motor | b_female_par_act | 0.201 | 0.0376 | 1.12 | 0.261 | 0.594 | 0.0593 | 0.624 | 0.533 |
mu_motor | b_has_big_sib_kid_act | -11.4 | -0.393 | -3.43 | 0.000599 | -35.9 | -0.587 | -2.35 | 0.0185 |
mu_motor | b_has_big_sib_kid_car | -65.2 | -0.972 | -0.582 | 0.561 | -225 | -0.991 | -0.318 | 0.75 |
mu_motor | b_has_big_sib_par_act | -7.83 | -0.139 | -0.0992 | 0.921 | -26.3 | -0.247 | -0.0849 | 0.932 |
mu_motor | b_has_lil_sib_kid_act | -1.68 | -0.532 | 0.335 | 0.738 | -5.91 | -0.761 | 0.18 | 0.857 |
mu_motor | b_has_lil_sib_kid_car | -6.92 | -0.976 | 0.34 | 0.734 | -24.6 | -0.994 | 0.181 | 0.856 |
mu_motor | b_has_lil_sib_par_act | -0.966 | -0.171 | 0.138 | 0.891 | -3.42 | -0.312 | 0.0763 | 0.939 |
mu_motor | b_log_density_kid_act | 3.64 | 0.341 | -2.38 | 0.0171 | 13 | 0.542 | -1.5 | 0.135 |
mu_motor | b_log_density_kid_car | -3.39 | -0.534 | 0.74 | 0.46 | -14.3 | -0.838 | 0.393 | 0.694 |
mu_motor | b_log_density_par_act | 1.15 | 0.0441 | -4.74 | 2.15e-06 | 4.13 | 0.0721 | -3.43 | 0.000596 |
mu_motor | b_log_distance_kid_act | -0.0187 | -0.0699 | 1.26 | 0.209 | -0.0941 | -0.182 | 0.672 | 0.502 |
mu_motor | b_log_distance_kid_car | 0.658 | 0.967 | 0.942 | 0.346 | 2.34 | 0.993 | 0.505 | 0.614 |
mu_motor | b_log_distance_par_act | 0.0207 | 0.0473 | 1.3 | 0.195 | 0.0737 | 0.0872 | 0.694 | 0.488 |
mu_motor | b_log_income_k_kid_act | 0.379 | 0.241 | 0.993 | 0.321 | 1.58 | 0.481 | 0.536 | 0.592 |
mu_motor | b_log_income_k_kid_car | 0.713 | 0.628 | 0.943 | 0.346 | 2.67 | 0.854 | 0.507 | 0.612 |
mu_motor | b_log_income_k_par_act | 0.154 | 0.052 | 0.7 | 0.484 | 0.614 | 0.11 | 0.38 | 0.704 |
mu_motor | b_non_work_dad_kid_ace | 0.348 | 0.0833 | 1.24 | 0.215 | 0.95 | 0.124 | 0.677 | 0.498 |
mu_motor | b_non_work_dad_kid_car | 0.727 | 0.29 | 1.01 | 0.314 | 1.91 | 0.397 | 0.537 | 0.591 |
mu_motor | b_non_work_dad_par_act | 0.126 | 0.0154 | 0.37 | 0.712 | 0.391 | 0.027 | 0.215 | 0.83 |
mu_motor | b_non_work_mom_kid_act | 2.17 | 0.621 | 1.31 | 0.189 | 7.51 | 0.827 | 0.713 | 0.476 |
mu_motor | b_non_work_mom_kid_car | 7.76 | 0.978 | 2.49 | 0.0129 | 27.6 | 0.994 | 1.38 | 0.169 |
mu_motor | b_non_work_mom_par_act | 1.17 | 0.205 | -0.157 | 0.875 | 4.01 | 0.362 | -0.0882 | 0.93 |
mu_motor | b_veh_per_driver_kid_act | -1.87 | -0.574 | 1.09 | 0.278 | -6.75 | -0.795 | 0.584 | 0.559 |
mu_motor | b_veh_per_driver_kid_car | -2.49 | -0.895 | 0.607 | 0.544 | -8.46 | -0.961 | 0.327 | 0.744 |
mu_motor | b_veh_per_driver_par_act | -0.879 | -0.114 | 3.12 | 0.00178 | -2.97 | -0.171 | 1.77 | 0.0773 |
mu_motor | b_y2017_kid_act | -0.213 | -0.0792 | 1.4 | 0.162 | -1.26 | -0.248 | 0.749 | 0.454 |
mu_motor | b_y2017_kid_car | 2.34 | 0.846 | 1.16 | 0.247 | 8.34 | 0.951 | 0.626 | 0.532 |
mu_motor | b_y2017_par_act | -0.0183 | -0.0024 | -5.25 | 1.49e-07 | -0.361 | -0.0255 | -3 | 0.00266 |
mu_no_parent | alpha_kid_CAR | -0.0214 | -0.117 | 2.96 | 0.00303 | -0.0492 | -0.148 | 2.91 | 0.00364 |
mu_no_parent | asc_kid_act | 0.0274 | 0.0706 | 7.96 | 1.78e-15 | 0.0445 | 0.114 | 8.32 | 0 |
mu_no_parent | asc_kid_car | -0.173 | -0.118 | 2.81 | 0.00496 | -0.357 | -0.137 | 1.79 | 0.073 |
mu_no_parent | asc_par_act | 0.0123 | 0.0142 | 7.2 | 6.04e-13 | 0.012 | 0.0131 | 7.07 | 1.54e-12 |
mu_no_parent | b_age_kid_act | 0.00813 | 0.0427 | 1.64 | 0.102 | 0.0226 | 0.113 | 1.72 | 0.086 |
mu_no_parent | b_age_kid_car | 0.0743 | 0.112 | 3 | 0.0027 | 0.159 | 0.135 | 2.46 | 0.014 |
mu_no_parent | b_age_par_act | 0.00323 | 0.00788 | 5.84 | 5.25e-09 | 0.0109 | 0.0286 | 6.11 | 1.01e-09 |
mu_no_parent | b_female_kid_act | 0.0675 | 0.0985 | 5.69 | 1.26e-08 | 0.122 | 0.182 | 6.1 | 1.08e-09 |
mu_no_parent | b_female_kid_car | -0.125 | -0.128 | 3.16 | 0.00158 | -0.273 | -0.159 | 2.25 | 0.0245 |
mu_no_parent | b_female_par_act | 0.0191 | 0.0135 | 3.1 | 0.00191 | 0.0385 | 0.0281 | 3.16 | 0.00156 |
mu_no_parent | b_has_big_sib_kid_act | 0.657 | 0.085 | -4.46 | 8.28e-06 | 1.01 | 0.121 | -3.98 | 6.78e-05 |
mu_no_parent | b_has_big_sib_kid_car | 1.72 | 0.0964 | -0.688 | 0.492 | 3.79 | 0.122 | -0.379 | 0.704 |
mu_no_parent | b_has_big_sib_par_act | 0.301 | 0.0201 | -0.0671 | 0.946 | 0.555 | 0.038 | -0.0662 | 0.947 |
mu_no_parent | b_has_lil_sib_kid_act | 0.0108 | 0.0129 | 1.56 | 0.118 | -0.00938 | -0.00882 | 1.4 | 0.161 |
mu_no_parent | b_has_lil_sib_kid_car | 0.229 | 0.122 | 1.29 | 0.197 | 0.488 | 0.144 | 0.756 | 0.45 |
mu_no_parent | b_has_lil_sib_par_act | 0.0157 | 0.0105 | 0.666 | 0.505 | 0.0238 | 0.0159 | 0.661 | 0.508 |
mu_no_parent | b_log_density_kid_act | -0.776 | -0.274 | -2.86 | 0.0042 | -1.24 | -0.376 | -2.4 | 0.0162 |
mu_no_parent | b_log_density_kid_car | 0.182 | 0.108 | 2.37 | 0.018 | 0.452 | 0.193 | 1.85 | 0.0645 |
mu_no_parent | b_log_density_par_act | -0.285 | -0.0413 | -5.27 | 1.36e-07 | -0.407 | -0.052 | -4.49 | 7.2e-06 |
mu_no_parent | b_log_distance_kid_act | -0.00331 | -0.0465 | 5.23 | 1.69e-07 | 0.00319 | 0.0451 | 5.47 | 4.61e-08 |
mu_no_parent | b_log_distance_kid_car | -0.0124 | -0.0683 | 3.84 | 0.000125 | -0.0409 | -0.127 | 3.77 | 0.000165 |
mu_no_parent | b_log_distance_par_act | 0.000367 | 0.00315 | 5.37 | 7.83e-08 | 0.00396 | 0.0342 | 5.6 | 2.2e-08 |
mu_no_parent | b_log_income_k_kid_act | 0.0346 | 0.083 | 4.05 | 5.2e-05 | 0.0576 | 0.129 | 4.21 | 2.58e-05 |
mu_no_parent | b_log_income_k_kid_car | -0.0276 | -0.0916 | 3.71 | 0.000208 | -0.0797 | -0.186 | 3.55 | 0.000382 |
mu_no_parent | b_log_income_k_par_act | 0.0119 | 0.0151 | 2.63 | 0.00845 | 0.0245 | 0.0321 | 2.71 | 0.00667 |
mu_no_parent | b_non_work_dad_kid_ace | -0.111 | -0.1 | 3.58 | 0.000344 | -0.199 | -0.19 | 3.53 | 0.000411 |
mu_no_parent | b_non_work_dad_kid_car | 0.0144 | 0.0217 | 3.65 | 0.000267 | 0.00491 | 0.00746 | 3.7 | 0.000217 |
mu_no_parent | b_non_work_dad_par_act | -0.0292 | -0.0135 | 0.958 | 0.338 | -0.0482 | -0.0243 | 0.999 | 0.318 |
mu_no_parent | b_non_work_mom_kid_act | -0.0188 | -0.0202 | 3.75 | 0.00018 | -0.0887 | -0.0713 | 3.17 | 0.00153 |
mu_no_parent | b_non_work_mom_kid_car | -0.263 | -0.125 | 2.47 | 0.0137 | -0.55 | -0.145 | 1.46 | 0.144 |
mu_no_parent | b_non_work_mom_par_act | -0.0207 | -0.0137 | -0.0383 | 0.969 | -0.0642 | -0.0423 | -0.0373 | 0.97 |
mu_no_parent | b_veh_per_driver_kid_act | 0.076 | 0.0877 | 4.27 | 1.98e-05 | 0.181 | 0.155 | 3.89 | 9.88e-05 |
mu_no_parent | b_veh_per_driver_kid_car | 0.0832 | 0.113 | 2.81 | 0.00501 | 0.163 | 0.135 | 2.33 | 0.02 |
mu_no_parent | b_veh_per_driver_par_act | 0.0424 | 0.0207 | 6.91 | 4.7e-12 | 0.0723 | 0.0305 | 6.02 | 1.76e-09 |
mu_no_parent | b_y2017_kid_act | -0.0949 | -0.133 | 4.74 | 2.13e-06 | -0.09 | -0.13 | 4.86 | 1.18e-06 |
mu_no_parent | b_y2017_kid_car | -0.0535 | -0.0729 | 3.48 | 0.000509 | -0.139 | -0.116 | 2.77 | 0.0056 |
mu_no_parent | b_y2017_par_act | -0.0324 | -0.016 | -10.4 | 0 | -0.0178 | -0.00919 | -10.6 | 0 |
mu_no_parent | mu_motor | -0.633 | -0.148 | 0.129 | 0.897 | -1.17 | -0.152 | 0.0722 | 0.942 |
Smallest eigenvalue: 0.00302186
+Largest eigenvalue: 10192.6
+Condition number: 3.37296e+06
+ \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/cross-nest-reduced/cross_nest.pickle b/models/IATBR plan/4 alternatives/cross-nest-reduced/cross_nest.pickle new file mode 100644 index 0000000..8bc0f0e Binary files /dev/null and b/models/IATBR plan/4 alternatives/cross-nest-reduced/cross_nest.pickle differ diff --git a/models/IATBR plan/4 alternatives/cross-nest/__cross_nest.iter b/models/IATBR plan/4 alternatives/cross-nest/__cross_nest.iter new file mode 100644 index 0000000..5b2125e --- /dev/null +++ b/models/IATBR plan/4 alternatives/cross-nest/__cross_nest.iter @@ -0,0 +1,44 @@ +alpha_KID_act = 0.6191585315281732 +alpha_PAR_act = 0.5777790600384894 +alpha_kid_CAR = 0.2930039784760302 +alpha_par_CAR = 0.08692622357353158 +asc_kid_act = -3.889017943063292 +asc_kid_car = -2.6026265173237246 +asc_par_act = -3.372688388781083 +b_age_kid_act = 1.866977024171454 +b_age_kid_car = 1.0355114639173457 +b_age_par_act = -0.6381766681173009 +b_female_kid_act = -2.2656069172581215 +b_female_kid_car = -1.0067803698340931 +b_female_par_act = -1.0653119694412483 +b_has_big_sib_kid_act = 30.60945650012244 +b_has_big_sib_kid_car = 19.479197438753353 +b_has_big_sib_par_act = 8.423478993439964 +b_has_lil_sib_kid_act = 1.7028614396602624 +b_has_lil_sib_kid_car = 1.4574370228634645 +b_has_lil_sib_par_act = 1.698214742662255 +b_log_density_kid_act = 10.70589500718372 +b_log_density_kid_car = 1.4436232926713397 +b_log_density_par_act = 21.59940213456242 +b_log_distance_kid_act = -1.3423575545238415 +b_log_distance_kid_car = -0.5263317526107159 +b_log_distance_par_act = -1.1165074929882657 +b_log_income_k_kid_act = -0.16095836262477645 +b_log_income_k_kid_car = 0.0015574434376423498 +b_log_income_k_par_act = 0.008943838683934242 +b_non_work_dad_kid_ace = -1.3260646419346913 +b_non_work_dad_kid_car = -1.261766297505716 +b_non_work_dad_par_act = 0.5852419254079576 +b_non_work_mom_kid_act = -1.5097792229838267 +b_non_work_mom_kid_car = -2.3211210345383164 +b_non_work_mom_par_act = 1.2411645602090322 +b_veh_per_driver_kid_act = -1.5742056489495215 +b_veh_per_driver_kid_car = 0.05494159665956505 +b_veh_per_driver_par_act = -4.29324625929591 +b_y2017_kid_act = -1.0445403641049333 +b_y2017_kid_car = -0.7543412062140129 +b_y2017_par_act = 11.553832827691277 +mu_active = 7.052133359995079 +mu_motor = 152.3027766610482 +mu_no_parent = 5.399279360375354 +mu_parent = 1.9572576250779823 diff --git a/models/IATBR plan/4 alternatives/cross-nest/biogeme.toml b/models/IATBR plan/4 alternatives/cross-nest/biogeme.toml new file mode 100644 index 0000000..0902580 --- /dev/null +++ b/models/IATBR plan/4 alternatives/cross-nest/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on April 08, 2024. 16:34:04 + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 10000 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + diff --git a/models/IATBR plan/4 alternatives/cross-nest/cross-nest4.py b/models/IATBR plan/4 alternatives/cross-nest/cross-nest4.py new file mode 100644 index 0000000..dddb032 --- /dev/null +++ b/models/IATBR plan/4 alternatives/cross-nest/cross-nest4.py @@ -0,0 +1,245 @@ +# Cross-nested model + + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable +from biogeme.nests import OneNestForCrossNestedLogit, NestsForCrossNestedLogit + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips_sc3.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +veh_per_driver = Variable('sc3_veh_per_driver') +non_work_mom = Variable('sc3_non_work_mom') +non_work_dad = Variable('sc3_non_work_dad') +age = Variable('sc3_age') +female = Variable('sc3_female') +has_lil_sib = Variable('sc3_has_lil_sib') +has_big_sib = Variable('sc3_has_big_sib') +log_income_k = Variable('sc3_log_inc_k') +log_distance = Variable('log_distance') +log_density = Variable('sc3_log_density') +y2017 = Variable('sc3_y2017') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_car = Variable('av_kid_car') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car with parent is reference case) +asc_par_car = Beta('asc_par_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_car = Beta('asc_kid_car', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_par_car = Beta('b_log_income_k_par_car', 0, None, None, 1) +b_veh_per_driver_par_car = Beta('b_veh_per_driver_par_car', 0, None, None, 1) +b_non_work_mom_par_car = Beta('b_non_work_mom_par_car', 0, None, None, 1) +b_non_work_dad_par_car = Beta('b_non_work_dad_par_car', 0, None, None, 1) + +b_age_par_car = Beta('b_age_par_car', 0, None, None, 1) +b_female_par_car = Beta('b_female_par_car', 0, None, None, 1) +b_has_lil_sib_par_car = Beta('b_has_lil_sib_par_car', 0, None, None, 1) +b_has_big_sib_par_car = Beta('b_has_big_sib_par_car', 0, None, None, 1) + +b_log_distance_par_car = Beta('b_log_distance_par_car', 0, None, None, 1) +b_log_density_par_car = Beta('b_log_density_par_car', 0, None, None, 1) +b_y2017_par_car = Beta('b_y2017_par_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for with kid car +b_log_income_k_kid_car = Beta('b_log_income_k_kid_car', 0, None, None, 0) +b_veh_per_driver_kid_car = Beta('b_veh_per_driver_kid_car', 0, None, None, 0) +b_non_work_mom_kid_car = Beta('b_non_work_mom_kid_car', 0, None, None, 0) +b_non_work_dad_kid_car = Beta('b_non_work_dad_kid_car', 0, None, None, 0) + +b_age_kid_car = Beta('b_age_kid_car', 0, None, None, 0) +b_female_kid_car = Beta('b_female_kid_car', 0, None, None, 0) +b_has_lil_sib_kid_car = Beta('b_has_lil_sib_kid_car', 0, None, None, 0) +b_has_big_sib_kid_car = Beta('b_has_big_sib_kid_car', 0, None, None, 0) + +b_log_distance_kid_car = Beta('b_log_distance_kid_car', 0, None, None, 0) +b_log_density_kid_car = Beta('b_log_density_kid_car', 0, None, None, 0) +b_y2017_kid_car = Beta('b_y2017_kid_car', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# MU parameters for nests +mu_parent = Beta('mu_parent', 1, 1, None, 0) +mu_no_parent = Beta('mu_no_parent', 1, 1, None, 0) +mu_motor = Beta('mu_motor', 1, 1, None, 0) +mu_active = Beta('mu_active', 1, 1, None, 0) + +# nest membership parameters +alpha_par_CAR = Beta('alpha_par_CAR', 0.5, 0, 1, 0) +alpha_PAR_car = 1 - alpha_par_CAR + +alpha_kid_CAR = Beta('alpha_kid_CAR', 0.5, 0, 1, 0) +alpha_KID_car = 1 - alpha_kid_CAR + +alpha_PAR_act = Beta('alpha_PAR_act', 0.5, 0, 1, 0) +alpha_par_ACT = 1 - alpha_PAR_act + +alpha_KID_act = Beta('alpha_KID_act', 0.5, 0, 1, 0) +alpha_kid_ACT = 1 - alpha_KID_act + +# Definition of utility functions +V_par_car = ( + asc_par_car + + b_log_income_k_par_car * log_income_k + + b_veh_per_driver_par_car * veh_per_driver + + b_non_work_mom_par_car * non_work_mom + + b_non_work_dad_par_car * non_work_dad + + b_age_par_car * age + + b_female_par_car * female + + b_has_lil_sib_par_car * has_lil_sib + + b_has_big_sib_par_car * has_big_sib + + b_log_distance_par_car * log_distance + + b_log_density_par_car * log_density + + b_y2017_par_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_income_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_car = ( + asc_kid_car + + b_log_income_k_kid_car * log_income_k + + b_veh_per_driver_kid_car * veh_per_driver + + b_non_work_mom_kid_car * non_work_mom + + b_non_work_dad_kid_car * non_work_dad + + b_age_kid_car * age + + b_female_kid_car * female + + b_has_lil_sib_kid_car * has_lil_sib + + b_has_big_sib_kid_car * has_big_sib + + b_log_distance_kid_car * log_distance + + b_log_density_kid_car * log_density + + b_y2017_kid_car * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_income_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {17: V_par_car, + 18: V_par_act, + 27: V_kid_car, + 28: V_kid_act} + +# associate availability conditions with alternatives: + +av = {17: av_par_car, + 18: av_par_act, + 27: av_kid_car, + 28: av_kid_act} + +# Definition of nests +par_nest = OneNestForCrossNestedLogit( + nest_param=mu_parent, + dict_of_alpha={17: alpha_PAR_car, + 18: alpha_PAR_act}, + name='parent' +) + +kid_nest = OneNestForCrossNestedLogit( + nest_param=mu_no_parent, + dict_of_alpha={27: alpha_KID_car, + 28: alpha_KID_act}, + name='kid' +) + +active_nest = OneNestForCrossNestedLogit( + nest_param=mu_active, + dict_of_alpha={18: alpha_par_ACT, + 28: alpha_kid_ACT}, + name='active' +) + +motor_nest = OneNestForCrossNestedLogit( + nest_param=mu_motor, + dict_of_alpha={17: alpha_par_CAR, + 27: alpha_kid_CAR}, + name='motor' +) + +nests = NestsForCrossNestedLogit( + choice_set=[17, 18, 27, 28], + tuple_of_nests=(par_nest, + kid_nest, + active_nest, + motor_nest) +) + +# Define model +cross_nest = models.logcnl(V, av, nests, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, cross_nest) +the_biogeme.modelName = 'cross_nest' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/cross-nest/cross_nest.html b/models/IATBR plan/4 alternatives/cross-nest/cross_nest.html new file mode 100644 index 0000000..b8f1319 --- /dev/null +++ b/models/IATBR plan/4 alternatives/cross-nest/cross_nest.html @@ -0,0 +1,1058 @@ + + + + +biogeme 3.2.13 [2024-04-09]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-09 11:20:25.103881
+Report file: | cross_nest.html |
Database name: | est |
Number of estimated parameters: | 44 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -6806.705 |
Final log likelihood: | -4192.759 |
Likelihood ratio test for the init. model: | 5227.893 |
Rho-square for the init. model: | 0.384 |
Rho-square-bar for the init. model: | 0.378 |
Akaike Information Criterion: | 8473.517 |
Bayesian Information Criterion: | 8759.475 |
Final gradient norm: | 7.7221E+00 |
Nbr of threads: | 12 |
Cause of termination: | Relative change = 4.03e-06 <= 1e-05 |
Number of function evaluations: | 618 |
Number of gradient evaluations: | 448 |
Number of hessian evaluations: | 447 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 617 |
Proportion of Hessian calculation: | 447/447 = 100.0% |
Optimization time: | 1:55:40.689749 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
alpha_KID_act | 0.619 | 0.216 | 2.87 | 0.00417 |
alpha_PAR_act | 0.578 | 0.332 | 1.74 | 0.0814 |
alpha_kid_CAR | 0.293 | 0.0457 | 6.41 | 1.44e-10 |
alpha_par_CAR | 0.0869 | 0.00114 | 76.2 | 0 |
asc_kid_act | -3.89 | 0.282 | -13.8 | 0 |
asc_kid_car | -2.6 | 0.211 | -12.4 | 0 |
asc_par_act | -3.37 | 0.691 | -4.88 | 1.06e-06 |
b_age_kid_act | 1.87 | 0.141 | 13.3 | 0 |
b_age_kid_car | 1.04 | 0.163 | 6.36 | 2.08e-10 |
b_age_par_act | -0.638 | 0.352 | -1.81 | 0.0695 |
b_female_kid_act | -2.27 | 0.442 | -5.13 | 2.97e-07 |
b_female_kid_car | -1.01 | 0.171 | -5.87 | 4.29e-09 |
b_female_par_act | -1.07 | 0.996 | -1.07 | 0.285 |
b_has_big_sib_kid_act | 30.6 | 4.95 | 6.18 | 6.38e-10 |
b_has_big_sib_kid_car | 19.5 | 3.4 | 5.73 | 1.03e-08 |
b_has_big_sib_par_act | 8.42 | 14.4 | 0.584 | 0.559 |
b_has_lil_sib_kid_act | 1.7 | 0.443 | 3.85 | 0.00012 |
b_has_lil_sib_kid_car | 1.46 | 0.239 | 6.11 | 9.93e-10 |
b_has_lil_sib_par_act | 1.7 | 1.2 | 1.41 | 0.158 |
b_log_density_kid_act | 10.7 | 2.67 | 4.01 | 5.96e-05 |
b_log_density_kid_car | 1.44 | 0.335 | 4.31 | 1.62e-05 |
b_log_density_par_act | 21.6 | 3.45 | 6.27 | 3.71e-10 |
b_log_distance_kid_act | -1.34 | 0.0985 | -13.6 | 0 |
b_log_distance_kid_car | -0.526 | 0.0819 | -6.43 | 1.3e-10 |
b_log_distance_par_act | -1.12 | 0.46 | -2.43 | 0.0152 |
b_log_income_k_kid_act | -0.161 | 0.23 | -0.701 | 0.484 |
b_log_income_k_kid_car | 0.00156 | 0.0355 | 0.0439 | 0.965 |
b_log_income_k_par_act | 0.00894 | 0.395 | 0.0227 | 0.982 |
b_non_work_dad_kid_ace | -1.33 | 0.729 | -1.82 | 0.0689 |
b_non_work_dad_kid_car | -1.26 | 0.219 | -5.76 | 8.26e-09 |
b_non_work_dad_par_act | 0.585 | 1.32 | 0.443 | 0.658 |
b_non_work_mom_kid_act | -1.51 | 0.55 | -2.74 | 0.00608 |
b_non_work_mom_kid_car | -2.32 | 0.384 | -6.04 | 1.53e-09 |
b_non_work_mom_par_act | 1.24 | 0.72 | 1.72 | 0.0845 |
b_veh_per_driver_kid_act | -1.57 | 0.498 | -3.16 | 0.00156 |
b_veh_per_driver_kid_car | 0.0549 | 0.0454 | 1.21 | 0.226 |
b_veh_per_driver_par_act | -4.29 | 2.03 | -2.12 | 0.0341 |
b_y2017_kid_act | -1.04 | 0.749 | -1.4 | 0.163 |
b_y2017_kid_car | -0.754 | 0.145 | -5.2 | 1.99e-07 |
b_y2017_par_act | 11.6 | 2.91 | 3.97 | 7.31e-05 |
mu_active | 7.05 | 13 | 0.541 | 0.589 |
mu_motor | 152 | 0.791 | 193 | 0 |
mu_no_parent | 5.4 | 1.16 | 4.67 | 3.02e-06 |
mu_parent | 1.96 | 0.948 | 2.06 | 0.0389 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
alpha_PAR_act | alpha_KID_act | 0.0121 | 1.8e+308 | -0.508 | 0.611 | 0.0667 | 0.931 | -0.271 | 0.786 |
alpha_kid_CAR | alpha_KID_act | -0.00229 | 1.8e+308 | -2.53 | 0.0114 | -0.00924 | -0.936 | -1.26 | 0.209 |
alpha_kid_CAR | alpha_PAR_act | -0.00234 | 1.8e+308 | -1.82 | 0.0695 | -0.0129 | -0.851 | -0.767 | 0.443 |
alpha_par_CAR | alpha_KID_act | 1.01e-05 | 1.8e+308 | -4.99 | 6.14e-07 | 5.58e-05 | 0.227 | -2.47 | 0.0137 |
alpha_par_CAR | alpha_PAR_act | 1.87e-05 | 1.8e+308 | -3.54 | 0.000407 | 0.0001 | 0.264 | -1.48 | 0.138 |
alpha_par_CAR | alpha_kid_CAR | -2.01e-05 | 1.8e+308 | -8.07 | 6.66e-16 | -1.52e-06 | -0.0291 | -4.5 | 6.64e-06 |
asc_kid_act | alpha_KID_act | 0.0015 | 1.8e+308 | -16.4 | 0 | 0.0215 | 0.353 | -15.6 | 0 |
asc_kid_act | alpha_PAR_act | 0.00451 | 1.8e+308 | -16.1 | 0 | 0.0368 | 0.393 | -13.1 | 0 |
asc_kid_act | alpha_kid_CAR | -0.00157 | 1.8e+308 | -15.7 | 0 | -0.00593 | -0.459 | -13.7 | 0 |
asc_kid_act | alpha_par_CAR | 4.64e-05 | 1.8e+308 | -15.4 | 0 | 5.95e-05 | 0.185 | -14.1 | 0 |
asc_kid_car | alpha_KID_act | 0.00402 | 1.8e+308 | -15.7 | 0 | 0.0206 | 0.453 | -14.4 | 0 |
asc_kid_car | alpha_PAR_act | 0.004 | 1.8e+308 | -14.2 | 0 | 0.03 | 0.43 | -10.4 | 0 |
asc_kid_car | alpha_kid_CAR | 0.000142 | 1.8e+308 | -14.7 | 0 | -0.00266 | -0.277 | -12.7 | 0 |
asc_kid_car | alpha_par_CAR | 4.57e-05 | 1.8e+308 | -13.7 | 0 | 0.000199 | 0.828 | -12.8 | 0 |
asc_kid_car | asc_kid_act | 0.0135 | 1.8e+308 | 4.59 | 4.42e-06 | 0.0169 | 0.284 | 4.28 | 1.88e-05 |
asc_par_act | alpha_KID_act | 0.00877 | 1.8e+308 | -8.63 | 0 | 0.0885 | 0.592 | -6.77 | 1.26e-11 |
asc_par_act | alpha_PAR_act | 0.0312 | 1.8e+308 | -9.39 | 0 | 0.177 | 0.772 | -8.17 | 2.22e-16 |
asc_par_act | alpha_kid_CAR | -0.00255 | 1.8e+308 | -7.72 | 1.2e-14 | -0.018 | -0.571 | -5.1 | 3.32e-07 |
asc_par_act | alpha_par_CAR | 6.55e-05 | 1.8e+308 | -7.38 | 1.6e-13 | 0.000184 | 0.233 | -5.01 | 5.5e-07 |
asc_par_act | asc_kid_act | 0.0572 | 1.8e+308 | 1.24 | 0.214 | 0.112 | 0.574 | 0.894 | 0.371 |
asc_par_act | asc_kid_car | 0.0113 | 1.8e+308 | -1.58 | 0.113 | 0.0457 | 0.314 | -1.17 | 0.241 |
b_age_kid_act | alpha_KID_act | 0.00329 | 1.8e+308 | 8.34 | 0 | 0.00608 | 0.2 | 5.35 | 8.67e-08 |
b_age_kid_act | alpha_PAR_act | 0.00238 | 1.8e+308 | 7.19 | 6.42e-13 | 0.00505 | 0.108 | 3.73 | 0.000194 |
b_age_kid_act | alpha_kid_CAR | -0.000491 | 1.8e+308 | 11.4 | 0 | -0.00092 | -0.143 | 10.2 | 0 |
b_age_kid_act | alpha_par_CAR | -3.75e-05 | 1.8e+308 | 13.4 | 0 | -5.18e-05 | -0.323 | 12.6 | 0 |
b_age_kid_act | asc_kid_act | -0.0217 | 1.8e+308 | 16.1 | 0 | -0.0224 | -0.563 | 15.1 | 0 |
b_age_kid_act | asc_kid_car | -0.0107 | 1.8e+308 | 16 | 0 | -0.0081 | -0.273 | 15.8 | 0 |
b_age_kid_act | asc_par_act | -0.016 | 1.8e+308 | 10.1 | 0 | -0.0165 | -0.169 | 7.19 | 6.26e-13 |
b_age_kid_car | alpha_KID_act | 0.0032 | 1.8e+308 | 2.47 | 0.0134 | 0.0102 | 0.289 | 1.81 | 0.0702 |
b_age_kid_car | alpha_PAR_act | 0.0036 | 1.8e+308 | 2.43 | 0.015 | 0.0138 | 0.256 | 1.39 | 0.165 |
b_age_kid_car | alpha_kid_CAR | -0.00185 | 1.8e+308 | 4.47 | 7.9e-06 | -0.00365 | -0.49 | 3.92 | 8.97e-05 |
b_age_kid_car | alpha_par_CAR | -4.38e-05 | 1.8e+308 | 6.2 | 5.49e-10 | -0.000133 | -0.714 | 5.79 | 6.91e-09 |
b_age_kid_car | asc_kid_act | -0.00349 | 1.8e+308 | 15.8 | 0 | 0.00424 | 0.0922 | 15.7 | 0 |
b_age_kid_car | asc_kid_car | -0.0253 | 1.8e+308 | 10.8 | 0 | -0.0238 | -0.693 | 10.6 | 0 |
b_age_kid_car | asc_par_act | 0.000757 | 1.8e+308 | 8.97 | 0 | 0.0178 | 0.158 | 6.44 | 1.2e-10 |
b_age_kid_car | b_age_kid_act | 0.00923 | 1.8e+308 | -5.55 | 2.81e-08 | 0.00821 | 0.358 | -4.81 | 1.54e-06 |
b_age_par_act | alpha_KID_act | -0.00414 | 1.8e+308 | -4.19 | 2.8e-05 | 0.036 | 0.473 | -4.01 | 6.11e-05 |
b_age_par_act | alpha_PAR_act | 0.00122 | 1.8e+308 | -4.12 | 3.85e-05 | 0.0704 | 0.604 | -3.99 | 6.54e-05 |
b_age_par_act | alpha_kid_CAR | 0.000654 | 1.8e+308 | -3.53 | 0.00042 | -0.00693 | -0.431 | -2.49 | 0.0127 |
b_age_par_act | alpha_par_CAR | 1.84e-05 | 1.8e+308 | -2.73 | 0.00625 | 9.78e-05 | 0.244 | -2.06 | 0.039 |
b_age_par_act | asc_kid_act | 0.00415 | 1.8e+308 | 9.05 | 0 | 0.0298 | 0.301 | 8.58 | 0 |
b_age_par_act | asc_kid_car | 0.000792 | 1.8e+308 | 5.99 | 2.08e-09 | 0.0204 | 0.275 | 5.51 | 3.65e-08 |
b_age_par_act | asc_par_act | -0.00717 | 1.8e+308 | 4.95 | 7.27e-07 | 0.112 | 0.461 | 4.45 | 8.47e-06 |
b_age_par_act | b_age_kid_act | -0.00349 | 1.8e+308 | -8.13 | 4.44e-16 | -0.00426 | -0.086 | -6.43 | 1.31e-10 |
b_age_par_act | b_age_kid_car | -0.00218 | 1.8e+308 | -5.35 | 9.01e-08 | 0.00499 | 0.0871 | -4.47 | 7.83e-06 |
b_female_kid_act | alpha_KID_act | 0.00659 | 1.8e+308 | -7.11 | 1.13e-12 | 0.0411 | 0.431 | -7.22 | 5.36e-13 |
b_female_kid_act | alpha_PAR_act | 0.0101 | 1.8e+308 | -6.99 | 2.66e-12 | 0.0633 | 0.432 | -6.72 | 1.76e-11 |
b_female_kid_act | alpha_kid_CAR | -0.00185 | 1.8e+308 | -6.2 | 5.78e-10 | -0.00869 | -0.43 | -5.52 | 3.39e-08 |
b_female_kid_act | alpha_par_CAR | 1.64e-05 | 1.8e+308 | -5.77 | 7.86e-09 | 7.81e-05 | 0.155 | -5.32 | 1.01e-07 |
b_female_kid_act | asc_kid_act | 0.00836 | 1.8e+308 | 3.49 | 0.000482 | 0.0312 | 0.25 | 3.52 | 0.000432 |
b_female_kid_act | asc_kid_car | 0.00898 | 1.8e+308 | 0.779 | 0.436 | 0.0241 | 0.258 | 0.77 | 0.441 |
b_female_kid_act | asc_par_act | 0.0235 | 1.8e+308 | 1.9 | 0.0573 | 0.107 | 0.351 | 1.63 | 0.102 |
b_female_kid_act | b_age_kid_act | -0.00528 | 1.8e+308 | -9.37 | 0 | -0.00411 | -0.066 | -8.74 | 0 |
b_female_kid_act | b_age_kid_car | -0.00203 | 1.8e+308 | -7.5 | 6.22e-14 | 0.00601 | 0.0835 | -7.21 | 5.79e-13 |
b_female_kid_act | b_age_par_act | 0.00621 | 1.8e+308 | -3.44 | 0.000587 | 0.041 | 0.264 | -3.34 | 0.000831 |
b_female_kid_car | alpha_KID_act | -0.00338 | 1.8e+308 | -6.87 | 6.43e-12 | -0.0112 | -0.302 | -5.18 | 2.21e-07 |
b_female_kid_car | alpha_PAR_act | -0.00375 | 1.8e+308 | -6.23 | 4.61e-10 | -0.0154 | -0.271 | -3.84 | 0.000122 |
b_female_kid_car | alpha_kid_CAR | 0.00182 | 1.8e+308 | -6.97 | 3.26e-12 | 0.00385 | 0.492 | -8.43 | 0 |
b_female_kid_car | alpha_par_CAR | 2.94e-05 | 1.8e+308 | -5.63 | 1.82e-08 | 0.00013 | 0.663 | -6.41 | 1.48e-10 |
b_female_kid_car | asc_kid_act | 0.00234 | 1.8e+308 | 9.11 | 0 | -0.00536 | -0.111 | 8.32 | 0 |
b_female_kid_car | asc_kid_car | 0.0238 | 1.8e+308 | 9.38 | 0 | 0.0227 | 0.629 | 9.48 | 0 |
b_female_kid_car | asc_par_act | -0.00125 | 1.8e+308 | 4.64 | 3.53e-06 | -0.0202 | -0.171 | 3.2 | 0.00139 |
b_female_kid_car | b_age_kid_act | -0.00845 | 1.8e+308 | -10.7 | 0 | -0.00797 | -0.33 | -11.3 | 0 |
b_female_kid_car | b_age_kid_car | -0.0223 | 1.8e+308 | -6.28 | 3.33e-10 | -0.0263 | -0.94 | -6.2 | 5.6e-10 |
b_female_kid_car | b_age_par_act | 0.0023 | 1.8e+308 | -1.15 | 0.252 | -0.00631 | -0.105 | -0.906 | 0.365 |
b_female_kid_car | b_female_kid_act | 0.0142 | 1.8e+308 | 3 | 0.00267 | -0.0045 | -0.0594 | 2.6 | 0.00923 |
b_female_par_act | alpha_KID_act | 0.0266 | 1.8e+308 | -2.55 | 0.0109 | 0.157 | 0.729 | -1.98 | 0.0479 |
b_female_par_act | alpha_PAR_act | 0.0409 | 1.8e+308 | -2.54 | 0.011 | 0.255 | 0.771 | -2.13 | 0.0329 |
b_female_par_act | alpha_kid_CAR | -0.00535 | 1.8e+308 | -1.94 | 0.0526 | -0.0306 | -0.673 | -1.32 | 0.186 |
b_female_par_act | alpha_par_CAR | 3.44e-05 | 1.8e+308 | -1.66 | 0.0962 | 0.00025 | 0.22 | -1.16 | 0.247 |
b_female_par_act | asc_kid_act | 0.00899 | 1.8e+308 | 3.88 | 0.000103 | 0.0918 | 0.326 | 3 | 0.00274 |
b_female_par_act | asc_kid_car | 0.0113 | 1.8e+308 | 2.18 | 0.029 | 0.0745 | 0.355 | 1.63 | 0.103 |
b_female_par_act | asc_par_act | 0.0462 | 1.8e+308 | 2.96 | 0.00307 | 0.382 | 0.555 | 2.75 | 0.00603 |
b_female_par_act | b_age_kid_act | 0.00336 | 1.8e+308 | -4.19 | 2.83e-05 | 0.00659 | 0.047 | -2.93 | 0.00335 |
b_female_par_act | b_age_kid_car | 0.00634 | 1.8e+308 | -3 | 0.0027 | 0.0303 | 0.186 | -2.15 | 0.0319 |
b_female_par_act | b_age_par_act | 0.000533 | 1.8e+308 | -0.576 | 0.564 | 0.169 | 0.483 | -0.484 | 0.628 |
b_female_par_act | b_female_kid_act | 0.117 | 1.8e+308 | 1.87 | 0.0612 | 0.24 | 0.546 | 1.43 | 0.153 |
b_female_par_act | b_female_kid_car | 0.000281 | 1.8e+308 | -0.0814 | 0.935 | -0.033 | -0.193 | -0.0561 | 0.955 |
b_has_big_sib_kid_act | alpha_KID_act | 0.0963 | 1.8e+308 | 6.57 | 5.19e-11 | 0.504 | 0.471 | 6.18 | 6.49e-10 |
b_has_big_sib_kid_act | alpha_PAR_act | 0.128 | 1.8e+308 | 6.58 | 4.6e-11 | 0.81 | 0.493 | 6.26 | 3.85e-10 |
b_has_big_sib_kid_act | alpha_kid_CAR | -0.0227 | 1.8e+308 | 6.6 | 4.09e-11 | -0.101 | -0.446 | 6.1 | 1.09e-09 |
b_has_big_sib_kid_act | alpha_par_CAR | -0.00119 | 1.8e+308 | 6.65 | 2.88e-11 | -0.000449 | -0.0794 | 6.16 | 7.14e-10 |
b_has_big_sib_kid_act | asc_kid_act | -0.336 | 1.8e+308 | 7.39 | 1.46e-13 | -0.06 | -0.0429 | 6.94 | 3.98e-12 |
b_has_big_sib_kid_act | asc_kid_car | -0.228 | 1.8e+308 | 7.16 | 8.32e-13 | 0.0129 | 0.0123 | 6.7 | 2.03e-11 |
b_has_big_sib_kid_act | asc_par_act | -0.0843 | 1.8e+308 | 7.34 | 2.14e-13 | 1.04 | 0.303 | 7.1 | 1.27e-12 |
b_has_big_sib_kid_act | b_age_kid_act | 0.226 | 1.8e+308 | 6.33 | 2.44e-10 | 0.231 | 0.331 | 5.86 | 4.72e-09 |
b_has_big_sib_kid_act | b_age_kid_car | 0.221 | 1.8e+308 | 6.51 | 7.45e-11 | 0.265 | 0.328 | 6.03 | 1.6e-09 |
b_has_big_sib_kid_act | b_age_par_act | 0.0103 | 1.8e+308 | 6.8 | 1.02e-11 | 0.56 | 0.322 | 6.44 | 1.18e-10 |
b_has_big_sib_kid_act | b_female_kid_act | -0.0708 | 1.8e+308 | 7.11 | 1.13e-12 | 0.36 | 0.164 | 6.71 | 1.94e-11 |
b_has_big_sib_kid_act | b_female_kid_car | -0.24 | 1.8e+308 | 6.81 | 9.88e-12 | -0.288 | -0.339 | 6.31 | 2.85e-10 |
b_has_big_sib_kid_act | b_female_par_act | 0.197 | 1.8e+308 | 6.89 | 5.57e-12 | 1.75 | 0.355 | 6.75 | 1.47e-11 |
b_has_big_sib_kid_car | alpha_KID_act | 0.0695 | 1.8e+308 | 5.71 | 1.11e-08 | 0.253 | 0.344 | 5.66 | 1.54e-08 |
b_has_big_sib_kid_car | alpha_PAR_act | 0.0821 | 1.8e+308 | 5.73 | 1.01e-08 | 0.362 | 0.321 | 5.71 | 1.14e-08 |
b_has_big_sib_kid_car | alpha_kid_CAR | -0.0383 | 1.8e+308 | 5.76 | 8.55e-09 | -0.0825 | -0.531 | 5.6 | 2.16e-08 |
b_has_big_sib_kid_car | alpha_par_CAR | -0.00117 | 1.8e+308 | 5.84 | 5.26e-09 | -0.00258 | -0.664 | 5.7 | 1.21e-08 |
b_has_big_sib_kid_car | asc_kid_act | -0.0608 | 1.8e+308 | 6.98 | 3.01e-12 | 0.121 | 0.126 | 6.92 | 4.61e-12 |
b_has_big_sib_kid_car | asc_kid_car | -0.487 | 1.8e+308 | 6.36 | 1.97e-10 | -0.446 | -0.622 | 6.24 | 4.3e-10 |
b_has_big_sib_kid_car | asc_par_act | 0.0344 | 1.8e+308 | 6.83 | 8.23e-12 | 0.501 | 0.213 | 6.87 | 6.22e-12 |
b_has_big_sib_kid_car | b_age_kid_act | 0.172 | 1.8e+308 | 5.38 | 7.29e-08 | 0.16 | 0.334 | 5.24 | 1.56e-07 |
b_has_big_sib_kid_car | b_age_kid_car | 0.447 | 1.8e+308 | 5.79 | 7.16e-09 | 0.535 | 0.966 | 5.68 | 1.32e-08 |
b_has_big_sib_kid_car | b_age_par_act | -0.0354 | 1.8e+308 | 6.02 | 1.75e-09 | 0.169 | 0.141 | 5.97 | 2.4e-09 |
b_has_big_sib_kid_car | b_female_kid_act | -0.0629 | 1.8e+308 | 6.46 | 1.03e-10 | 0.153 | 0.102 | 6.42 | 1.34e-10 |
b_has_big_sib_kid_car | b_female_kid_car | -0.466 | 1.8e+308 | 5.91 | 3.34e-09 | -0.549 | -0.941 | 5.75 | 9.03e-09 |
b_has_big_sib_kid_car | b_female_par_act | 0.13 | 1.8e+308 | 6.13 | 9.03e-10 | 0.797 | 0.235 | 6.2 | 5.58e-10 |
b_has_big_sib_kid_car | b_has_big_sib_kid_act | 6.11 | 1.8e+308 | -2.5 | 0.0125 | 6.45 | 0.383 | -2.31 | 0.0209 |
b_has_big_sib_par_act | alpha_KID_act | -0.377 | 1.8e+308 | 0.95 | 0.342 | -2.51 | -0.804 | 0.535 | 0.593 |
b_has_big_sib_par_act | alpha_PAR_act | -0.624 | 1.8e+308 | 0.952 | 0.341 | -4.2 | -0.878 | 0.533 | 0.594 |
b_has_big_sib_par_act | alpha_kid_CAR | 0.0671 | 1.8e+308 | 0.996 | 0.319 | 0.478 | 0.726 | 0.565 | 0.572 |
b_has_big_sib_par_act | alpha_par_CAR | -0.00131 | 1.8e+308 | 1.02 | 0.307 | -0.00468 | -0.284 | 0.578 | 0.563 |
b_has_big_sib_par_act | asc_kid_act | -0.323 | 1.8e+308 | 1.5 | 0.134 | -1.59 | -0.391 | 0.847 | 0.397 |
b_has_big_sib_par_act | asc_kid_car | -0.268 | 1.8e+308 | 1.34 | 0.179 | -1.24 | -0.408 | 0.76 | 0.447 |
b_has_big_sib_par_act | asc_par_act | -1.49 | 1.8e+308 | 1.41 | 0.158 | -7.18 | -0.721 | 0.79 | 0.429 |
b_has_big_sib_par_act | b_age_kid_act | 0.037 | 1.8e+308 | 0.803 | 0.422 | -0.0332 | -0.0163 | 0.455 | 0.649 |
b_has_big_sib_par_act | b_age_kid_car | 0.000786 | 1.8e+308 | 0.904 | 0.366 | -0.429 | -0.183 | 0.511 | 0.609 |
b_has_big_sib_par_act | b_age_par_act | -0.0526 | 1.8e+308 | 1.11 | 0.268 | -2.92 | -0.576 | 0.62 | 0.536 |
b_has_big_sib_par_act | b_female_kid_act | -0.401 | 1.8e+308 | 1.3 | 0.194 | -2.47 | -0.388 | 0.732 | 0.464 |
b_has_big_sib_par_act | b_female_kid_car | -0.00753 | 1.8e+308 | 1.15 | 0.248 | 0.482 | 0.195 | 0.655 | 0.512 |
b_has_big_sib_par_act | b_female_par_act | -1.39 | 1.8e+308 | 1.13 | 0.257 | -9.86 | -0.687 | 0.628 | 0.53 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 7.42 | 1.8e+308 | -2.6 | 0.00938 | -20.2 | -0.283 | -1.34 | 0.179 |
b_has_big_sib_par_act | b_has_big_sib_kid_car | 0.504 | 1.8e+308 | -1.26 | 0.207 | -11.7 | -0.239 | -0.709 | 0.478 |
b_has_lil_sib_kid_act | alpha_KID_act | -0.00338 | 1.8e+308 | 2.39 | 0.0169 | -0.0324 | -0.338 | 1.95 | 0.0506 |
b_has_lil_sib_kid_act | alpha_PAR_act | -0.00596 | 1.8e+308 | 2.4 | 0.0162 | -0.0488 | -0.333 | 1.77 | 0.0765 |
b_has_lil_sib_kid_act | alpha_kid_CAR | -6.68e-05 | 1.8e+308 | 3.25 | 0.00117 | 0.00573 | 0.283 | 3.26 | 0.0011 |
b_has_lil_sib_kid_act | alpha_par_CAR | -8.35e-05 | 1.8e+308 | 3.73 | 0.000194 | -0.000148 | -0.293 | 3.65 | 0.000265 |
b_has_lil_sib_kid_act | asc_kid_act | -0.0272 | 1.8e+308 | 10.1 | 0 | -0.0432 | -0.345 | 9.29 | 0 |
b_has_lil_sib_kid_act | asc_kid_car | -0.0264 | 1.8e+308 | 8.15 | 4.44e-16 | -0.0355 | -0.381 | 7.72 | 1.2e-14 |
b_has_lil_sib_kid_act | asc_par_act | -0.0258 | 1.8e+308 | 7.49 | 6.99e-14 | -0.0877 | -0.287 | 5.51 | 3.62e-08 |
b_has_lil_sib_kid_act | b_age_kid_act | 0.00956 | 1.8e+308 | -0.38 | 0.704 | 0.00677 | 0.109 | -0.365 | 0.715 |
b_has_lil_sib_kid_act | b_age_kid_car | 0.017 | 1.8e+308 | 1.59 | 0.113 | 0.00953 | 0.132 | 1.48 | 0.139 |
b_has_lil_sib_kid_act | b_age_par_act | -0.00439 | 1.8e+308 | 4.53 | 5.87e-06 | -0.0304 | -0.195 | 3.8 | 0.000147 |
b_has_lil_sib_kid_act | b_female_kid_act | -0.00814 | 1.8e+308 | 6.52 | 6.96e-11 | -0.039 | -0.199 | 5.79 | 6.91e-09 |
b_has_lil_sib_kid_act | b_female_kid_car | -0.0184 | 1.8e+308 | 5.29 | 1.23e-07 | -0.00858 | -0.113 | 5.5 | 3.75e-08 |
b_has_lil_sib_kid_act | b_female_par_act | -0.0166 | 1.8e+308 | 3.31 | 0.000944 | -0.124 | -0.281 | 2.31 | 0.0209 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 0.643 | 1.8e+308 | -6.47 | 9.68e-11 | 0.229 | 0.104 | -5.87 | 4.4e-09 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_car | 0.377 | 1.8e+308 | -5.5 | 3.89e-08 | 0.167 | 0.111 | -5.26 | 1.47e-07 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 0.58 | 1.8e+308 | -0.829 | 0.407 | 2.11 | 0.33 | -0.471 | 0.638 |
b_has_lil_sib_kid_car | alpha_KID_act | 0.00444 | 1.8e+308 | 3.22 | 0.00129 | 0.0139 | 0.269 | 3.04 | 0.00234 |
b_has_lil_sib_kid_car | alpha_PAR_act | 0.00475 | 1.8e+308 | 3.21 | 0.00133 | 0.0185 | 0.234 | 2.44 | 0.0146 |
b_has_lil_sib_kid_car | alpha_kid_CAR | -0.00265 | 1.8e+308 | 4.36 | 1.28e-05 | -0.00509 | -0.467 | 4.43 | 9.53e-06 |
b_has_lil_sib_kid_car | alpha_par_CAR | -8.3e-05 | 1.8e+308 | 5.36 | 8.43e-08 | -0.000193 | -0.709 | 5.73 | 1.02e-08 |
b_has_lil_sib_kid_car | asc_kid_act | -0.00689 | 1.8e+308 | 14 | 0 | 0.00544 | 0.0808 | 15.1 | 0 |
b_has_lil_sib_kid_car | asc_kid_car | -0.0392 | 1.8e+308 | 9.51 | 0 | -0.0348 | -0.692 | 9.83 | 0 |
b_has_lil_sib_kid_car | asc_par_act | -0.000923 | 1.8e+308 | 9.01 | 0 | 0.0231 | 0.14 | 6.91 | 4.78e-12 |
b_has_lil_sib_kid_car | b_age_kid_act | 0.0123 | 1.8e+308 | -1.7 | 0.0898 | 0.0115 | 0.342 | -1.77 | 0.0772 |
b_has_lil_sib_kid_car | b_age_kid_car | 0.0324 | 1.8e+308 | 2.73 | 0.00626 | 0.0375 | 0.965 | 4.59 | 4.45e-06 |
b_has_lil_sib_kid_car | b_age_par_act | -0.00332 | 1.8e+308 | 5.56 | 2.77e-08 | 0.00617 | 0.0735 | 5.11 | 3.23e-07 |
b_has_lil_sib_kid_car | b_female_kid_act | -0.00493 | 1.8e+308 | 7.58 | 3.49e-14 | 0.00806 | 0.0765 | 7.66 | 1.84e-14 |
b_has_lil_sib_kid_car | b_female_kid_car | -0.0348 | 1.8e+308 | 5.93 | 3.06e-09 | -0.0375 | -0.917 | 6.14 | 8.49e-10 |
b_has_lil_sib_kid_car | b_female_par_act | 0.00701 | 1.8e+308 | 3.46 | 0.000536 | 0.0404 | 0.17 | 2.56 | 0.0104 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_act | 0.36 | 1.8e+308 | -6.46 | 1.08e-10 | 0.383 | 0.324 | -5.97 | 2.32e-09 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_car | 0.701 | 1.8e+308 | -5.79 | 7.07e-09 | 0.771 | 0.95 | -5.67 | 1.4e-08 |
b_has_lil_sib_kid_car | b_has_big_sib_par_act | 0.0374 | 1.8e+308 | -0.853 | 0.394 | -0.559 | -0.163 | -0.482 | 0.63 |
b_has_lil_sib_kid_car | b_has_lil_sib_kid_act | 0.0391 | 1.8e+308 | -0.587 | 0.557 | 0.0171 | 0.162 | -0.525 | 0.6 |
b_has_lil_sib_par_act | alpha_KID_act | -0.0245 | 1.8e+308 | 1.33 | 0.182 | -0.189 | -0.728 | 0.789 | 0.43 |
b_has_lil_sib_par_act | alpha_PAR_act | -0.0487 | 1.8e+308 | 1.33 | 0.184 | -0.325 | -0.816 | 0.755 | 0.451 |
b_has_lil_sib_par_act | alpha_kid_CAR | 0.00436 | 1.8e+308 | 1.83 | 0.0666 | 0.0363 | 0.661 | 1.2 | 0.231 |
b_has_lil_sib_par_act | alpha_par_CAR | -0.000104 | 1.8e+308 | 2.09 | 0.0367 | -0.000363 | -0.265 | 1.34 | 0.18 |
b_has_lil_sib_par_act | asc_kid_act | -0.0327 | 1.8e+308 | 6.55 | 5.65e-11 | -0.13 | -0.383 | 4.18 | 2.88e-05 |
b_has_lil_sib_par_act | asc_kid_car | -0.0248 | 1.8e+308 | 5.2 | 1.95e-07 | -0.0959 | -0.379 | 3.32 | 0.000909 |
b_has_lil_sib_par_act | asc_par_act | -0.145 | 1.8e+308 | 4.82 | 1.41e-06 | -0.609 | -0.733 | 2.86 | 0.00421 |
b_has_lil_sib_par_act | b_age_kid_act | 0.00579 | 1.8e+308 | -0.218 | 0.828 | -0.00361 | -0.0213 | -0.139 | 0.889 |
b_has_lil_sib_par_act | b_age_kid_car | 0.00418 | 1.8e+308 | 0.849 | 0.396 | -0.0316 | -0.161 | 0.535 | 0.593 |
b_has_lil_sib_par_act | b_age_par_act | -0.0262 | 1.8e+308 | 2.76 | 0.00581 | -0.214 | -0.507 | 1.65 | 0.0983 |
b_has_lil_sib_par_act | b_female_kid_act | -0.0345 | 1.8e+308 | 4.35 | 1.36e-05 | -0.198 | -0.372 | 2.78 | 0.00546 |
b_has_lil_sib_par_act | b_female_kid_car | -0.00481 | 1.8e+308 | 3.38 | 0.000737 | 0.036 | 0.175 | 2.28 | 0.0223 |
b_has_lil_sib_par_act | b_female_par_act | -0.103 | 1.8e+308 | 2.44 | 0.0146 | -0.754 | -0.63 | 1.39 | 0.164 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 0.103 | 1.8e+308 | -6.24 | 4.26e-10 | -2.09 | -0.351 | -5.27 | 1.4e-07 |
b_has_lil_sib_par_act | b_has_big_sib_kid_car | 0.0705 | 1.8e+308 | -5.25 | 1.54e-07 | -0.881 | -0.216 | -4.62 | 3.75e-06 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 3.03 | 1.8e+308 | -0.859 | 0.39 | 13.9 | 0.8 | -0.499 | 0.618 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 0.129 | 1.8e+308 | -0.00642 | 0.995 | 0.236 | 0.444 | -0.0043 | 0.997 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_car | 0.015 | 1.8e+308 | 0.303 | 0.762 | -0.0401 | -0.14 | 0.191 | 0.848 |
b_log_density_kid_act | alpha_KID_act | -0.0763 | 1.8e+308 | 5.08 | 3.84e-07 | -0.397 | -0.688 | 3.58 | 0.000348 |
b_log_density_kid_act | alpha_PAR_act | -0.107 | 1.8e+308 | 5.05 | 4.35e-07 | -0.603 | -0.682 | 3.49 | 0.000486 |
b_log_density_kid_act | alpha_kid_CAR | 0.0257 | 1.8e+308 | 5.39 | 7.06e-08 | 0.0939 | 0.77 | 3.96 | 7.61e-05 |
b_log_density_kid_act | alpha_par_CAR | 0.000112 | 1.8e+308 | 5.46 | 4.78e-08 | 3.19e-05 | 0.0105 | 3.98 | 6.84e-05 |
b_log_density_kid_act | asc_kid_act | -0.311 | 1.8e+308 | 6.9 | 5.16e-12 | -0.526 | -0.699 | 5.08 | 3.72e-07 |
b_log_density_kid_act | asc_kid_car | 0.0245 | 1.8e+308 | 6.85 | 7.31e-12 | -0.0724 | -0.129 | 4.93 | 8.43e-07 |
b_log_density_kid_act | asc_par_act | -0.367 | 1.8e+308 | 6.47 | 9.93e-11 | -1.17 | -0.632 | 4.47 | 7.83e-06 |
b_log_density_kid_act | b_age_kid_act | 0.0048 | 1.8e+308 | 4.54 | 5.64e-06 | -0.00383 | -0.0102 | 3.31 | 0.00094 |
b_log_density_kid_act | b_age_kid_car | -0.102 | 1.8e+308 | 4.83 | 1.37e-06 | -0.202 | -0.466 | 3.52 | 0.00043 |
b_log_density_kid_act | b_age_par_act | 0.00938 | 1.8e+308 | 5.79 | 6.93e-09 | -0.347 | -0.37 | 4.03 | 5.61e-05 |
b_log_density_kid_act | b_female_kid_act | -0.111 | 1.8e+308 | 6.35 | 2.13e-10 | -0.436 | -0.37 | 4.54 | 5.75e-06 |
b_log_density_kid_act | b_female_kid_car | 0.0957 | 1.8e+308 | 6.15 | 7.87e-10 | 0.207 | 0.454 | 4.52 | 6.3e-06 |
b_log_density_kid_act | b_female_par_act | -0.243 | 1.8e+308 | 5.4 | 6.63e-08 | -1.43 | -0.538 | 3.55 | 0.000378 |
b_log_density_kid_act | b_has_big_sib_kid_act | -0.629 | 1.8e+308 | -3.9 | 9.75e-05 | -4.58 | -0.347 | -3.12 | 0.00183 |
b_log_density_kid_act | b_has_big_sib_kid_car | -1.89 | 1.8e+308 | -2.03 | 0.0419 | -4.4 | -0.485 | -1.67 | 0.0943 |
b_log_density_kid_act | b_has_big_sib_par_act | 3.19 | 1.8e+308 | 0.285 | 0.776 | 22.4 | 0.584 | 0.175 | 0.861 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 0.0145 | 1.8e+308 | 4.53 | 5.78e-06 | 0.288 | 0.244 | 3.47 | 0.000521 |
b_log_density_kid_act | b_has_lil_sib_kid_car | -0.13 | 1.8e+308 | 4.56 | 5.04e-06 | -0.28 | -0.441 | 3.33 | 0.00088 |
b_log_density_kid_act | b_has_lil_sib_par_act | 0.249 | 1.8e+308 | 4.57 | 4.82e-06 | 1.79 | 0.557 | 4.03 | 5.49e-05 |
b_log_density_kid_car | alpha_KID_act | 0.00184 | 1.8e+308 | 1.26 | 0.208 | 0.00053 | 0.00732 | 2.08 | 0.0379 |
b_log_density_kid_car | alpha_PAR_act | 0.000681 | 1.8e+308 | 1.31 | 0.191 | -0.0024 | -0.0216 | 1.82 | 0.0691 |
b_log_density_kid_car | alpha_kid_CAR | -0.00266 | 1.8e+308 | 1.76 | 0.078 | -0.00264 | -0.173 | 3.33 | 0.000873 |
b_log_density_kid_car | alpha_par_CAR | -3.94e-05 | 1.8e+308 | 2.09 | 0.0364 | -0.000203 | -0.531 | 4.04 | 5.25e-05 |
b_log_density_kid_car | asc_kid_act | -0.0225 | 1.8e+308 | 7.31 | 2.69e-13 | -0.00258 | -0.0273 | 12 | 0 |
b_log_density_kid_car | asc_kid_car | -0.0691 | 1.8e+308 | 5.24 | 1.65e-07 | -0.0426 | -0.604 | 8.23 | 2.22e-16 |
b_log_density_kid_car | asc_par_act | -0.0182 | 1.8e+308 | 5.85 | 4.78e-09 | -0.0121 | -0.0522 | 6.15 | 7.9e-10 |
b_log_density_kid_car | b_age_kid_act | 0.00875 | 1.8e+308 | -0.653 | 0.514 | 0.00789 | 0.167 | -1.24 | 0.214 |
b_log_density_kid_car | b_age_kid_car | 0.0328 | 1.8e+308 | 0.664 | 0.507 | 0.033 | 0.604 | 1.51 | 0.13 |
b_log_density_kid_car | b_age_par_act | -0.00161 | 1.8e+308 | 2.96 | 0.00306 | -0.00654 | -0.0555 | 4.17 | 3e-05 |
b_log_density_kid_car | b_female_kid_act | -0.00908 | 1.8e+308 | 4.77 | 1.85e-06 | -0.00548 | -0.037 | 6.57 | 4.94e-11 |
b_log_density_kid_car | b_female_kid_car | -0.0424 | 1.8e+308 | 3.33 | 0.000883 | -0.0378 | -0.658 | 5.26 | 1.44e-07 |
b_log_density_kid_car | b_female_par_act | -0.00338 | 1.8e+308 | 2.63 | 0.00842 | -0.00732 | -0.0219 | 2.37 | 0.0177 |
b_log_density_kid_car | b_has_big_sib_kid_act | 0.37 | 1.8e+308 | -6.41 | 1.49e-10 | 0.257 | 0.155 | -5.94 | 2.89e-09 |
b_log_density_kid_car | b_has_big_sib_kid_car | 0.814 | 1.8e+308 | -5.76 | 8.66e-09 | 0.723 | 0.634 | -5.64 | 1.75e-08 |
b_log_density_kid_car | b_has_big_sib_par_act | 0.21 | 1.8e+308 | -0.855 | 0.393 | 0.274 | 0.0568 | -0.485 | 0.628 |
b_log_density_kid_car | b_has_lil_sib_kid_act | 0.0383 | 1.8e+308 | -0.356 | 0.722 | 0.0227 | 0.153 | -0.506 | 0.613 |
b_log_density_kid_car | b_has_lil_sib_kid_car | 0.0674 | 1.8e+308 | -0.0233 | 0.981 | 0.052 | 0.651 | -0.0541 | 0.957 |
b_log_density_kid_car | b_has_lil_sib_par_act | 0.0238 | 1.8e+308 | -0.259 | 0.796 | 0.021 | 0.0521 | -0.207 | 0.836 |
b_log_density_kid_car | b_log_density_kid_act | 0.115 | 1.8e+308 | -4.65 | 3.38e-06 | -0.122 | -0.136 | -3.39 | 0.0007 |
b_log_density_par_act | alpha_KID_act | 0.0637 | 1.8e+308 | 6.87 | 6.56e-12 | 0.12 | 0.162 | 6.14 | 8.44e-10 |
b_log_density_par_act | alpha_PAR_act | -0.0146 | 1.8e+308 | 6.82 | 9.07e-12 | -0.0411 | -0.036 | 6.05 | 1.45e-09 |
b_log_density_par_act | alpha_kid_CAR | -0.00445 | 1.8e+308 | 6.93 | 4.29e-12 | -0.0139 | -0.0883 | 6.17 | 6.7e-10 |
b_log_density_par_act | alpha_par_CAR | -4.85e-05 | 1.8e+308 | 7 | 2.6e-12 | 5.73e-05 | 0.0146 | 6.24 | 4.36e-10 |
b_log_density_par_act | asc_kid_act | -0.294 | 1.8e+308 | 8.02 | 1.11e-15 | -0.381 | -0.391 | 7.15 | 8.97e-13 |
b_log_density_par_act | asc_kid_car | 0.0195 | 1.8e+308 | 7.87 | 3.55e-15 | 0.0559 | 0.077 | 7.04 | 1.91e-12 |
b_log_density_par_act | asc_par_act | -0.907 | 1.8e+308 | 7.37 | 1.72e-13 | -1.13 | -0.473 | 6.53 | 6.48e-11 |
b_log_density_par_act | b_age_kid_act | 0.0916 | 1.8e+308 | 6.48 | 9.44e-11 | 0.158 | 0.326 | 5.8 | 6.75e-09 |
b_log_density_par_act | b_age_kid_car | -0.0134 | 1.8e+308 | 6.67 | 2.53e-11 | -0.0092 | -0.0164 | 5.95 | 2.61e-09 |
b_log_density_par_act | b_age_par_act | -0.199 | 1.8e+308 | 7.06 | 1.66e-12 | -0.326 | -0.269 | 6.25 | 4.1e-10 |
b_log_density_par_act | b_female_kid_act | -0.0693 | 1.8e+308 | 7.64 | 2.15e-14 | -0.0477 | -0.0313 | 6.84 | 7.93e-12 |
b_log_density_par_act | b_female_kid_car | 0.0101 | 1.8e+308 | 7.35 | 2.03e-13 | 0.0119 | 0.0202 | 6.56 | 5.51e-11 |
b_log_density_par_act | b_female_par_act | -0.0489 | 1.8e+308 | 7.16 | 8.24e-13 | -0.263 | -0.0765 | 6.19 | 5.96e-10 |
b_log_density_par_act | b_has_big_sib_kid_act | 0.812 | 1.8e+308 | -1.68 | 0.0936 | 0.362 | 0.0212 | -1.51 | 0.131 |
b_log_density_par_act | b_has_big_sib_kid_car | -0.211 | 1.8e+308 | 0.464 | 0.643 | -0.289 | -0.0246 | 0.432 | 0.665 |
b_log_density_par_act | b_has_big_sib_par_act | 0.664 | 1.8e+308 | 1.52 | 0.128 | 3.43 | 0.069 | 0.903 | 0.367 |
b_log_density_par_act | b_has_lil_sib_kid_act | 0.0292 | 1.8e+308 | 6.43 | 1.29e-10 | 0.0345 | 0.0226 | 5.74 | 9.4e-09 |
b_log_density_par_act | b_has_lil_sib_kid_car | -0.0107 | 1.8e+308 | 6.52 | 6.93e-11 | -0.012 | -0.0147 | 5.82 | 5.77e-09 |
b_log_density_par_act | b_has_lil_sib_par_act | 0.217 | 1.8e+308 | 6.42 | 1.37e-10 | 0.274 | 0.0662 | 5.57 | 2.59e-08 |
b_log_density_par_act | b_log_density_kid_act | 2.14 | 1.8e+308 | 3.64 | 0.000271 | 2.38 | 0.259 | 2.89 | 0.00388 |
b_log_density_par_act | b_log_density_kid_car | 0.116 | 1.8e+308 | 6.49 | 8.47e-11 | 0.00187 | 0.00162 | 5.82 | 5.87e-09 |
b_log_distance_kid_act | alpha_KID_act | 0.00164 | 1.8e+308 | -17.4 | 0 | 0.0147 | 0.69 | -11.9 | 0 |
b_log_distance_kid_act | alpha_PAR_act | 0.00416 | 1.8e+308 | -15.4 | 0 | 0.0257 | 0.788 | -7.36 | 1.91e-13 |
b_log_distance_kid_act | alpha_kid_CAR | -0.000663 | 1.8e+308 | -20.3 | 0 | -0.00314 | -0.697 | -12.2 | 0 |
b_log_distance_kid_act | alpha_par_CAR | 1.58e-05 | 1.8e+308 | -21.3 | 0 | 3.84e-05 | 0.342 | -14.6 | 0 |
b_log_distance_kid_act | asc_kid_act | 0.00935 | 1.8e+308 | 11.1 | 0 | 0.0172 | 0.618 | 10.9 | 0 |
b_log_distance_kid_act | asc_kid_car | 0.00354 | 1.8e+308 | 6.62 | 3.48e-11 | 0.0105 | 0.506 | 6.93 | 4.16e-12 |
b_log_distance_kid_act | asc_par_act | 0.016 | 1.8e+308 | 4.63 | 3.72e-06 | 0.0512 | 0.752 | 3.27 | 0.00107 |
b_log_distance_kid_act | b_age_kid_act | -0.00392 | 1.8e+308 | -18.5 | 0 | -0.00366 | -0.264 | -16.7 | 0 |
b_log_distance_kid_act | b_age_kid_car | -0.00081 | 1.8e+308 | -13.9 | 0 | 0.001 | 0.0624 | -12.8 | 0 |
b_log_distance_kid_act | b_age_par_act | 0.00359 | 1.8e+308 | -2.71 | 0.00682 | 0.0195 | 0.563 | -2.29 | 0.0219 |
b_log_distance_kid_act | b_female_kid_act | 0.00717 | 1.8e+308 | 2.33 | 0.0196 | 0.0203 | 0.467 | 2.28 | 0.0228 |
b_log_distance_kid_act | b_female_kid_car | 0.000601 | 1.8e+308 | -1.65 | 0.0982 | -0.00152 | -0.09 | -1.63 | 0.102 |
b_log_distance_kid_act | b_female_par_act | 0.0101 | 1.8e+308 | -0.407 | 0.684 | 0.0623 | 0.635 | -0.296 | 0.767 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -0.0211 | 1.8e+308 | -6.96 | 3.48e-12 | 0.143 | 0.294 | -6.49 | 8.67e-11 |
b_log_distance_kid_act | b_has_big_sib_kid_car | -0.0107 | 1.8e+308 | -6.26 | 3.79e-10 | 0.0431 | 0.129 | -6.14 | 8.24e-10 |
b_log_distance_kid_act | b_has_big_sib_par_act | -0.14 | 1.8e+308 | -1.19 | 0.233 | -0.992 | -0.698 | -0.674 | 0.5 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -0.00425 | 1.8e+308 | -6.79 | 1.08e-11 | -0.0155 | -0.354 | -6.26 | 3.83e-10 |
b_log_distance_kid_act | b_has_lil_sib_kid_car | -0.00117 | 1.8e+308 | -10.4 | 0 | 0.00122 | 0.0519 | -11.1 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -0.0147 | 1.8e+308 | -3.83 | 0.000126 | -0.0809 | -0.683 | -2.39 | 0.0168 |
b_log_distance_kid_act | b_log_density_kid_act | -0.0445 | 1.8e+308 | -6.12 | 9.42e-10 | -0.163 | -0.622 | -4.41 | 1.01e-05 |
b_log_distance_kid_act | b_log_density_kid_car | -8.88e-05 | 1.8e+308 | -4.27 | 1.93e-05 | -0.00256 | -0.0777 | -7.82 | 5.33e-15 |
b_log_distance_kid_act | b_log_density_par_act | -0.057 | 1.8e+308 | -7.42 | 1.2e-13 | -0.0752 | -0.222 | -6.61 | 3.82e-11 |
b_log_distance_kid_car | alpha_KID_act | -0.00156 | 1.8e+308 | -7.99 | 1.33e-15 | -0.00488 | -0.276 | -4.56 | 5.16e-06 |
b_log_distance_kid_car | alpha_PAR_act | -0.00171 | 1.8e+308 | -6.51 | 7.5e-11 | -0.00653 | -0.24 | -3.07 | 0.00217 |
b_log_distance_kid_car | alpha_kid_CAR | 0.000933 | 1.8e+308 | -11.9 | 0 | 0.0018 | 0.48 | -11.4 | 0 |
b_log_distance_kid_car | alpha_par_CAR | 2e-05 | 1.8e+308 | -7.94 | 2e-15 | 6.79e-05 | 0.727 | -7.56 | 3.89e-14 |
b_log_distance_kid_car | asc_kid_act | 0.00141 | 1.8e+308 | 12.7 | 0 | -0.00208 | -0.0899 | 11.2 | 0 |
b_log_distance_kid_car | asc_kid_car | 0.0127 | 1.8e+308 | 14.9 | 0 | 0.0121 | 0.7 | 12.7 | 0 |
b_log_distance_kid_car | asc_par_act | -0.000395 | 1.8e+308 | 5.98 | 2.27e-09 | -0.00828 | -0.146 | 4.02 | 5.77e-05 |
b_log_distance_kid_car | b_age_kid_act | -0.00438 | 1.8e+308 | -13.3 | 0 | -0.00408 | -0.354 | -12.9 | 0 |
b_log_distance_kid_car | b_age_kid_car | -0.0116 | 1.8e+308 | -6.82 | 9.36e-12 | -0.0133 | -0.996 | -6.38 | 1.72e-10 |
b_log_distance_kid_car | b_age_par_act | 0.00125 | 1.8e+308 | 0.411 | 0.681 | -0.00214 | -0.0745 | 0.305 | 0.761 |
b_log_distance_kid_car | b_female_kid_act | 0.00097 | 1.8e+308 | 4.22 | 2.5e-05 | -0.00286 | -0.0789 | 3.82 | 0.000136 |
b_log_distance_kid_car | b_female_kid_car | 0.0113 | 1.8e+308 | 3.3 | 0.000956 | 0.0132 | 0.937 | 4.86 | 1.19e-06 |
b_log_distance_kid_car | b_female_par_act | -0.00306 | 1.8e+308 | 0.769 | 0.442 | -0.0143 | -0.175 | 0.532 | 0.595 |
b_log_distance_kid_car | b_has_big_sib_kid_act | -0.107 | 1.8e+308 | -6.75 | 1.46e-11 | -0.13 | -0.319 | -6.25 | 4.02e-10 |
b_log_distance_kid_car | b_has_big_sib_kid_car | -0.222 | 1.8e+308 | -5.9 | 3.53e-09 | -0.267 | -0.958 | -5.75 | 9.06e-09 |
b_log_distance_kid_car | b_has_big_sib_par_act | -0.00151 | 1.8e+308 | -1.1 | 0.273 | 0.2 | 0.169 | -0.621 | 0.534 |
b_log_distance_kid_car | b_has_lil_sib_kid_act | -0.00871 | 1.8e+308 | -4.85 | 1.23e-06 | -0.00497 | -0.137 | -4.83 | 1.34e-06 |
b_log_distance_kid_car | b_has_lil_sib_kid_car | -0.0164 | 1.8e+308 | -6.15 | 7.93e-10 | -0.0189 | -0.966 | -6.23 | 4.6e-10 |
b_log_distance_kid_car | b_has_lil_sib_par_act | -0.00244 | 1.8e+308 | -2.86 | 0.00426 | 0.0146 | 0.148 | -1.87 | 0.0621 |
b_log_distance_kid_car | b_log_density_kid_act | 0.052 | 1.8e+308 | -5.85 | 4.89e-09 | 0.1 | 0.46 | -4.27 | 1.95e-05 |
b_log_distance_kid_car | b_log_density_kid_car | -0.0173 | 1.8e+308 | -2.9 | 0.00371 | -0.0166 | -0.605 | -5.05 | 4.36e-07 |
b_log_distance_kid_car | b_log_density_par_act | 0.00744 | 1.8e+308 | -7.2 | 6e-13 | 0.00498 | 0.0176 | -6.42 | 1.37e-10 |
b_log_distance_kid_car | b_log_distance_kid_act | 0.000453 | 1.8e+308 | 8.3 | 0 | -0.000387 | -0.048 | 6.23 | 4.81e-10 |
b_log_distance_par_act | alpha_KID_act | 0.0119 | 1.8e+308 | -11.5 | 0 | 0.087 | 0.876 | -5.99 | 2.12e-09 |
b_log_distance_par_act | alpha_PAR_act | 0.0232 | 1.8e+308 | -18.7 | 0 | 0.149 | 0.978 | -11.2 | 0 |
b_log_distance_par_act | alpha_kid_CAR | -0.00255 | 1.8e+308 | -6.96 | 3.31e-12 | -0.017 | -0.811 | -2.83 | 0.00461 |
b_log_distance_par_act | alpha_par_CAR | 3.36e-05 | 1.8e+308 | -6.42 | 1.4e-10 | 0.000155 | 0.296 | -2.62 | 0.00881 |
b_log_distance_par_act | asc_kid_act | 0.0133 | 1.8e+308 | 10.1 | 0 | 0.059 | 0.454 | 6.66 | 2.7e-11 |
b_log_distance_par_act | asc_kid_car | 0.00661 | 1.8e+308 | 6.03 | 1.65e-09 | 0.0426 | 0.44 | 3.6 | 0.000319 |
b_log_distance_par_act | asc_par_act | 0.0537 | 1.8e+308 | 5.87 | 4.43e-09 | 0.261 | 0.82 | 5.51 | 3.58e-08 |
b_log_distance_par_act | b_age_kid_act | -0.0022 | 1.8e+308 | -12.5 | 0 | 7.36e-05 | 0.00114 | -6.21 | 5.39e-10 |
b_log_distance_par_act | b_age_kid_car | 0.00235 | 1.8e+308 | -9.27 | 0 | 0.0163 | 0.218 | -4.75 | 2.04e-06 |
b_log_distance_par_act | b_age_par_act | 0.0114 | 1.8e+308 | -1.66 | 0.0966 | 0.109 | 0.672 | -1.39 | 0.164 |
b_log_distance_par_act | b_female_kid_act | 0.0167 | 1.8e+308 | 2.8 | 0.00507 | 0.0902 | 0.444 | 2.42 | 0.0157 |
b_log_distance_par_act | b_female_kid_car | -0.0026 | 1.8e+308 | -0.392 | 0.695 | -0.0185 | -0.234 | -0.208 | 0.835 |
b_log_distance_par_act | b_female_par_act | 0.0492 | 1.8e+308 | -0.0793 | 0.937 | 0.345 | 0.753 | -0.0714 | 0.943 |
b_log_distance_par_act | b_has_big_sib_kid_act | 0.113 | 1.8e+308 | -6.95 | 3.73e-12 | 1.07 | 0.468 | -6.67 | 2.51e-11 |
b_log_distance_par_act | b_has_big_sib_kid_car | 0.0636 | 1.8e+308 | -6.23 | 4.73e-10 | 0.448 | 0.286 | -6.24 | 4.36e-10 |
b_log_distance_par_act | b_has_big_sib_par_act | -0.828 | 1.8e+308 | -1.15 | 0.249 | -5.83 | -0.879 | -0.643 | 0.52 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -0.00982 | 1.8e+308 | -5.72 | 1.05e-08 | -0.0676 | -0.332 | -3.83 | 0.000129 |
b_log_distance_par_act | b_has_lil_sib_kid_car | 0.00292 | 1.8e+308 | -8.36 | 0 | 0.0216 | 0.197 | -5.43 | 5.78e-08 |
b_log_distance_par_act | b_has_lil_sib_par_act | -0.071 | 1.8e+308 | -3.2 | 0.00136 | -0.456 | -0.825 | -1.76 | 0.079 |
b_log_distance_par_act | b_log_density_kid_act | -0.142 | 1.8e+308 | -5.84 | 5.31e-09 | -0.83 | -0.677 | -3.94 | 8e-05 |
b_log_distance_par_act | b_log_density_kid_car | -0.000876 | 1.8e+308 | -3.79 | 0.000154 | -0.00618 | -0.0402 | -4.42 | 9.98e-06 |
b_log_distance_par_act | b_log_density_par_act | -0.0854 | 1.8e+308 | -7.31 | 2.67e-13 | -0.162 | -0.102 | -6.45 | 1.15e-10 |
b_log_distance_par_act | b_log_distance_kid_act | 0.00833 | 1.8e+308 | 1.48 | 0.138 | 0.0384 | 0.849 | 0.595 | 0.552 |
b_log_distance_par_act | b_log_distance_kid_car | -0.00104 | 1.8e+308 | -2.83 | 0.00459 | -0.00759 | -0.202 | -1.22 | 0.222 |
b_log_income_k_kid_act | alpha_KID_act | 0.000423 | 1.8e+308 | -3.11 | 0.00188 | 0.00611 | 0.123 | -2.64 | 0.00826 |
b_log_income_k_kid_act | alpha_PAR_act | 0.00155 | 1.8e+308 | -2.82 | 0.0048 | 0.0107 | 0.14 | -1.96 | 0.0494 |
b_log_income_k_kid_act | alpha_kid_CAR | -0.000298 | 1.8e+308 | -1.96 | 0.0499 | -0.00158 | -0.15 | -1.88 | 0.0595 |
b_log_income_k_kid_act | alpha_par_CAR | 2.2e-07 | 1.8e+308 | -1.08 | 0.279 | 3.77e-06 | 0.0144 | -1.08 | 0.281 |
b_log_income_k_kid_act | asc_kid_act | -0.0215 | 1.8e+308 | 9.26 | 0 | -0.0126 | -0.193 | 9.39 | 0 |
b_log_income_k_kid_act | asc_kid_car | -0.00387 | 1.8e+308 | 7.77 | 8.22e-15 | 0.000178 | 0.00368 | 7.85 | 4.22e-15 |
b_log_income_k_kid_act | asc_par_act | -0.00965 | 1.8e+308 | 5.95 | 2.73e-09 | 0.00833 | 0.0525 | 4.48 | 7.43e-06 |
b_log_income_k_kid_act | b_age_kid_act | 7.68e-05 | 1.8e+308 | -7.67 | 1.67e-14 | -0.00219 | -0.0678 | -7.31 | 2.67e-13 |
b_log_income_k_kid_act | b_age_kid_car | 0.00186 | 1.8e+308 | -4.46 | 8.22e-06 | 0.00378 | 0.101 | -4.47 | 7.95e-06 |
b_log_income_k_kid_act | b_age_par_act | 0.00356 | 1.8e+308 | 1.4 | 0.161 | 0.0101 | 0.126 | 1.21 | 0.227 |
b_log_income_k_kid_act | b_female_kid_act | -4.32e-05 | 1.8e+308 | 4.5 | 6.78e-06 | 0.00303 | 0.0299 | 4.28 | 1.89e-05 |
b_log_income_k_kid_act | b_female_kid_car | -0.00165 | 1.8e+308 | 2.77 | 0.00568 | -0.0033 | -0.0837 | 2.84 | 0.00453 |
b_log_income_k_kid_act | b_female_par_act | 0.00221 | 1.8e+308 | 1.24 | 0.213 | 0.0211 | 0.0922 | 0.903 | 0.366 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 0.0158 | 1.8e+308 | -6.7 | 2.03e-11 | 0.109 | 0.0959 | -6.23 | 4.54e-10 |
b_log_income_k_kid_act | b_has_big_sib_kid_car | 0.0129 | 1.8e+308 | -5.91 | 3.48e-09 | 0.0712 | 0.0911 | -5.8 | 6.83e-09 |
b_log_income_k_kid_act | b_has_big_sib_par_act | -0.0397 | 1.8e+308 | -1.05 | 0.294 | -0.418 | -0.126 | -0.594 | 0.552 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 0.00436 | 1.8e+308 | -3.87 | 0.000107 | 0.00105 | 0.0103 | -3.75 | 0.000175 |
b_log_income_k_kid_act | b_has_lil_sib_kid_car | 0.00373 | 1.8e+308 | -4.87 | 1.09e-06 | 0.00537 | 0.0979 | -5.15 | 2.67e-07 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | -0.0016 | 1.8e+308 | -2.31 | 0.0212 | -0.027 | -0.0978 | -1.49 | 0.136 |
b_log_income_k_kid_act | b_log_density_kid_act | -0.0101 | 1.8e+308 | -5.53 | 3.13e-08 | -0.0871 | -0.142 | -4.01 | 6.04e-05 |
b_log_income_k_kid_act | b_log_density_kid_car | 0.0072 | 1.8e+308 | -2.37 | 0.0178 | 0.00481 | 0.0626 | -4.07 | 4.66e-05 |
b_log_income_k_kid_act | b_log_density_par_act | -0.0113 | 1.8e+308 | -7.05 | 1.78e-12 | -0.028 | -0.0354 | -6.28 | 3.3e-10 |
b_log_income_k_kid_act | b_log_distance_kid_act | 0.00043 | 1.8e+308 | 4.99 | 6.09e-07 | 0.00297 | 0.131 | 4.97 | 6.76e-07 |
b_log_income_k_kid_act | b_log_distance_kid_car | -0.000891 | 1.8e+308 | 1.49 | 0.136 | -0.00187 | -0.0995 | 1.45 | 0.146 |
b_log_income_k_kid_act | b_log_distance_par_act | 0.00301 | 1.8e+308 | 3.34 | 0.000825 | 0.017 | 0.161 | 1.99 | 0.0464 |
b_log_income_k_kid_car | alpha_KID_act | -9.52e-05 | 1.8e+308 | -4.6 | 4.18e-06 | -0.000699 | -0.0911 | -2.78 | 0.00543 |
b_log_income_k_kid_car | alpha_PAR_act | -0.000141 | 1.8e+308 | -3.57 | 0.000352 | -0.0012 | -0.102 | -1.71 | 0.0873 |
b_log_income_k_kid_car | alpha_kid_CAR | 3.38e-05 | 1.8e+308 | -3.5 | 0.000473 | 0.00019 | 0.117 | -5.35 | 8.83e-08 |
b_log_income_k_kid_car | alpha_par_CAR | -1.29e-06 | 1.8e+308 | -1.07 | 0.286 | 3.34e-06 | 0.0824 | -2.41 | 0.0159 |
b_log_income_k_kid_car | asc_kid_act | -0.00262 | 1.8e+308 | 13.9 | 0 | -0.00103 | -0.102 | 13.5 | 0 |
b_log_income_k_kid_car | asc_kid_car | -0.00318 | 1.8e+308 | 11.5 | 0 | -0.000113 | -0.0151 | 12.2 | 0 |
b_log_income_k_kid_car | asc_par_act | -0.00167 | 1.8e+308 | 7.04 | 1.92e-12 | -0.00248 | -0.101 | 4.85 | 1.23e-06 |
b_log_income_k_kid_car | b_age_kid_act | 6.12e-05 | 1.8e+308 | -12.1 | 0 | -0.000109 | -0.0217 | -12.8 | 0 |
b_log_income_k_kid_car | b_age_kid_car | -0.000152 | 1.8e+308 | -5.97 | 2.38e-09 | -0.000835 | -0.144 | -6.02 | 1.72e-09 |
b_log_income_k_kid_car | b_age_par_act | 0.000122 | 1.8e+308 | 2.31 | 0.0208 | -0.000743 | -0.0595 | 1.8 | 0.0719 |
b_log_income_k_kid_car | b_female_kid_act | 0.00024 | 1.8e+308 | 5.46 | 4.63e-08 | 4.63e-05 | 0.00295 | 5.11 | 3.16e-07 |
b_log_income_k_kid_car | b_female_kid_car | 0.000246 | 1.8e+308 | 4.82 | 1.43e-06 | 0.00118 | 0.194 | 5.99 | 2.03e-09 |
b_log_income_k_kid_car | b_female_par_act | -0.000165 | 1.8e+308 | 1.53 | 0.126 | -0.0025 | -0.0707 | 1.07 | 0.286 |
b_log_income_k_kid_car | b_has_big_sib_kid_act | -0.0269 | 1.8e+308 | -6.66 | 2.7e-11 | -0.0251 | -0.143 | -6.17 | 6.66e-10 |
b_log_income_k_kid_car | b_has_big_sib_kid_car | -0.0387 | 1.8e+308 | -5.84 | 5.13e-09 | -0.0318 | -0.264 | -5.71 | 1.14e-08 |
b_log_income_k_kid_car | b_has_big_sib_par_act | -0.00703 | 1.8e+308 | -1.03 | 0.303 | 0.037 | 0.0723 | -0.584 | 0.559 |
b_log_income_k_kid_car | b_has_lil_sib_kid_act | 0.00121 | 1.8e+308 | -3.88 | 0.000102 | 0.000152 | 0.00969 | -3.83 | 0.000126 |
b_log_income_k_kid_car | b_has_lil_sib_kid_car | 0.00137 | 1.8e+308 | -5.54 | 2.94e-08 | -0.000627 | -0.0741 | -5.97 | 2.32e-09 |
b_log_income_k_kid_car | b_has_lil_sib_par_act | 0.00131 | 1.8e+308 | -2.19 | 0.0283 | 0.00356 | 0.0835 | -1.41 | 0.157 |
b_log_income_k_kid_car | b_log_density_kid_act | 0.00617 | 1.8e+308 | -5.51 | 3.64e-08 | 0.0101 | 0.106 | -4.02 | 5.84e-05 |
b_log_income_k_kid_car | b_log_density_kid_car | 0.00604 | 1.8e+308 | -2.24 | 0.0251 | -0.000598 | -0.0503 | -4.26 | 2.04e-05 |
b_log_income_k_kid_car | b_log_density_par_act | 0.00364 | 1.8e+308 | -7.03 | 2.13e-12 | 0.00497 | 0.0406 | -6.27 | 3.67e-10 |
b_log_income_k_kid_car | b_log_distance_kid_act | -4.79e-05 | 1.8e+308 | 12.8 | 0 | -0.000246 | -0.0702 | 12.6 | 0 |
b_log_income_k_kid_car | b_log_distance_kid_car | 0.000152 | 1.8e+308 | 4.8 | 1.61e-06 | 0.000392 | 0.135 | 6.23 | 4.7e-10 |
b_log_income_k_kid_car | b_log_distance_par_act | -0.000152 | 1.8e+308 | 5.46 | 4.81e-08 | -0.00156 | -0.0955 | 2.41 | 0.0161 |
b_log_income_k_kid_car | b_log_income_k_kid_act | 0.00481 | 1.8e+308 | 0.733 | 0.464 | 0.000747 | 0.0916 | 0.709 | 0.478 |
b_log_income_k_par_act | alpha_KID_act | -0.000245 | 1.8e+308 | -1.61 | 0.107 | -0.0192 | -0.225 | -1.24 | 0.214 |
b_log_income_k_par_act | alpha_PAR_act | -0.00044 | 1.8e+308 | -1.46 | 0.144 | -0.0326 | -0.249 | -0.989 | 0.323 |
b_log_income_k_par_act | alpha_kid_CAR | -9.41e-05 | 1.8e+308 | -0.781 | 0.435 | 0.00342 | 0.19 | -0.731 | 0.465 |
b_log_income_k_par_act | alpha_par_CAR | -1.47e-05 | 1.8e+308 | -0.215 | 0.83 | -7.03e-05 | -0.156 | -0.197 | 0.843 |
b_log_income_k_par_act | asc_kid_act | -0.0189 | 1.8e+308 | 8.02 | 1.11e-15 | -0.0306 | -0.274 | 7.16 | 8.36e-13 |
b_log_income_k_par_act | asc_kid_car | -0.00607 | 1.8e+308 | 6.12 | 9.49e-10 | -0.0167 | -0.201 | 5.4 | 6.51e-08 |
b_log_income_k_par_act | asc_par_act | -0.0614 | 1.8e+308 | 4.91 | 9.06e-07 | -0.106 | -0.389 | 3.68 | 0.000235 |
b_log_income_k_par_act | b_age_kid_act | 0.00327 | 1.8e+308 | -4.92 | 8.5e-07 | 0.00416 | 0.0749 | -4.54 | 5.56e-06 |
b_log_income_k_par_act | b_age_kid_car | 0.00352 | 1.8e+308 | -2.67 | 0.00755 | 0.00203 | 0.0316 | -2.43 | 0.0151 |
b_log_income_k_par_act | b_age_par_act | -0.00782 | 1.8e+308 | 1.39 | 0.165 | -0.0512 | -0.369 | 1.05 | 0.295 |
b_log_income_k_par_act | b_female_kid_act | -0.00395 | 1.8e+308 | 4.12 | 3.87e-05 | -0.0268 | -0.154 | 3.57 | 0.00035 |
b_log_income_k_par_act | b_female_kid_car | -0.00336 | 1.8e+308 | 2.42 | 0.0155 | -0.00123 | -0.0182 | 2.34 | 0.0191 |
b_log_income_k_par_act | b_female_par_act | -0.00378 | 1.8e+308 | 1.37 | 0.172 | -0.0766 | -0.195 | 0.942 | 0.346 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 0.0348 | 1.8e+308 | -6.66 | 2.73e-11 | -0.164 | -0.0839 | -6.12 | 9.43e-10 |
b_log_income_k_par_act | b_has_big_sib_kid_car | 0.0536 | 1.8e+308 | -5.86 | 4.73e-09 | 0.00223 | 0.00166 | -5.69 | 1.3e-08 |
b_log_income_k_par_act | b_has_big_sib_par_act | 0.156 | 1.8e+308 | -1.03 | 0.302 | 1.23 | 0.216 | -0.587 | 0.557 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 0.00944 | 1.8e+308 | -3.09 | 0.00199 | 0.0292 | 0.167 | -3.13 | 0.00177 |
b_log_income_k_par_act | b_has_lil_sib_kid_car | 0.00596 | 1.8e+308 | -3.37 | 0.000751 | 0.00379 | 0.0402 | -3.2 | 0.00138 |
b_log_income_k_par_act | b_has_lil_sib_par_act | -0.000809 | 1.8e+308 | -1.98 | 0.0477 | 0.0859 | 0.181 | -1.41 | 0.158 |
b_log_income_k_par_act | b_log_density_kid_act | 0.00534 | 1.8e+308 | -5.41 | 6.17e-08 | 0.161 | 0.153 | -4.06 | 4.93e-05 |
b_log_income_k_par_act | b_log_density_kid_car | 0.00832 | 1.8e+308 | -1.96 | 0.0499 | 0.0114 | 0.0862 | -2.9 | 0.00376 |
b_log_income_k_par_act | b_log_density_par_act | 0.0697 | 1.8e+308 | -7.03 | 2.12e-12 | 0.075 | 0.0551 | -6.26 | 3.81e-10 |
b_log_income_k_par_act | b_log_distance_kid_act | -0.00128 | 1.8e+308 | 3.63 | 0.000282 | -0.00922 | -0.237 | 3.15 | 0.00163 |
b_log_income_k_par_act | b_log_distance_kid_car | -0.00177 | 1.8e+308 | 1.43 | 0.154 | -0.00119 | -0.0368 | 1.32 | 0.187 |
b_log_income_k_par_act | b_log_distance_par_act | -0.00541 | 1.8e+308 | 2.67 | 0.00755 | -0.0535 | -0.295 | 1.63 | 0.102 |
b_log_income_k_par_act | b_log_income_k_kid_act | 0.0326 | 1.8e+308 | 0.493 | 0.622 | 0.0276 | 0.304 | 0.434 | 0.664 |
b_log_income_k_par_act | b_log_income_k_kid_car | 0.00276 | 1.8e+308 | 0.0203 | 0.984 | 0.000763 | 0.0545 | 0.0187 | 0.985 |
b_non_work_dad_kid_ace | alpha_KID_act | -0.0195 | 1.8e+308 | -2.81 | 0.00493 | -0.0933 | -0.592 | -2.22 | 0.0261 |
b_non_work_dad_kid_ace | alpha_PAR_act | -0.0202 | 1.8e+308 | -2.73 | 0.00641 | -0.129 | -0.532 | -2.01 | 0.0446 |
b_non_work_dad_kid_ace | alpha_kid_CAR | 0.00494 | 1.8e+308 | -2.5 | 0.0124 | 0.0202 | 0.607 | -2.31 | 0.0211 |
b_non_work_dad_kid_ace | alpha_par_CAR | 7.9e-05 | 1.8e+308 | -2.16 | 0.0308 | 4.02e-05 | 0.0483 | -1.94 | 0.0526 |
b_non_work_dad_kid_ace | asc_kid_act | -0.0112 | 1.8e+308 | 3.56 | 0.000367 | -0.0587 | -0.285 | 3 | 0.00268 |
b_non_work_dad_kid_ace | asc_kid_car | 0.0186 | 1.8e+308 | 1.95 | 0.0515 | -0.0112 | -0.0727 | 1.65 | 0.0988 |
b_non_work_dad_kid_ace | asc_par_act | -0.019 | 1.8e+308 | 2.47 | 0.0135 | -0.174 | -0.345 | 1.76 | 0.0789 |
b_non_work_dad_kid_ace | b_age_kid_act | -0.0158 | 1.8e+308 | -4.62 | 3.8e-06 | -0.0198 | -0.193 | -4.15 | 3.28e-05 |
b_non_work_dad_kid_ace | b_age_kid_car | -0.0262 | 1.8e+308 | -3.33 | 0.000877 | -0.0464 | -0.39 | -2.93 | 0.00342 |
b_non_work_dad_kid_ace | b_age_par_act | 0.00415 | 1.8e+308 | -0.982 | 0.326 | -0.0713 | -0.278 | -0.77 | 0.441 |
b_non_work_dad_kid_ace | b_female_kid_act | 0.00119 | 1.8e+308 | 1.22 | 0.222 | -0.0752 | -0.233 | 1 | 0.316 |
b_non_work_dad_kid_ace | b_female_kid_car | 0.0234 | 1.8e+308 | -0.493 | 0.622 | 0.0478 | 0.383 | -0.468 | 0.64 |
b_non_work_dad_kid_ace | b_female_par_act | -0.0411 | 1.8e+308 | -0.262 | 0.793 | -0.302 | -0.417 | -0.179 | 0.858 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | -0.393 | 1.8e+308 | -6.77 | 1.3e-11 | -1.19 | -0.329 | -6.1 | 1.08e-09 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_car | -0.567 | 1.8e+308 | -5.86 | 4.53e-09 | -1.03 | -0.415 | -5.53 | 3.24e-08 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 0.54 | 1.8e+308 | -1.2 | 0.23 | 4.71 | 0.448 | -0.691 | 0.49 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 0.00548 | 1.8e+308 | -3.89 | 9.85e-05 | 0.0706 | 0.219 | -3.96 | 7.62e-05 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_car | -0.0352 | 1.8e+308 | -3.71 | 0.00021 | -0.0647 | -0.372 | -3.29 | 0.00102 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 0.0369 | 1.8e+308 | -3.1 | 0.00191 | 0.355 | 0.405 | -2.69 | 0.0072 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 0.191 | 1.8e+308 | -6.15 | 7.81e-10 | 0.919 | 0.473 | -4.99 | 5.92e-07 |
b_non_work_dad_kid_ace | b_log_density_kid_car | -0.041 | 1.8e+308 | -2.87 | 0.00409 | -0.0347 | -0.142 | -3.28 | 0.00104 |
b_non_work_dad_kid_ace | b_log_density_par_act | -0.0737 | 1.8e+308 | -7.24 | 4.48e-13 | -0.157 | -0.0625 | -6.43 | 1.31e-10 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | -0.002 | 1.8e+308 | 0.0247 | 0.98 | -0.028 | -0.39 | 0.0211 | 0.983 |
b_non_work_dad_kid_ace | b_log_distance_kid_car | 0.0122 | 1.8e+308 | -1.25 | 0.212 | 0.0227 | 0.38 | -1.14 | 0.255 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -0.019 | 1.8e+308 | -0.296 | 0.767 | -0.166 | -0.494 | -0.202 | 0.84 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 0.0197 | 1.8e+308 | -1.75 | 0.0794 | 0.00714 | 0.0426 | -1.54 | 0.123 |
b_non_work_dad_kid_ace | b_log_income_k_kid_car | 0.00105 | 1.8e+308 | -2.02 | 0.0435 | 0.00214 | 0.0826 | -1.83 | 0.0678 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 0.0148 | 1.8e+308 | -1.83 | 0.0667 | 0.0512 | 0.178 | -1.75 | 0.0809 |
b_non_work_dad_kid_car | alpha_KID_act | -0.00387 | 1.8e+308 | -5.85 | 4.87e-09 | -0.0139 | -0.295 | -5.37 | 7.72e-08 |
b_non_work_dad_kid_car | alpha_PAR_act | -0.00439 | 1.8e+308 | -5.49 | 4.01e-08 | -0.0195 | -0.269 | -4.15 | 3.38e-05 |
b_non_work_dad_kid_car | alpha_kid_CAR | 0.00223 | 1.8e+308 | -5.49 | 4.1e-08 | 0.0047 | 0.47 | -7.71 | 1.22e-14 |
b_non_work_dad_kid_car | alpha_par_CAR | 8.41e-05 | 1.8e+308 | -4.65 | 3.26e-06 | 0.000156 | 0.624 | -6.18 | 6.4e-10 |
b_non_work_dad_kid_car | asc_kid_act | 0.00577 | 1.8e+308 | 7.04 | 1.99e-12 | -0.00579 | -0.0936 | 7.04 | 1.92e-12 |
b_non_work_dad_kid_car | asc_kid_car | 0.0308 | 1.8e+308 | 5.42 | 5.98e-08 | 0.0279 | 0.606 | 7.03 | 2.1e-12 |
b_non_work_dad_kid_car | asc_par_act | 0.000204 | 1.8e+308 | 3.83 | 0.000128 | -0.0255 | -0.168 | 2.78 | 0.00543 |
b_non_work_dad_kid_car | b_age_kid_act | -0.0115 | 1.8e+308 | -8.86 | 0 | -0.00999 | -0.324 | -10.6 | 0 |
b_non_work_dad_kid_car | b_age_kid_car | -0.0276 | 1.8e+308 | -5.7 | 1.23e-08 | -0.0324 | -0.909 | -6.15 | 7.57e-10 |
b_non_work_dad_kid_car | b_age_par_act | 0.00134 | 1.8e+308 | -1.6 | 0.11 | -0.00898 | -0.117 | -1.43 | 0.152 |
b_non_work_dad_kid_car | b_female_kid_act | 0.00163 | 1.8e+308 | 2.02 | 0.0434 | -0.00858 | -0.0887 | 1.97 | 0.0492 |
b_non_work_dad_kid_car | b_female_kid_car | 0.023 | 1.8e+308 | -0.925 | 0.355 | 0.032 | 0.853 | -2.21 | 0.0271 |
b_non_work_dad_kid_car | b_female_par_act | -0.0082 | 1.8e+308 | -0.258 | 0.796 | -0.0429 | -0.197 | -0.185 | 0.853 |
b_non_work_dad_kid_car | b_has_big_sib_kid_act | -0.323 | 1.8e+308 | -6.83 | 8.53e-12 | -0.355 | -0.328 | -6.34 | 2.32e-10 |
b_non_work_dad_kid_car | b_has_big_sib_kid_car | -0.612 | 1.8e+308 | -5.91 | 3.52e-09 | -0.68 | -0.913 | -5.76 | 8.61e-09 |
b_non_work_dad_kid_car | b_has_big_sib_par_act | -0.0245 | 1.8e+308 | -1.18 | 0.236 | 0.624 | 0.198 | -0.674 | 0.501 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_act | -0.0189 | 1.8e+308 | -5.33 | 9.98e-08 | -0.011 | -0.113 | -5.75 | 8.96e-09 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_car | -0.0365 | 1.8e+308 | -5.77 | 8.08e-09 | -0.0457 | -0.876 | -6.14 | 8.37e-10 |
b_non_work_dad_kid_car | b_has_lil_sib_par_act | -0.00386 | 1.8e+308 | -3.57 | 0.000354 | 0.0449 | 0.171 | -2.5 | 0.0125 |
b_non_work_dad_kid_car | b_log_density_kid_act | 0.1 | 1.8e+308 | -6.25 | 4.11e-10 | 0.254 | 0.435 | -4.64 | 3.48e-06 |
b_non_work_dad_kid_car | b_log_density_kid_car | -0.0523 | 1.8e+308 | -3.47 | 0.000528 | -0.0402 | -0.549 | -5.52 | 3.46e-08 |
b_non_work_dad_kid_car | b_log_density_par_act | 0.00531 | 1.8e+308 | -7.41 | 1.29e-13 | 0.0106 | 0.0141 | -6.62 | 3.49e-11 |
b_non_work_dad_kid_car | b_log_distance_kid_act | 0.000847 | 1.8e+308 | 0.273 | 0.785 | -0.00197 | -0.0914 | 0.325 | 0.745 |
b_non_work_dad_kid_car | b_log_distance_kid_car | 0.0126 | 1.8e+308 | -2.88 | 0.00392 | 0.016 | 0.892 | -4.89 | 1.02e-06 |
b_non_work_dad_kid_car | b_log_distance_par_act | -0.0031 | 1.8e+308 | -0.41 | 0.682 | -0.0238 | -0.236 | -0.262 | 0.793 |
b_non_work_dad_kid_car | b_log_income_k_kid_act | -0.00136 | 1.8e+308 | -2.95 | 0.00318 | -0.00479 | -0.0952 | -3.31 | 0.000917 |
b_non_work_dad_kid_car | b_log_income_k_kid_car | 0.000932 | 1.8e+308 | -4.24 | 2.22e-05 | 0.00147 | 0.189 | -5.87 | 4.24e-09 |
b_non_work_dad_kid_car | b_log_income_k_par_act | -0.00317 | 1.8e+308 | -2.7 | 0.00698 | -0.000758 | -0.00877 | -2.8 | 0.00504 |
b_non_work_dad_kid_car | b_non_work_dad_kid_ace | 0.0698 | 1.8e+308 | 0.105 | 0.916 | 0.0659 | 0.413 | 0.0961 | 0.923 |
b_non_work_dad_par_act | alpha_KID_act | 0.0347 | 1.8e+308 | -0.0324 | 0.974 | 0.179 | 0.628 | -0.0283 | 0.977 |
b_non_work_dad_par_act | alpha_PAR_act | 0.0398 | 1.8e+308 | 0.00713 | 0.994 | 0.249 | 0.568 | 0.0064 | 0.995 |
b_non_work_dad_par_act | alpha_kid_CAR | -0.00593 | 1.8e+308 | 0.271 | 0.787 | -0.0341 | -0.565 | 0.217 | 0.828 |
b_non_work_dad_par_act | alpha_par_CAR | 7.58e-05 | 1.8e+308 | 0.464 | 0.643 | 0.000312 | 0.207 | 0.377 | 0.706 |
b_non_work_dad_par_act | asc_kid_act | -0.00732 | 1.8e+308 | 4.02 | 5.71e-05 | 0.0681 | 0.182 | 3.44 | 0.000579 |
b_non_work_dad_par_act | asc_kid_car | 0.0246 | 1.8e+308 | 2.98 | 0.00288 | 0.0965 | 0.347 | 2.52 | 0.0117 |
b_non_work_dad_par_act | asc_par_act | -0.007 | 1.8e+308 | 3.36 | 0.000782 | 0.278 | 0.305 | 3.07 | 0.00218 |
b_non_work_dad_par_act | b_age_kid_act | 0.00678 | 1.8e+308 | -1.19 | 0.234 | 0.0195 | 0.105 | -0.975 | 0.329 |
b_non_work_dad_par_act | b_age_kid_car | -0.00155 | 1.8e+308 | -0.414 | 0.679 | 0.0231 | 0.107 | -0.343 | 0.732 |
b_non_work_dad_par_act | b_age_par_act | -0.02 | 1.8e+308 | 1.09 | 0.277 | 0.121 | 0.261 | 0.959 | 0.338 |
b_non_work_dad_par_act | b_female_kid_act | 0.0197 | 1.8e+308 | 2.52 | 0.0118 | 0.147 | 0.251 | 2.22 | 0.0264 |
b_non_work_dad_par_act | b_female_kid_car | -0.00102 | 1.8e+308 | 1.46 | 0.145 | -0.0277 | -0.122 | 1.18 | 0.239 |
b_non_work_dad_par_act | b_female_par_act | 0.116 | 1.8e+308 | 1.39 | 0.163 | 0.637 | 0.484 | 1.36 | 0.173 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 0.263 | 1.8e+308 | -6.45 | 1.13e-10 | 1.83 | 0.279 | -6.31 | 2.74e-10 |
b_non_work_dad_par_act | b_has_big_sib_kid_car | -0.0227 | 1.8e+308 | -5.4 | 6.55e-08 | 0.653 | 0.145 | -5.45 | 5.03e-08 |
b_non_work_dad_par_act | b_has_big_sib_par_act | -1.47 | 1.8e+308 | -0.931 | 0.352 | -9.58 | -0.503 | -0.518 | 0.604 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | -0.0147 | 1.8e+308 | -0.954 | 0.34 | -0.123 | -0.21 | -0.756 | 0.45 |
b_non_work_dad_par_act | b_has_lil_sib_kid_car | -0.00202 | 1.8e+308 | -0.788 | 0.43 | 0.0299 | 0.095 | -0.661 | 0.509 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | -0.0368 | 1.8e+308 | -0.824 | 0.41 | -0.579 | -0.364 | -0.534 | 0.594 |
b_non_work_dad_par_act | b_log_density_kid_act | -0.162 | 1.8e+308 | -4.41 | 1.02e-05 | -1.36 | -0.387 | -2.97 | 0.00295 |
b_non_work_dad_par_act | b_log_density_kid_car | -0.0151 | 1.8e+308 | -0.678 | 0.498 | -0.0168 | -0.038 | -0.624 | 0.533 |
b_non_work_dad_par_act | b_log_density_par_act | 0.132 | 1.8e+308 | -6.53 | 6.37e-11 | 0.401 | 0.088 | -5.87 | 4.43e-09 |
b_non_work_dad_par_act | b_log_distance_kid_act | 0.00412 | 1.8e+308 | 1.8 | 0.0723 | 0.054 | 0.415 | 1.5 | 0.133 |
b_non_work_dad_par_act | b_log_distance_kid_car | 0.000508 | 1.8e+308 | 1.03 | 0.302 | -0.0107 | -0.0986 | 0.834 | 0.404 |
b_non_work_dad_par_act | b_log_distance_par_act | 0.0351 | 1.8e+308 | 1.61 | 0.108 | 0.321 | 0.529 | 1.48 | 0.138 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 0.0146 | 1.8e+308 | 0.688 | 0.492 | 0.0355 | 0.117 | 0.568 | 0.57 |
b_non_work_dad_par_act | b_log_income_k_kid_car | 0.000173 | 1.8e+308 | 0.542 | 0.588 | -0.00207 | -0.0442 | 0.441 | 0.659 |
b_non_work_dad_par_act | b_log_income_k_par_act | 0.0282 | 1.8e+308 | 0.52 | 0.603 | -0.0286 | -0.0548 | 0.412 | 0.681 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 0.17 | 1.8e+308 | 1.71 | 0.0864 | -0.186 | -0.193 | 1.17 | 0.24 |
b_non_work_dad_par_act | b_non_work_dad_kid_car | 0.0217 | 1.8e+308 | 1.69 | 0.0911 | -0.0341 | -0.118 | 1.35 | 0.176 |
b_non_work_mom_kid_act | alpha_KID_act | -0.0104 | 1.8e+308 | -3.87 | 0.000108 | -0.0476 | -0.4 | -3.19 | 0.00141 |
b_non_work_mom_kid_act | alpha_PAR_act | -0.0163 | 1.8e+308 | -3.68 | 0.000235 | -0.0777 | -0.426 | -2.77 | 0.00562 |
b_non_work_mom_kid_act | alpha_kid_CAR | 0.00465 | 1.8e+308 | -3.53 | 0.000422 | 0.0122 | 0.487 | -3.4 | 0.000664 |
b_non_work_mom_kid_act | alpha_par_CAR | 0.000119 | 1.8e+308 | -3.07 | 0.00212 | 0.000183 | 0.291 | -2.9 | 0.0037 |
b_non_work_mom_kid_act | asc_kid_act | -0.0136 | 1.8e+308 | 3.94 | 8.05e-05 | -0.034 | -0.219 | 3.54 | 0.000394 |
b_non_work_mom_kid_act | asc_kid_car | 0.0419 | 1.8e+308 | 2.3 | 0.0212 | 0.0277 | 0.239 | 2.02 | 0.0431 |
b_non_work_mom_kid_act | asc_par_act | -0.0288 | 1.8e+308 | 2.52 | 0.0118 | -0.126 | -0.331 | 1.83 | 0.0667 |
b_non_work_mom_kid_act | b_age_kid_act | -0.0136 | 1.8e+308 | -6.02 | 1.77e-09 | -0.0158 | -0.205 | -5.67 | 1.41e-08 |
b_non_work_mom_kid_act | b_age_kid_car | -0.0439 | 1.8e+308 | -4.12 | 3.74e-05 | -0.0531 | -0.592 | -3.86 | 0.000115 |
b_non_work_mom_kid_act | b_age_par_act | 0.00971 | 1.8e+308 | -1.54 | 0.124 | -0.0335 | -0.173 | -1.24 | 0.215 |
b_non_work_mom_kid_act | b_female_kid_act | -0.000971 | 1.8e+308 | 1.14 | 0.254 | -0.0394 | -0.162 | 0.995 | 0.32 |
b_non_work_mom_kid_act | b_female_kid_car | 0.0422 | 1.8e+308 | -1.06 | 0.287 | 0.0528 | 0.56 | -1.06 | 0.291 |
b_non_work_mom_kid_act | b_female_par_act | -0.0354 | 1.8e+308 | -0.491 | 0.624 | -0.178 | -0.324 | -0.346 | 0.729 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -0.455 | 1.8e+308 | -6.81 | 9.58e-12 | -0.89 | -0.327 | -6.23 | 4.77e-10 |
b_non_work_mom_kid_act | b_has_big_sib_kid_car | -0.898 | 1.8e+308 | -5.8 | 6.62e-09 | -1.13 | -0.601 | -5.58 | 2.35e-08 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | 0.264 | 1.8e+308 | -1.22 | 0.223 | 2.74 | 0.345 | -0.698 | 0.485 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -0.0378 | 1.8e+308 | -4.4 | 1.09e-05 | -0.0119 | -0.049 | -4.44 | 8.85e-06 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_car | -0.06 | 1.8e+308 | -4.4 | 1.1e-05 | -0.0736 | -0.561 | -4.17 | 3.08e-05 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | 0.00807 | 1.8e+308 | -3.48 | 0.000498 | 0.203 | 0.307 | -2.77 | 0.0056 |
b_non_work_mom_kid_act | b_log_density_kid_act | 0.227 | 1.8e+308 | -6.44 | 1.21e-10 | 0.621 | 0.423 | -4.92 | 8.82e-07 |
b_non_work_mom_kid_act | b_log_density_kid_car | -0.0603 | 1.8e+308 | -3.28 | 0.00104 | -0.0541 | -0.294 | -4.08 | 4.45e-05 |
b_non_work_mom_kid_act | b_log_density_par_act | 0.0345 | 1.8e+308 | -7.44 | 1.02e-13 | 0.0249 | 0.0131 | -6.63 | 3.28e-11 |
b_non_work_mom_kid_act | b_log_distance_kid_act | -0.00158 | 1.8e+308 | -0.318 | 0.751 | -0.0146 | -0.27 | -0.286 | 0.775 |
b_non_work_mom_kid_act | b_log_distance_kid_car | 0.0222 | 1.8e+308 | -2.04 | 0.0411 | 0.0264 | 0.585 | -1.94 | 0.0523 |
b_non_work_mom_kid_act | b_log_distance_par_act | -0.0164 | 1.8e+308 | -0.676 | 0.499 | -0.101 | -0.399 | -0.465 | 0.642 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 0.0161 | 1.8e+308 | -2.5 | 0.0123 | 0.0024 | 0.0189 | -2.28 | 0.0228 |
b_non_work_mom_kid_act | b_log_income_k_kid_car | 0.00431 | 1.8e+308 | -2.92 | 0.0035 | 0.00282 | 0.144 | -2.77 | 0.00567 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 0.0018 | 1.8e+308 | -2.41 | 0.0161 | 0.0104 | 0.0481 | -2.3 | 0.0217 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | 0.0371 | 1.8e+308 | -0.233 | 0.816 | 0.119 | 0.297 | -0.238 | 0.812 |
b_non_work_mom_kid_act | b_non_work_dad_kid_car | 0.054 | 1.8e+308 | -0.5 | 0.617 | 0.0676 | 0.561 | -0.534 | 0.593 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -0.0219 | 1.8e+308 | -1.73 | 0.0838 | -0.152 | -0.209 | -1.37 | 0.172 |
b_non_work_mom_kid_car | alpha_KID_act | -0.00749 | 1.8e+308 | -7.32 | 2.44e-13 | -0.0257 | -0.309 | -5.93 | 2.99e-09 |
b_non_work_mom_kid_car | alpha_PAR_act | -0.00873 | 1.8e+308 | -7 | 2.61e-12 | -0.0359 | -0.282 | -5.05 | 4.39e-07 |
b_non_work_mom_kid_car | alpha_kid_CAR | 0.00416 | 1.8e+308 | -7.33 | 2.29e-13 | 0.00884 | 0.503 | -7.19 | 6.29e-13 |
b_non_work_mom_kid_car | alpha_par_CAR | 0.000105 | 1.8e+308 | -6.56 | 5.3e-11 | 0.000302 | 0.689 | -6.28 | 3.38e-10 |
b_non_work_mom_kid_car | asc_kid_act | 0.00535 | 1.8e+308 | 3.59 | 0.000334 | -0.0115 | -0.106 | 3.13 | 0.00173 |
b_non_work_mom_kid_car | asc_kid_car | 0.0528 | 1.8e+308 | 1.08 | 0.28 | 0.0533 | 0.658 | 0.963 | 0.335 |
b_non_work_mom_kid_car | asc_par_act | -0.00392 | 1.8e+308 | 1.75 | 0.0808 | -0.0481 | -0.181 | 1.24 | 0.216 |
b_non_work_mom_kid_car | b_age_kid_act | -0.0202 | 1.8e+308 | -9.54 | 0 | -0.019 | -0.351 | -9.24 | 0 |
b_non_work_mom_kid_car | b_age_kid_car | -0.0514 | 1.8e+308 | -6.57 | 5.05e-11 | -0.0617 | -0.986 | -6.15 | 7.64e-10 |
b_non_work_mom_kid_car | b_age_par_act | 0.00506 | 1.8e+308 | -3.81 | 0.000139 | -0.0146 | -0.108 | -3.07 | 0.00214 |
b_non_work_mom_kid_car | b_female_kid_act | 0.00405 | 1.8e+308 | -0.103 | 0.918 | -0.0159 | -0.0936 | -0.0907 | 0.928 |
b_non_work_mom_kid_car | b_female_kid_car | 0.0488 | 1.8e+308 | -4.79 | 1.63e-06 | 0.0613 | 0.931 | -5.64 | 1.72e-08 |
b_non_work_mom_kid_car | b_female_par_act | -0.016 | 1.8e+308 | -1.56 | 0.118 | -0.0792 | -0.207 | -1.1 | 0.27 |
b_non_work_mom_kid_car | b_has_big_sib_kid_act | -0.543 | 1.8e+308 | -6.98 | 2.99e-12 | -0.661 | -0.347 | -6.46 | 1.06e-10 |
b_non_work_mom_kid_car | b_has_big_sib_kid_car | -1.06 | 1.8e+308 | -5.98 | 2.2e-09 | -1.27 | -0.973 | -5.77 | 7.85e-09 |
b_non_work_mom_kid_car | b_has_big_sib_par_act | 0.000278 | 1.8e+308 | -1.31 | 0.189 | 1.14 | 0.206 | -0.749 | 0.454 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_act | -0.0362 | 1.8e+308 | -6.4 | 1.53e-10 | -0.0203 | -0.119 | -6.49 | 8.44e-11 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_car | -0.0697 | 1.8e+308 | -6.48 | 8.91e-11 | -0.0867 | -0.947 | -6.15 | 7.95e-10 |
b_non_work_mom_kid_car | b_has_lil_sib_par_act | -0.00644 | 1.8e+308 | -4.66 | 3.1e-06 | 0.085 | 0.184 | -3.37 | 0.000751 |
b_non_work_mom_kid_car | b_log_density_kid_act | 0.229 | 1.8e+308 | -7 | 2.49e-12 | 0.486 | 0.474 | -5.2 | 2.04e-07 |
b_non_work_mom_kid_car | b_log_density_kid_car | -0.0684 | 1.8e+308 | -4.53 | 6.04e-06 | -0.0744 | -0.578 | -5.89 | 3.87e-09 |
b_non_work_mom_kid_car | b_log_density_par_act | 0.0294 | 1.8e+308 | -7.75 | 9.1e-15 | 0.0275 | 0.0207 | -6.91 | 4.77e-12 |
b_non_work_mom_kid_car | b_log_distance_kid_act | 0.00187 | 1.8e+308 | -2.66 | 0.00788 | -0.00329 | -0.0868 | -2.42 | 0.0156 |
b_non_work_mom_kid_car | b_log_distance_kid_car | 0.0259 | 1.8e+308 | -6.01 | 1.84e-09 | 0.0309 | 0.982 | -5.9 | 3.61e-09 |
b_non_work_mom_kid_car | b_log_distance_par_act | -0.00602 | 1.8e+308 | -2.82 | 0.00477 | -0.0433 | -0.245 | -1.8 | 0.0711 |
b_non_work_mom_kid_car | b_log_income_k_kid_act | -0.000269 | 1.8e+308 | -4.98 | 6.21e-07 | -0.00841 | -0.0953 | -4.63 | 3.57e-06 |
b_non_work_mom_kid_car | b_log_income_k_kid_car | 0.00591 | 1.8e+308 | -6.46 | 1.08e-10 | 0.00305 | 0.224 | -6.15 | 7.9e-10 |
b_non_work_mom_kid_car | b_log_income_k_par_act | -0.00574 | 1.8e+308 | -4.42 | 9.81e-06 | -0.00281 | -0.0186 | -4.19 | 2.78e-05 |
b_non_work_mom_kid_car | b_non_work_dad_kid_ace | 0.0614 | 1.8e+308 | -1.5 | 0.134 | 0.112 | 0.4 | -1.48 | 0.14 |
b_non_work_mom_kid_car | b_non_work_dad_kid_car | 0.0652 | 1.8e+308 | -3.56 | 0.000374 | 0.077 | 0.915 | -5.2 | 2.04e-07 |
b_non_work_mom_kid_car | b_non_work_dad_par_act | 0.00315 | 1.8e+308 | -2.57 | 0.0103 | -0.0609 | -0.12 | -2.05 | 0.0407 |
b_non_work_mom_kid_car | b_non_work_mom_kid_act | 0.113 | 1.8e+308 | -1.92 | 0.0551 | 0.128 | 0.607 | -1.84 | 0.0652 |
b_non_work_mom_par_act | alpha_KID_act | 0.00252 | 1.8e+308 | 0.851 | 0.395 | -0.024 | -0.154 | 0.795 | 0.427 |
b_non_work_mom_par_act | alpha_PAR_act | 0.000459 | 1.8e+308 | 0.897 | 0.37 | -0.0334 | -0.14 | 0.796 | 0.426 |
b_non_work_mom_par_act | alpha_kid_CAR | 0.00147 | 1.8e+308 | 1.31 | 0.191 | 0.00692 | 0.21 | 1.33 | 0.183 |
b_non_work_mom_par_act | alpha_par_CAR | 2.67e-05 | 1.8e+308 | 1.59 | 0.112 | 3.96e-05 | 0.0483 | 1.6 | 0.109 |
b_non_work_mom_par_act | asc_kid_act | -0.0256 | 1.8e+308 | 6.38 | 1.76e-10 | -0.0387 | -0.19 | 6.24 | 4.24e-10 |
b_non_work_mom_par_act | asc_kid_car | 0.0146 | 1.8e+308 | 5.24 | 1.59e-07 | 0.00212 | 0.014 | 5.15 | 2.65e-07 |
b_non_work_mom_par_act | asc_par_act | -0.0679 | 1.8e+308 | 4.91 | 9.25e-07 | -0.107 | -0.214 | 4.2 | 2.7e-05 |
b_non_work_mom_par_act | b_age_kid_act | 0.00866 | 1.8e+308 | -0.861 | 0.389 | 0.00856 | 0.0845 | -0.868 | 0.386 |
b_non_work_mom_par_act | b_age_kid_car | -0.0147 | 1.8e+308 | 0.27 | 0.787 | -0.02 | -0.17 | 0.269 | 0.788 |
b_non_work_mom_par_act | b_age_par_act | -0.0405 | 1.8e+308 | 2.28 | 0.0226 | -0.072 | -0.285 | 2.12 | 0.034 |
b_non_work_mom_par_act | b_female_kid_act | -0.0136 | 1.8e+308 | 4.13 | 3.66e-05 | -0.0341 | -0.107 | 3.97 | 7.26e-05 |
b_non_work_mom_par_act | b_female_kid_car | 0.014 | 1.8e+308 | 3.06 | 0.00218 | 0.0203 | 0.165 | 3.16 | 0.00159 |
b_non_work_mom_par_act | b_female_par_act | -0.011 | 1.8e+308 | 2.27 | 0.0231 | -0.0684 | -0.0954 | 1.8 | 0.0723 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | -0.0775 | 1.8e+308 | -6.3 | 2.98e-10 | -0.363 | -0.102 | -5.79 | 7.24e-09 |
b_non_work_mom_par_act | b_has_big_sib_kid_car | -0.316 | 1.8e+308 | -5.22 | 1.75e-07 | -0.449 | -0.183 | -5.06 | 4.19e-07 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -0.00421 | 1.8e+308 | -0.876 | 0.381 | 1.45 | 0.14 | -0.501 | 0.616 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -0.0142 | 1.8e+308 | -0.535 | 0.593 | 0.000424 | 0.00133 | -0.547 | 0.584 |
b_non_work_mom_par_act | b_has_lil_sib_kid_car | -0.0204 | 1.8e+308 | -0.272 | 0.786 | -0.0277 | -0.162 | -0.272 | 0.785 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | -0.0219 | 1.8e+308 | -0.423 | 0.672 | 0.0737 | 0.0853 | -0.339 | 0.734 |
b_non_work_mom_par_act | b_log_density_kid_act | 0.0914 | 1.8e+308 | -4.66 | 3.19e-06 | 0.312 | 0.163 | -3.58 | 0.000349 |
b_non_work_mom_par_act | b_log_density_kid_car | -0.0269 | 1.8e+308 | -0.202 | 0.84 | -0.0228 | -0.0946 | -0.246 | 0.805 |
b_non_work_mom_par_act | b_log_density_par_act | 0.14 | 1.8e+308 | -6.54 | 6.27e-11 | 0.126 | 0.0506 | -5.84 | 5.2e-09 |
b_non_work_mom_par_act | b_log_distance_kid_act | -0.0063 | 1.8e+308 | 3.5 | 0.000469 | -0.0132 | -0.186 | 3.47 | 0.000517 |
b_non_work_mom_par_act | b_log_distance_kid_car | 0.0075 | 1.8e+308 | 2.45 | 0.0142 | 0.00982 | 0.167 | 2.49 | 0.0129 |
b_non_work_mom_par_act | b_log_distance_par_act | -0.0124 | 1.8e+308 | 3.07 | 0.00211 | -0.0588 | -0.178 | 2.56 | 0.0104 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 0.00441 | 1.8e+308 | 1.85 | 0.0637 | -0.00421 | -0.0254 | 1.84 | 0.0654 |
b_non_work_mom_par_act | b_log_income_k_kid_car | 0.00185 | 1.8e+308 | 1.7 | 0.0889 | 0.00135 | 0.053 | 1.73 | 0.0845 |
b_non_work_mom_par_act | b_log_income_k_par_act | 0.0783 | 1.8e+308 | 1.74 | 0.0823 | 0.0918 | 0.323 | 1.76 | 0.0783 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | 0.00516 | 1.8e+308 | 2.64 | 0.00831 | 0.071 | 0.135 | 2.7 | 0.00703 |
b_non_work_mom_par_act | b_non_work_dad_kid_car | 0.0198 | 1.8e+308 | 3.31 | 0.000944 | 0.0284 | 0.18 | 3.51 | 0.00045 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -0.0268 | 1.8e+308 | 0.498 | 0.619 | -0.0879 | -0.0924 | 0.42 | 0.675 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 0.128 | 1.8e+308 | 3.74 | 0.000187 | 0.139 | 0.35 | 3.73 | 0.00019 |
b_non_work_mom_par_act | b_non_work_mom_kid_car | 0.0404 | 1.8e+308 | 4.67 | 3.04e-06 | 0.0494 | 0.179 | 4.73 | 2.22e-06 |
b_veh_per_driver_kid_act | alpha_KID_act | 0.011 | 1.8e+308 | -4.93 | 8.39e-07 | 0.0425 | 0.395 | -4.79 | 1.65e-06 |
b_veh_per_driver_kid_act | alpha_PAR_act | 0.0152 | 1.8e+308 | -4.84 | 1.31e-06 | 0.0625 | 0.379 | -4.46 | 8.17e-06 |
b_veh_per_driver_kid_act | alpha_kid_CAR | -0.00419 | 1.8e+308 | -4 | 6.31e-05 | -0.011 | -0.485 | -3.58 | 0.000343 |
b_veh_per_driver_kid_act | alpha_par_CAR | -4.11e-05 | 1.8e+308 | -3.63 | 0.000278 | -6.75e-05 | -0.119 | -3.34 | 0.000849 |
b_veh_per_driver_kid_act | asc_kid_act | -0.000232 | 1.8e+308 | 4.41 | 1.06e-05 | 0.0255 | 0.181 | 4.4 | 1.07e-05 |
b_veh_per_driver_kid_act | asc_kid_car | -0.0149 | 1.8e+308 | 1.95 | 0.0509 | -0.00496 | -0.0473 | 1.87 | 0.0613 |
b_veh_per_driver_kid_act | asc_par_act | 0.0194 | 1.8e+308 | 2.88 | 0.00398 | 0.0936 | 0.272 | 2.45 | 0.0142 |
b_veh_per_driver_kid_act | b_age_kid_act | 0.00195 | 1.8e+308 | -7.3 | 2.97e-13 | 0.00451 | 0.0644 | -6.77 | 1.31e-11 |
b_veh_per_driver_kid_act | b_age_kid_car | 0.0211 | 1.8e+308 | -5.99 | 2.13e-09 | 0.0326 | 0.402 | -5.71 | 1.16e-08 |
b_veh_per_driver_kid_act | b_age_par_act | -0.0127 | 1.8e+308 | -1.7 | 0.0899 | 0.0156 | 0.0894 | -1.6 | 0.108 |
b_veh_per_driver_kid_act | b_female_kid_act | 0.0239 | 1.8e+308 | 1.21 | 0.227 | 0.0609 | 0.277 | 1.22 | 0.223 |
b_veh_per_driver_kid_act | b_female_kid_car | -0.0181 | 1.8e+308 | -1.07 | 0.286 | -0.032 | -0.376 | -0.971 | 0.331 |
b_veh_per_driver_kid_act | b_female_par_act | 0.0433 | 1.8e+308 | -0.656 | 0.512 | 0.159 | 0.322 | -0.53 | 0.596 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 0.17 | 1.8e+308 | -7.04 | 1.96e-12 | 0.509 | 0.206 | -6.6 | 4.03e-11 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_car | 0.382 | 1.8e+308 | -6.51 | 7.73e-11 | 0.671 | 0.396 | -6.5 | 7.88e-11 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | -0.334 | 1.8e+308 | -1.22 | 0.224 | -2.17 | -0.303 | -0.686 | 0.493 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | 0.00669 | 1.8e+308 | -5.29 | 1.2e-07 | -0.0231 | -0.105 | -4.68 | 2.84e-06 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_car | 0.0298 | 1.8e+308 | -6.55 | 5.88e-11 | 0.0457 | 0.385 | -6.56 | 5.23e-11 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | -0.0292 | 1.8e+308 | -3.52 | 0.000424 | -0.184 | -0.307 | -2.28 | 0.0226 |
b_veh_per_driver_kid_act | b_log_density_kid_act | -0.212 | 1.8e+308 | -5.84 | 5.13e-09 | -0.592 | -0.446 | -4.2 | 2.65e-05 |
b_veh_per_driver_kid_act | b_log_density_kid_car | 0.0252 | 1.8e+308 | -3.97 | 7.3e-05 | 0.0326 | 0.195 | -5.56 | 2.73e-08 |
b_veh_per_driver_kid_act | b_log_density_par_act | -0.0425 | 1.8e+308 | -7.42 | 1.14e-13 | -0.0112 | -0.0065 | -6.65 | 2.98e-11 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 0.00579 | 1.8e+308 | -0.516 | 0.606 | 0.0167 | 0.34 | -0.49 | 0.624 |
b_veh_per_driver_kid_act | b_log_distance_kid_car | -0.0108 | 1.8e+308 | -2.15 | 0.0312 | -0.0163 | -0.399 | -1.96 | 0.0505 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 0.0173 | 1.8e+308 | -1 | 0.317 | 0.0814 | 0.356 | -0.841 | 0.4 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -0.00851 | 1.8e+308 | -2.68 | 0.00738 | -0.0055 | -0.0481 | -2.53 | 0.0113 |
b_veh_per_driver_kid_act | b_log_income_k_kid_car | -0.00141 | 1.8e+308 | -3.37 | 0.000739 | -0.00102 | -0.0579 | -3.14 | 0.00166 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -7.7e-05 | 1.8e+308 | -2.71 | 0.00665 | -0.00941 | -0.0479 | -2.44 | 0.0149 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | -0.0175 | 1.8e+308 | -0.303 | 0.762 | -0.0967 | -0.266 | -0.252 | 0.801 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_car | -0.0228 | 1.8e+308 | -0.537 | 0.591 | -0.0398 | -0.365 | -0.51 | 0.61 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 0.0284 | 1.8e+308 | -1.89 | 0.0589 | 0.129 | 0.197 | -1.64 | 0.101 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | -0.0561 | 1.8e+308 | -0.0838 | 0.933 | -0.0994 | -0.363 | -0.0744 | 0.941 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_car | -0.0479 | 1.8e+308 | 1.13 | 0.26 | -0.0765 | -0.4 | 1.01 | 0.313 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | -0.0102 | 1.8e+308 | -3.23 | 0.00122 | -0.025 | -0.0698 | -3.12 | 0.00182 |
b_veh_per_driver_kid_car | alpha_KID_act | -0.000277 | 1.8e+308 | -3.42 | 0.000634 | -0.00221 | -0.225 | -2.45 | 0.0144 |
b_veh_per_driver_kid_car | alpha_PAR_act | -0.000517 | 1.8e+308 | -2.77 | 0.00562 | -0.00386 | -0.256 | -1.51 | 0.131 |
b_veh_per_driver_kid_car | alpha_kid_CAR | 1.8e-05 | 1.8e+308 | -1.89 | 0.0589 | 0.000403 | 0.194 | -4.12 | 3.85e-05 |
b_veh_per_driver_kid_car | alpha_par_CAR | -1.47e-05 | 1.8e+308 | -0.258 | 0.796 | -7.13e-06 | -0.138 | -0.702 | 0.483 |
b_veh_per_driver_kid_car | asc_kid_act | -0.00155 | 1.8e+308 | 13.5 | 0 | -0.00225 | -0.176 | 13.4 | 0 |
b_veh_per_driver_kid_car | asc_kid_car | -0.00143 | 1.8e+308 | 11.1 | 0 | -0.00194 | -0.203 | 11.8 | 0 |
b_veh_per_driver_kid_car | asc_par_act | -0.00177 | 1.8e+308 | 7.01 | 2.31e-12 | -0.00686 | -0.219 | 4.88 | 1.06e-06 |
b_veh_per_driver_kid_car | b_age_kid_act | 0.000643 | 1.8e+308 | -10.2 | 0 | 0.000648 | 0.101 | -12.6 | 0 |
b_veh_per_driver_kid_car | b_age_kid_car | 0.000508 | 1.8e+308 | -5.06 | 4.23e-07 | 0.000326 | 0.0441 | -5.86 | 4.5e-09 |
b_veh_per_driver_kid_car | b_age_par_act | -0.000737 | 1.8e+308 | 2.35 | 0.0189 | -0.00361 | -0.226 | 1.9 | 0.0573 |
b_veh_per_driver_kid_car | b_female_kid_act | 0.00243 | 1.8e+308 | 5.52 | 3.36e-08 | -0.00146 | -0.0726 | 5.18 | 2.17e-07 |
b_veh_per_driver_kid_car | b_female_kid_car | 0.00431 | 1.8e+308 | 5.03 | 4.84e-07 | 0.000852 | 0.109 | 6.16 | 7.48e-10 |
b_veh_per_driver_kid_car | b_female_par_act | 0.000597 | 1.8e+308 | 1.59 | 0.111 | -0.0089 | -0.197 | 1.11 | 0.265 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_act | -0.0276 | 1.8e+308 | -6.65 | 2.95e-11 | -0.0351 | -0.156 | -6.16 | 7.25e-10 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_car | -0.0354 | 1.8e+308 | -5.83 | 5.67e-09 | -0.0119 | -0.0771 | -5.7 | 1.18e-08 |
b_veh_per_driver_kid_car | b_has_big_sib_par_act | 0.00563 | 1.8e+308 | -1.02 | 0.306 | 0.15 | 0.23 | -0.581 | 0.561 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_act | 0.000684 | 1.8e+308 | -3.67 | 0.000244 | 0.00227 | 0.113 | -3.75 | 0.000179 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_car | 0.000479 | 1.8e+308 | -4.97 | 6.68e-07 | 0.000202 | 0.0187 | -5.8 | 6.78e-09 |
b_veh_per_driver_kid_car | b_has_lil_sib_par_act | 0.0016 | 1.8e+308 | -2.11 | 0.0349 | 0.0115 | 0.21 | -1.38 | 0.168 |
b_veh_per_driver_kid_car | b_log_density_kid_act | -0.00343 | 1.8e+308 | -5.46 | 4.77e-08 | 0.017 | 0.14 | -4 | 6.26e-05 |
b_veh_per_driver_kid_car | b_log_density_kid_car | -0.0124 | 1.8e+308 | -2.05 | 0.0407 | -0.00273 | -0.18 | -4.01 | 5.96e-05 |
b_veh_per_driver_kid_car | b_log_density_par_act | 0.00141 | 1.8e+308 | -7 | 2.5e-12 | 0.0088 | 0.0562 | -6.25 | 4e-10 |
b_veh_per_driver_kid_car | b_log_distance_kid_act | -0.000477 | 1.8e+308 | 9.69 | 0 | -0.00112 | -0.251 | 11.8 | 0 |
b_veh_per_driver_kid_car | b_log_distance_kid_car | -0.000343 | 1.8e+308 | 3.92 | 8.9e-05 | -0.000189 | -0.0507 | 6.08 | 1.22e-09 |
b_veh_per_driver_kid_car | b_log_distance_par_act | -0.000976 | 1.8e+308 | 5.11 | 3.18e-07 | -0.00563 | -0.27 | 2.47 | 0.0135 |
b_veh_per_driver_kid_car | b_log_income_k_kid_act | -0.00101 | 1.8e+308 | 0.818 | 0.414 | -0.000258 | -0.0247 | 0.918 | 0.359 |
b_veh_per_driver_kid_car | b_log_income_k_kid_car | -0.000877 | 1.8e+308 | 0.349 | 0.727 | 7.82e-05 | 0.0485 | 0.949 | 0.343 |
b_veh_per_driver_kid_car | b_log_income_k_par_act | -0.000143 | 1.8e+308 | 0.12 | 0.904 | 0.00207 | 0.115 | 0.117 | 0.907 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_ace | 0.000174 | 1.8e+308 | 2.07 | 0.038 | 0.00365 | 0.11 | 1.9 | 0.057 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_car | 6.87e-06 | 1.8e+308 | 4.18 | 2.97e-05 | -0.000491 | -0.0494 | 5.83 | 5.48e-09 |
b_veh_per_driver_kid_car | b_non_work_dad_par_act | -0.0018 | 1.8e+308 | -0.49 | 0.624 | -0.0101 | -0.168 | -0.399 | 0.69 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_act | -0.00133 | 1.8e+308 | 2.92 | 0.00355 | 0.000866 | 0.0347 | 2.84 | 0.00449 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_car | -0.00296 | 1.8e+308 | 6.01 | 1.81e-09 | -0.000655 | -0.0375 | 6.11 | 9.67e-10 |
b_veh_per_driver_kid_car | b_non_work_mom_par_act | 0.000348 | 1.8e+308 | -1.61 | 0.107 | 0.00187 | 0.0572 | -1.65 | 0.0987 |
b_veh_per_driver_kid_car | b_veh_per_driver_kid_act | 0.0119 | 1.8e+308 | 3.64 | 0.000273 | 0.000879 | 0.0389 | 3.27 | 0.00107 |
b_veh_per_driver_par_act | alpha_KID_act | 0.0236 | 1.8e+308 | -4.56 | 5.19e-06 | 0.279 | 0.636 | -2.59 | 0.00956 |
b_veh_per_driver_par_act | alpha_PAR_act | 0.058 | 1.8e+308 | -4.64 | 3.45e-06 | 0.49 | 0.729 | -2.71 | 0.00676 |
b_veh_per_driver_par_act | alpha_kid_CAR | -0.00622 | 1.8e+308 | -4.17 | 3.08e-05 | -0.0558 | -0.603 | -2.23 | 0.0255 |
b_veh_per_driver_par_act | alpha_par_CAR | 0.000117 | 1.8e+308 | -4 | 6.27e-05 | 0.000595 | 0.257 | -2.16 | 0.0306 |
b_veh_per_driver_par_act | asc_kid_act | 0.05 | 1.8e+308 | -0.375 | 0.708 | 0.236 | 0.412 | -0.21 | 0.834 |
b_veh_per_driver_par_act | asc_kid_car | 0.0192 | 1.8e+308 | -1.54 | 0.122 | 0.152 | 0.356 | -0.862 | 0.389 |
b_veh_per_driver_par_act | asc_par_act | 0.105 | 1.8e+308 | -0.837 | 0.402 | 0.784 | 0.56 | -0.53 | 0.596 |
b_veh_per_driver_par_act | b_age_kid_act | -0.0278 | 1.8e+308 | -5.46 | 4.66e-08 | -0.0438 | -0.154 | -3 | 0.00268 |
b_veh_per_driver_par_act | b_age_kid_car | 0.00289 | 1.8e+308 | -4.83 | 1.34e-06 | 0.0446 | 0.135 | -2.65 | 0.00803 |
b_veh_per_driver_par_act | b_age_par_act | 0.124 | 1.8e+308 | -3.62 | 0.000297 | 0.552 | 0.775 | -2.07 | 0.0386 |
b_veh_per_driver_par_act | b_female_kid_act | 0.0659 | 1.8e+308 | -1.83 | 0.0678 | 0.324 | 0.362 | -1.06 | 0.289 |
b_veh_per_driver_par_act | b_female_kid_car | -0.00207 | 1.8e+308 | -2.95 | 0.00316 | -0.0524 | -0.151 | -1.6 | 0.11 |
b_veh_per_driver_par_act | b_female_par_act | 0.138 | 1.8e+308 | -2.73 | 0.00641 | 1.17 | 0.578 | -1.94 | 0.0522 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | 0.192 | 1.8e+308 | -7.46 | 8.33e-14 | 3.4 | 0.339 | -7.47 | 8.04e-14 |
b_veh_per_driver_par_act | b_has_big_sib_kid_car | 0.102 | 1.8e+308 | -6.86 | 7.07e-12 | 1.33 | 0.193 | -6.59 | 4.43e-11 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | -2.63 | 1.8e+308 | -1.49 | 0.137 | -19.8 | -0.677 | -0.802 | 0.423 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | -0.0454 | 1.8e+308 | -4.93 | 8.03e-07 | -0.264 | -0.294 | -2.73 | 0.00635 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_car | 0.00316 | 1.8e+308 | -5.13 | 2.9e-07 | 0.0573 | 0.119 | -2.86 | 0.00425 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -0.196 | 1.8e+308 | -4.05 | 5.04e-05 | -1.39 | -0.572 | -2.08 | 0.038 |
b_veh_per_driver_par_act | b_log_density_kid_act | -0.373 | 1.8e+308 | -6.27 | 3.68e-10 | -2.75 | -0.509 | -3.67 | 0.000243 |
b_veh_per_driver_par_act | b_log_density_kid_car | -0.000465 | 1.8e+308 | -4.51 | 6.53e-06 | -0.0248 | -0.0366 | -2.78 | 0.00548 |
b_veh_per_driver_par_act | b_log_density_par_act | -0.494 | 1.8e+308 | -7.59 | 3.18e-14 | -1.21 | -0.174 | -6.03 | 1.6e-09 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.0275 | 1.8e+308 | -2.75 | 0.00587 | 0.134 | 0.674 | -1.5 | 0.132 |
b_veh_per_driver_par_act | b_log_distance_kid_car | -0.00133 | 1.8e+308 | -3.43 | 0.000605 | -0.0204 | -0.123 | -1.85 | 0.0645 |
b_veh_per_driver_par_act | b_log_distance_par_act | 0.103 | 1.8e+308 | -3.13 | 0.00173 | 0.722 | 0.776 | -1.87 | 0.0608 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | 0.0104 | 1.8e+308 | -3.73 | 0.000194 | 0.0664 | 0.143 | -2.06 | 0.0394 |
b_veh_per_driver_par_act | b_log_income_k_kid_car | -0.00065 | 1.8e+308 | -3.91 | 9.17e-05 | -0.00465 | -0.0647 | -2.12 | 0.0342 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -0.118 | 1.8e+308 | -3.44 | 0.000584 | -0.381 | -0.476 | -1.92 | 0.0549 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | -0.0398 | 1.8e+308 | -2.27 | 0.0231 | -0.574 | -0.389 | -1.23 | 0.217 |
b_veh_per_driver_par_act | b_non_work_dad_kid_car | -0.00633 | 1.8e+308 | -2.66 | 0.00772 | -0.0739 | -0.167 | -1.46 | 0.144 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 0.196 | 1.8e+308 | -3.48 | 0.000494 | 1.18 | 0.439 | -2.61 | 0.00909 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | -0.0262 | 1.8e+308 | -2.26 | 0.024 | -0.28 | -0.251 | -1.25 | 0.212 |
b_veh_per_driver_par_act | b_non_work_mom_kid_car | -0.00883 | 1.8e+308 | -1.7 | 0.0897 | -0.123 | -0.158 | -0.93 | 0.352 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | -0.133 | 1.8e+308 | -3.92 | 8.78e-05 | -0.381 | -0.261 | -2.39 | 0.0171 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 0.141 | 1.8e+308 | -2.56 | 0.0104 | 0.318 | 0.316 | -1.41 | 0.158 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_car | 0.00278 | 1.8e+308 | -3.96 | 7.6e-05 | -0.0226 | -0.246 | -2.13 | 0.0328 |
b_y2017_kid_act | alpha_KID_act | -0.0287 | 1.8e+308 | -2.9 | 0.00376 | -0.131 | -0.812 | -1.78 | 0.0744 |
b_y2017_kid_act | alpha_PAR_act | -0.0413 | 1.8e+308 | -2.69 | 0.00708 | -0.207 | -0.832 | -1.56 | 0.119 |
b_y2017_kid_act | alpha_kid_CAR | 0.0056 | 1.8e+308 | -2.67 | 0.00751 | 0.025 | 0.729 | -1.87 | 0.0617 |
b_y2017_kid_act | alpha_par_CAR | -1.18e-05 | 1.8e+308 | -2.21 | 0.0268 | -0.000143 | -0.168 | -1.51 | 0.131 |
b_y2017_kid_act | asc_kid_act | -0.00559 | 1.8e+308 | 4.89 | 1.03e-06 | -0.0584 | -0.276 | 3.27 | 0.00108 |
b_y2017_kid_act | asc_kid_car | 9.71e-05 | 1.8e+308 | 2.85 | 0.00441 | -0.0531 | -0.337 | 1.85 | 0.0646 |
b_y2017_kid_act | asc_par_act | -0.0551 | 1.8e+308 | 3.03 | 0.00246 | -0.304 | -0.587 | 1.82 | 0.0695 |
b_y2017_kid_act | b_age_kid_act | -0.0141 | 1.8e+308 | -5.26 | 1.46e-07 | -0.0214 | -0.203 | -3.69 | 0.000225 |
b_y2017_kid_act | b_age_kid_car | -0.0167 | 1.8e+308 | -3.69 | 0.000223 | -0.0304 | -0.249 | -2.58 | 0.00975 |
b_y2017_kid_act | b_age_par_act | 0.0239 | 1.8e+308 | -0.763 | 0.445 | -0.0969 | -0.368 | -0.434 | 0.664 |
b_y2017_kid_act | b_female_kid_act | -0.013 | 1.8e+308 | 1.81 | 0.0697 | -0.108 | -0.327 | 1.24 | 0.216 |
b_y2017_kid_act | b_female_kid_car | 0.0171 | 1.8e+308 | -0.0734 | 0.941 | 0.0333 | 0.259 | -0.0522 | 0.958 |
b_y2017_kid_act | b_female_par_act | -0.0895 | 1.8e+308 | 0.0217 | 0.983 | -0.481 | -0.645 | 0.0131 | 0.99 |
b_y2017_kid_act | b_has_big_sib_kid_act | -0.33 | 1.8e+308 | -6.75 | 1.44e-11 | -1.47 | -0.398 | -5.98 | 2.26e-09 |
b_y2017_kid_act | b_has_big_sib_kid_car | -0.341 | 1.8e+308 | -5.93 | 2.99e-09 | -0.768 | -0.301 | -5.55 | 2.84e-08 |
b_y2017_kid_act | b_has_big_sib_par_act | 1.32 | 1.8e+308 | -1.18 | 0.238 | 7.85 | 0.727 | -0.682 | 0.495 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 0.0269 | 1.8e+308 | -4.37 | 1.23e-05 | 0.106 | 0.321 | -3.73 | 0.000194 |
b_y2017_kid_act | b_has_lil_sib_kid_car | -0.0205 | 1.8e+308 | -4.13 | 3.65e-05 | -0.0408 | -0.229 | -2.99 | 0.00276 |
b_y2017_kid_act | b_has_lil_sib_par_act | 0.0958 | 1.8e+308 | -3.37 | 0.000764 | 0.603 | 0.67 | -3.07 | 0.00216 |
b_y2017_kid_act | b_log_density_kid_act | 0.187 | 1.8e+308 | -6.13 | 8.59e-10 | 1.03 | 0.518 | -4.96 | 6.91e-07 |
b_y2017_kid_act | b_log_density_kid_car | -0.0058 | 1.8e+308 | -2.99 | 0.0028 | 0.004 | 0.0159 | -3.05 | 0.00227 |
b_y2017_kid_act | b_log_density_par_act | -0.143 | 1.8e+308 | -7.16 | 7.99e-13 | -0.271 | -0.105 | -6.28 | 3.3e-10 |
b_y2017_kid_act | b_log_distance_kid_act | -0.0061 | 1.8e+308 | 0.565 | 0.572 | -0.0445 | -0.604 | 0.367 | 0.714 |
b_y2017_kid_act | b_log_distance_kid_car | 0.00856 | 1.8e+308 | -1.04 | 0.3 | 0.0146 | 0.238 | -0.707 | 0.48 |
b_y2017_kid_act | b_log_distance_par_act | -0.0429 | 1.8e+308 | 0.116 | 0.907 | -0.27 | -0.784 | 0.0629 | 0.95 |
b_y2017_kid_act | b_log_income_k_kid_act | 0.000127 | 1.8e+308 | -1.58 | 0.114 | -0.013 | -0.0754 | -1.11 | 0.269 |
b_y2017_kid_act | b_log_income_k_kid_car | 0.000447 | 1.8e+308 | -2.03 | 0.0427 | 0.00262 | 0.0987 | -1.4 | 0.161 |
b_y2017_kid_act | b_log_income_k_par_act | -0.00594 | 1.8e+308 | -1.66 | 0.0975 | 0.045 | 0.152 | -1.33 | 0.183 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 0.0544 | 1.8e+308 | 0.37 | 0.712 | 0.257 | 0.472 | 0.371 | 0.711 |
b_y2017_kid_act | b_non_work_dad_kid_car | 0.0144 | 1.8e+308 | 0.386 | 0.699 | 0.0409 | 0.25 | 0.299 | 0.765 |
b_y2017_kid_act | b_non_work_dad_par_act | -0.101 | 1.8e+308 | -1.28 | 0.2 | -0.504 | -0.509 | -0.895 | 0.371 |
b_y2017_kid_act | b_non_work_mom_kid_act | 0.0619 | 1.8e+308 | 0.729 | 0.466 | 0.171 | 0.416 | 0.645 | 0.519 |
b_y2017_kid_act | b_non_work_mom_kid_car | 0.0393 | 1.8e+308 | 2.27 | 0.0234 | 0.0779 | 0.271 | 1.72 | 0.0858 |
b_y2017_kid_act | b_non_work_mom_par_act | -0.0222 | 1.8e+308 | -2.5 | 0.0123 | 0.0371 | 0.0689 | -2.28 | 0.0225 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -0.039 | 1.8e+308 | 0.716 | 0.474 | -0.125 | -0.336 | 0.515 | 0.607 |
b_y2017_kid_act | b_veh_per_driver_kid_car | 0.0029 | 1.8e+308 | -2.11 | 0.0345 | 0.00686 | 0.202 | -1.48 | 0.138 |
b_y2017_kid_act | b_veh_per_driver_par_act | -0.0574 | 1.8e+308 | 2.59 | 0.0096 | -0.781 | -0.515 | 1.3 | 0.193 |
b_y2017_kid_car | alpha_KID_act | -0.00364 | 1.8e+308 | -6.18 | 6.32e-10 | -0.0142 | -0.451 | -4.43 | 9.33e-06 |
b_y2017_kid_car | alpha_PAR_act | -0.00496 | 1.8e+308 | -5.44 | 5.23e-08 | -0.0213 | -0.442 | -3.2 | 0.00138 |
b_y2017_kid_car | alpha_kid_CAR | 0.00153 | 1.8e+308 | -6.23 | 4.53e-10 | 0.004 | 0.603 | -8.51 | 0 |
b_y2017_kid_car | alpha_par_CAR | 2.95e-06 | 1.8e+308 | -4.81 | 1.54e-06 | 8.84e-05 | 0.534 | -5.82 | 5.74e-09 |
b_y2017_kid_car | asc_kid_act | -0.000493 | 1.8e+308 | 9.99 | 0 | -0.00778 | -0.19 | 9.19 | 0 |
b_y2017_kid_car | asc_kid_car | 0.0153 | 1.8e+308 | 9.38 | 0 | 0.0142 | 0.466 | 9.62 | 0 |
b_y2017_kid_car | asc_par_act | -0.00608 | 1.8e+308 | 5.11 | 3.26e-07 | -0.0314 | -0.313 | 3.49 | 0.000475 |
b_y2017_kid_car | b_age_kid_act | -0.00628 | 1.8e+308 | -10.6 | 0 | -0.00623 | -0.305 | -11.4 | 0 |
b_y2017_kid_car | b_age_kid_car | -0.0166 | 1.8e+308 | -6.06 | 1.36e-09 | -0.0209 | -0.886 | -5.98 | 2.18e-09 |
b_y2017_kid_car | b_age_par_act | 0.00251 | 1.8e+308 | -0.375 | 0.708 | -0.0114 | -0.224 | -0.284 | 0.777 |
b_y2017_kid_car | b_female_kid_act | -0.000232 | 1.8e+308 | 3.4 | 0.000668 | -0.0108 | -0.168 | 3.1 | 0.00195 |
b_y2017_kid_car | b_female_kid_car | 0.0164 | 1.8e+308 | 1.34 | 0.181 | 0.0212 | 0.853 | 2.82 | 0.00478 |
b_y2017_kid_car | b_female_par_act | -0.0103 | 1.8e+308 | 0.427 | 0.67 | -0.0488 | -0.338 | 0.295 | 0.768 |
b_y2017_kid_car | b_has_big_sib_kid_act | -0.163 | 1.8e+308 | -6.78 | 1.21e-11 | -0.281 | -0.392 | -6.26 | 3.87e-10 |
b_y2017_kid_car | b_has_big_sib_kid_car | -0.314 | 1.8e+308 | -5.92 | 3.25e-09 | -0.434 | -0.88 | -5.73 | 9.99e-09 |
b_y2017_kid_car | b_has_big_sib_par_act | 0.0874 | 1.8e+308 | -1.12 | 0.261 | 0.753 | 0.36 | -0.639 | 0.523 |
b_y2017_kid_car | b_has_lil_sib_kid_act | -0.00926 | 1.8e+308 | -5.05 | 4.48e-07 | -0.00161 | -0.0251 | -5.24 | 1.64e-07 |
b_y2017_kid_car | b_has_lil_sib_kid_car | -0.02 | 1.8e+308 | -6 | 1.98e-09 | -0.0296 | -0.855 | -5.97 | 2.32e-09 |
b_y2017_kid_car | b_has_lil_sib_par_act | 0.00383 | 1.8e+308 | -3.12 | 0.00181 | 0.057 | 0.327 | -2.11 | 0.0349 |
b_y2017_kid_car | b_log_density_kid_act | 0.0963 | 1.8e+308 | -6.02 | 1.72e-09 | 0.213 | 0.551 | -4.43 | 9.64e-06 |
b_y2017_kid_car | b_log_density_kid_car | -0.0153 | 1.8e+308 | -3.17 | 0.00154 | -0.0243 | -0.5 | -5.16 | 2.52e-07 |
b_y2017_kid_car | b_log_density_par_act | 0.0164 | 1.8e+308 | -7.27 | 3.53e-13 | 0.015 | 0.03 | -6.49 | 8.75e-11 |
b_y2017_kid_car | b_log_distance_kid_act | 0.000118 | 1.8e+308 | 3.14 | 0.00166 | -0.00334 | -0.234 | 3.04 | 0.00237 |
b_y2017_kid_car | b_log_distance_kid_car | 0.009 | 1.8e+308 | -1.67 | 0.0951 | 0.0106 | 0.892 | -2.82 | 0.00483 |
b_y2017_kid_car | b_log_distance_par_act | -0.00453 | 1.8e+308 | 1.32 | 0.186 | -0.0273 | -0.409 | 0.676 | 0.499 |
b_y2017_kid_car | b_log_income_k_kid_act | -0.0015 | 1.8e+308 | -2.02 | 0.0431 | -0.00361 | -0.108 | -2.08 | 0.0371 |
b_y2017_kid_car | b_log_income_k_kid_car | -6.41e-05 | 1.8e+308 | -3.92 | 8.86e-05 | 0.000846 | 0.164 | -5.27 | 1.4e-07 |
b_y2017_kid_car | b_log_income_k_par_act | -0.00267 | 1.8e+308 | -1.87 | 0.0621 | 0.00219 | 0.0383 | -1.84 | 0.0661 |
b_y2017_kid_car | b_non_work_dad_kid_ace | 0.0155 | 1.8e+308 | 0.874 | 0.382 | 0.0463 | 0.438 | 0.843 | 0.399 |
b_y2017_kid_car | b_non_work_dad_kid_car | 0.0115 | 1.8e+308 | 1.67 | 0.094 | 0.0242 | 0.76 | 3.53 | 0.000417 |
b_y2017_kid_car | b_non_work_dad_par_act | -0.00739 | 1.8e+308 | -1.22 | 0.221 | -0.0427 | -0.223 | -0.984 | 0.325 |
b_y2017_kid_car | b_non_work_mom_kid_act | 0.0342 | 1.8e+308 | 1.57 | 0.117 | 0.0466 | 0.583 | 1.57 | 0.116 |
b_y2017_kid_car | b_non_work_mom_kid_car | 0.0383 | 1.8e+308 | 5.25 | 1.51e-07 | 0.0489 | 0.878 | 5.89 | 3.93e-09 |
b_y2017_kid_car | b_non_work_mom_par_act | 0.00977 | 1.8e+308 | -2.72 | 0.00659 | 0.0179 | 0.171 | -2.81 | 0.0049 |
b_y2017_kid_car | b_veh_per_driver_kid_act | -0.0149 | 1.8e+308 | 1.58 | 0.114 | -0.0294 | -0.408 | 1.43 | 0.152 |
b_y2017_kid_car | b_veh_per_driver_kid_car | 0.00289 | 1.8e+308 | -4.04 | 5.41e-05 | 0.00113 | 0.172 | -5.61 | 2.06e-08 |
b_y2017_kid_car | b_veh_per_driver_par_act | -0.00679 | 1.8e+308 | 3.18 | 0.0015 | -0.0838 | -0.285 | 1.71 | 0.0876 |
b_y2017_kid_car | b_y2017_kid_act | 0.0313 | 1.8e+308 | 0.606 | 0.544 | 0.0458 | 0.422 | 0.415 | 0.678 |
b_y2017_par_act | alpha_KID_act | -0.015 | 1.8e+308 | 6.43 | 1.24e-10 | -0.443 | -0.704 | 3.56 | 0.000367 |
b_y2017_par_act | alpha_PAR_act | -0.081 | 1.8e+308 | 6.31 | 2.84e-10 | -0.805 | -0.834 | 3.44 | 0.000592 |
b_y2017_par_act | alpha_kid_CAR | 0.005 | 1.8e+308 | 6.68 | 2.31e-11 | 0.0872 | 0.655 | 3.91 | 9.42e-05 |
b_y2017_par_act | alpha_par_CAR | -0.000323 | 1.8e+308 | 6.8 | 1.08e-11 | -0.00105 | -0.317 | 3.94 | 8.3e-05 |
b_y2017_par_act | asc_kid_act | -0.13 | 1.8e+308 | 8.67 | 0 | -0.387 | -0.47 | 5.05 | 4.35e-07 |
b_y2017_par_act | asc_kid_car | -0.0545 | 1.8e+308 | 8.18 | 2.22e-16 | -0.249 | -0.406 | 4.71 | 2.46e-06 |
b_y2017_par_act | asc_par_act | -0.381 | 1.8e+308 | 7.63 | 2.38e-14 | -1.6 | -0.797 | 4.28 | 1.88e-05 |
b_y2017_par_act | b_age_kid_act | 0.0734 | 1.8e+308 | 5.88 | 4.21e-09 | 0.0629 | 0.153 | 3.35 | 0.00082 |
b_y2017_par_act | b_age_kid_car | 0.024 | 1.8e+308 | 6.26 | 3.83e-10 | -0.0643 | -0.135 | 3.58 | 0.000346 |
b_y2017_par_act | b_age_par_act | -0.277 | 1.8e+308 | 6.54 | 6.02e-11 | -0.812 | -0.793 | 3.81 | 0.000139 |
b_y2017_par_act | b_female_kid_act | -0.116 | 1.8e+308 | 7.67 | 1.71e-14 | -0.515 | -0.4 | 4.43 | 9.25e-06 |
b_y2017_par_act | b_female_kid_car | -0.0229 | 1.8e+308 | 7.34 | 2.18e-13 | 0.0756 | 0.151 | 4.34 | 1.41e-05 |
b_y2017_par_act | b_female_par_act | -0.133 | 1.8e+308 | 6.66 | 2.78e-11 | -1.75 | -0.605 | 3.5 | 0.000463 |
b_y2017_par_act | b_has_big_sib_kid_act | 0.311 | 1.8e+308 | -3.95 | 7.82e-05 | -5.34 | -0.37 | -2.88 | 0.00395 |
b_y2017_par_act | b_has_big_sib_kid_car | 0.377 | 1.8e+308 | -2.19 | 0.0287 | -1.98 | -0.2 | -1.62 | 0.106 |
b_y2017_par_act | b_has_big_sib_par_act | 3.75 | 1.8e+308 | 0.397 | 0.691 | 32.2 | 0.765 | 0.254 | 0.8 |
b_y2017_par_act | b_has_lil_sib_kid_act | 0.0882 | 1.8e+308 | 5.83 | 5.66e-09 | 0.376 | 0.291 | 3.5 | 0.000469 |
b_y2017_par_act | b_has_lil_sib_kid_car | 0.0354 | 1.8e+308 | 5.99 | 2.11e-09 | -0.0818 | -0.118 | 3.42 | 0.000623 |
b_y2017_par_act | b_has_lil_sib_par_act | 0.49 | 1.8e+308 | 6.28 | 3.38e-10 | 2.63 | 0.75 | 4.56 | 5.19e-06 |
b_y2017_par_act | b_log_density_kid_act | 0.487 | 1.8e+308 | 0.357 | 0.721 | 4.39 | 0.565 | 0.325 | 0.745 |
b_y2017_par_act | b_log_density_kid_car | 0.0395 | 1.8e+308 | 5.66 | 1.5e-08 | 0.0701 | 0.0719 | 3.48 | 0.000509 |
b_y2017_par_act | b_log_density_par_act | 1.41 | 1.8e+308 | -3.26 | 0.0011 | 1.83 | 0.182 | -2.46 | 0.014 |
b_y2017_par_act | b_log_distance_kid_act | -0.0579 | 1.8e+308 | 7.49 | 7.08e-14 | -0.225 | -0.784 | 4.31 | 1.62e-05 |
b_y2017_par_act | b_log_distance_kid_car | -0.0123 | 1.8e+308 | 7.12 | 1.07e-12 | 0.0288 | 0.121 | 4.16 | 3.2e-05 |
b_y2017_par_act | b_log_distance_par_act | -0.19 | 1.8e+308 | 7.02 | 2.29e-12 | -1.21 | -0.9 | 3.8 | 0.000144 |
b_y2017_par_act | b_log_income_k_kid_act | -0.0333 | 1.8e+308 | 6.8 | 1.03e-11 | -0.113 | -0.168 | 3.96 | 7.6e-05 |
b_y2017_par_act | b_log_income_k_kid_car | -0.000895 | 1.8e+308 | 6.84 | 8.11e-12 | 0.00793 | 0.0767 | 3.97 | 7.23e-05 |
b_y2017_par_act | b_log_income_k_par_act | 0.0861 | 1.8e+308 | 6.89 | 5.51e-12 | 0.465 | 0.405 | 4.16 | 3.22e-05 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.00808 | 1.8e+308 | 7.1 | 1.25e-12 | 0.829 | 0.39 | 4.75 | 2.06e-06 |
b_y2017_par_act | b_non_work_dad_kid_car | -0.0282 | 1.8e+308 | 7.41 | 1.22e-13 | 0.104 | 0.162 | 4.44 | 8.96e-06 |
b_y2017_par_act | b_non_work_dad_par_act | 0.0706 | 1.8e+308 | 5.58 | 2.37e-08 | -1.54 | -0.4 | 3.01 | 0.00265 |
b_y2017_par_act | b_non_work_mom_kid_act | -0.0257 | 1.8e+308 | 7.34 | 2.16e-13 | 0.463 | 0.289 | 4.66 | 3.18e-06 |
b_y2017_par_act | b_non_work_mom_kid_car | -0.0521 | 1.8e+308 | 7.9 | 2.89e-15 | 0.179 | 0.16 | 4.82 | 1.41e-06 |
b_y2017_par_act | b_non_work_mom_par_act | 0.348 | 1.8e+308 | 6.3 | 2.95e-10 | 0.649 | 0.31 | 3.71 | 0.000203 |
b_y2017_par_act | b_veh_per_driver_kid_act | -0.00805 | 1.8e+308 | 7.49 | 6.88e-14 | -0.358 | -0.247 | 4.27 | 1.95e-05 |
b_y2017_par_act | b_veh_per_driver_kid_car | 0.00872 | 1.8e+308 | 6.82 | 9.27e-12 | 0.0344 | 0.26 | 3.96 | 7.41e-05 |
b_y2017_par_act | b_veh_per_driver_par_act | -0.979 | 1.8e+308 | 6.47 | 9.95e-11 | -4.73 | -0.801 | 3.37 | 0.000739 |
b_y2017_par_act | b_y2017_kid_act | 0.105 | 1.8e+308 | 7.4 | 1.35e-13 | 1.39 | 0.638 | 5.03 | 4.82e-07 |
b_y2017_par_act | b_y2017_kid_car | -0.00245 | 1.8e+308 | 7.25 | 4.19e-13 | 0.134 | 0.316 | 4.29 | 1.81e-05 |
mu_active | alpha_KID_act | 0.401 | 1.8e+308 | 1.25 | 0.212 | 2.56 | 0.908 | 0.501 | 0.617 |
mu_active | alpha_PAR_act | 0.573 | 1.8e+308 | 1.26 | 0.206 | 4.12 | 0.953 | 0.509 | 0.611 |
mu_active | alpha_kid_CAR | -0.0788 | 1.8e+308 | 1.29 | 0.198 | -0.499 | -0.838 | 0.517 | 0.605 |
mu_active | alpha_par_CAR | 0.000853 | 1.8e+308 | 1.33 | 0.183 | 0.00442 | 0.297 | 0.534 | 0.593 |
mu_active | asc_kid_act | 0.238 | 1.8e+308 | 2.11 | 0.0351 | 1.59 | 0.432 | 0.847 | 0.397 |
mu_active | asc_kid_car | 0.222 | 1.8e+308 | 1.86 | 0.0629 | 1.26 | 0.458 | 0.746 | 0.456 |
mu_active | asc_par_act | 0.85 | 1.8e+308 | 2.05 | 0.0404 | 6.47 | 0.718 | 0.83 | 0.406 |
mu_active | b_age_kid_act | -0.0153 | 1.8e+308 | 0.991 | 0.322 | 0.0324 | 0.0176 | 0.398 | 0.691 |
mu_active | b_age_kid_car | 0.0548 | 1.8e+308 | 1.15 | 0.249 | 0.467 | 0.22 | 0.463 | 0.644 |
mu_active | b_age_par_act | 0.48 | 1.8e+308 | 1.49 | 0.135 | 3.36 | 0.732 | 0.601 | 0.548 |
mu_active | b_female_kid_act | 0.362 | 1.8e+308 | 1.8 | 0.0719 | 2.47 | 0.428 | 0.725 | 0.469 |
mu_active | b_female_kid_car | -0.0664 | 1.8e+308 | 1.54 | 0.125 | -0.533 | -0.239 | 0.616 | 0.538 |
mu_active | b_female_par_act | 1.31 | 1.8e+308 | 1.62 | 0.106 | 9.76 | 0.752 | 0.659 | 0.51 |
mu_active | b_has_big_sib_kid_act | 3.74 | 1.8e+308 | -3.68 | 0.000231 | 30.4 | 0.471 | -2.04 | 0.0417 |
mu_active | b_has_big_sib_kid_car | 1.6 | 1.8e+308 | -2.09 | 0.0362 | 12.8 | 0.288 | -0.994 | 0.32 |
mu_active | b_has_big_sib_par_act | -22.6 | 1.8e+308 | -0.116 | 0.907 | -164 | -0.871 | -0.0516 | 0.959 |
mu_active | b_has_lil_sib_kid_act | -0.27 | 1.8e+308 | 1.01 | 0.313 | -1.97 | -0.341 | 0.405 | 0.685 |
mu_active | b_has_lil_sib_kid_car | 0.0732 | 1.8e+308 | 1.07 | 0.284 | 0.62 | 0.199 | 0.43 | 0.667 |
mu_active | b_has_lil_sib_par_act | -1.67 | 1.8e+308 | 0.957 | 0.338 | -12.2 | -0.777 | 0.382 | 0.702 |
mu_active | b_log_density_kid_act | -3.2 | 1.8e+308 | -0.596 | 0.551 | -23 | -0.662 | -0.244 | 0.807 |
mu_active | b_log_density_kid_car | -0.0281 | 1.8e+308 | 1.06 | 0.288 | -0.162 | -0.0372 | 0.429 | 0.668 |
mu_active | b_log_density_par_act | -0.508 | 1.8e+308 | -2.37 | 0.018 | -2.38 | -0.053 | -1.06 | 0.287 |
mu_active | b_log_distance_kid_act | 0.142 | 1.8e+308 | 1.61 | 0.107 | 1 | 0.778 | 0.647 | 0.517 |
mu_active | b_log_distance_kid_car | -0.0249 | 1.8e+308 | 1.45 | 0.148 | -0.218 | -0.205 | 0.58 | 0.562 |
mu_active | b_log_distance_par_act | 0.776 | 1.8e+308 | 1.61 | 0.108 | 5.76 | 0.96 | 0.648 | 0.517 |
mu_active | b_log_income_k_kid_act | 0.0796 | 1.8e+308 | 1.38 | 0.167 | 0.486 | 0.162 | 0.555 | 0.579 |
mu_active | b_log_income_k_kid_car | -0.00337 | 1.8e+308 | 1.35 | 0.178 | -0.0428 | -0.0924 | 0.54 | 0.589 |
mu_active | b_log_income_k_par_act | -0.264 | 1.8e+308 | 1.33 | 0.183 | -1.76 | -0.342 | 0.534 | 0.593 |
mu_active | b_non_work_dad_kid_ace | -0.698 | 1.8e+308 | 1.55 | 0.121 | -5.08 | -0.534 | 0.623 | 0.533 |
mu_active | b_non_work_dad_kid_car | -0.0846 | 1.8e+308 | 1.58 | 0.114 | -0.692 | -0.242 | 0.635 | 0.526 |
mu_active | b_non_work_dad_par_act | 1.49 | 1.8e+308 | 1.28 | 0.201 | 10.1 | 0.587 | 0.525 | 0.599 |
mu_active | b_non_work_mom_kid_act | -0.289 | 1.8e+308 | 1.61 | 0.107 | -2.62 | -0.365 | 0.646 | 0.518 |
mu_active | b_non_work_mom_kid_car | -0.144 | 1.8e+308 | 1.78 | 0.0753 | -1.23 | -0.246 | 0.713 | 0.476 |
mu_active | b_non_work_mom_par_act | -0.53 | 1.8e+308 | 1.08 | 0.28 | -2.22 | -0.236 | 0.439 | 0.661 |
mu_active | b_veh_per_driver_kid_act | 0.268 | 1.8e+308 | 1.66 | 0.0971 | 2.05 | 0.315 | 0.669 | 0.504 |
mu_active | b_veh_per_driver_kid_car | -0.0286 | 1.8e+308 | 1.34 | 0.182 | -0.166 | -0.281 | 0.536 | 0.592 |
mu_active | b_veh_per_driver_par_act | 3.26 | 1.8e+308 | 2.42 | 0.0157 | 22.1 | 0.835 | 0.995 | 0.32 |
mu_active | b_y2017_kid_act | -0.989 | 1.8e+308 | 1.49 | 0.137 | -7.42 | -0.76 | 0.594 | 0.552 |
mu_active | b_y2017_kid_car | -0.103 | 1.8e+308 | 1.49 | 0.137 | -0.773 | -0.409 | 0.596 | 0.551 |
mu_active | b_y2017_par_act | -4.78 | 1.8e+308 | -0.714 | 0.475 | -33.6 | -0.883 | -0.287 | 0.774 |
mu_motor | alpha_KID_act | 0.00595 | 1.8e+308 | 1.8e+308 | 0 | 0.0346 | 0.202 | 195 | 0 |
mu_motor | alpha_PAR_act | 0.0113 | 1.8e+308 | 1.8e+308 | 0 | 0.0625 | 0.238 | 194 | 0 |
mu_motor | alpha_kid_CAR | -0.0125 | 1.8e+308 | 1.8e+308 | 0 | -5.3e-05 | -0.00147 | 192 | 0 |
mu_motor | alpha_par_CAR | -0.00484 | 1.8e+308 | 1.8e+308 | 0 | 0.0009 | 0.998 | 193 | 0 |
mu_motor | asc_kid_act | 0.0325 | 1.8e+308 | 1.8e+308 | 0 | 0.0386 | 0.173 | 197 | 0 |
mu_motor | asc_kid_car | 0.0398 | 1.8e+308 | 1.8e+308 | 0 | 0.14 | 0.839 | 248 | 0 |
mu_motor | asc_par_act | 0.0432 | 1.8e+308 | 1.8e+308 | 0 | 0.116 | 0.213 | 167 | 0 |
mu_motor | b_age_kid_act | -0.0281 | 1.8e+308 | 1.8e+308 | 0 | -0.0368 | -0.331 | 177 | 0 |
mu_motor | b_age_kid_car | -0.0372 | 1.8e+308 | 1.8e+308 | 0 | -0.0962 | -0.747 | 165 | 0 |
mu_motor | b_age_par_act | 0.0124 | 1.8e+308 | 1.8e+308 | 0 | 0.0629 | 0.226 | 194 | 0 |
mu_motor | b_female_kid_act | 0.0138 | 1.8e+308 | 1.8e+308 | 0 | 0.0513 | 0.147 | 182 | 0 |
mu_motor | b_female_kid_car | 0.0289 | 1.8e+308 | 1.8e+308 | 0 | 0.0947 | 0.698 | 225 | 0 |
mu_motor | b_female_par_act | 0.0224 | 1.8e+308 | 1.8e+308 | 0 | 0.158 | 0.201 | 134 | 0 |
mu_motor | b_has_big_sib_kid_act | -0.893 | 1.8e+308 | 27.6 | 0 | -0.387 | -0.0989 | 23.9 | 0 |
mu_motor | b_has_big_sib_kid_car | -0.977 | 1.8e+308 | 43 | 0 | -1.89 | -0.703 | 33.2 | 0 |
mu_motor | b_has_big_sib_par_act | -0.893 | 1.8e+308 | 17.8 | 0 | -2.98 | -0.262 | 9.82 | 0 |
mu_motor | b_has_lil_sib_kid_act | -0.0607 | 1.8e+308 | 1.8e+308 | 0 | -0.102 | -0.29 | 149 | 0 |
mu_motor | b_has_lil_sib_kid_car | -0.0659 | 1.8e+308 | 1.8e+308 | 0 | -0.139 | -0.738 | 154 | 0 |
mu_motor | b_has_lil_sib_par_act | -0.0698 | 1.8e+308 | 1.8e+308 | 0 | -0.232 | -0.244 | 94.6 | 0 |
mu_motor | b_log_density_kid_act | 0.101 | 1.8e+308 | 362 | 0 | 0.0754 | 0.0358 | 51.4 | 0 |
mu_motor | b_log_density_kid_car | -0.0403 | 1.8e+308 | 1.8e+308 | 0 | -0.146 | -0.553 | 149 | 0 |
mu_motor | b_log_density_par_act | -0.0271 | 1.8e+308 | 53 | 0 | 0.0462 | 0.0169 | 37.1 | 0 |
mu_motor | b_log_distance_kid_act | 0.0107 | 1.8e+308 | 1.8e+308 | 0 | 0.0253 | 0.324 | 201 | 0 |
mu_motor | b_log_distance_kid_car | 0.0171 | 1.8e+308 | 1.8e+308 | 0 | 0.049 | 0.757 | 209 | 0 |
mu_motor | b_log_distance_par_act | 0.0215 | 1.8e+308 | 1.8e+308 | 0 | 0.0984 | 0.271 | 192 | 0 |
mu_motor | b_log_income_k_kid_act | 0.00019 | 1.8e+308 | 1.8e+308 | 0 | 0.00168 | 0.00926 | 186 | 0 |
mu_motor | b_log_income_k_kid_car | 7.42e-05 | 1.8e+308 | 1.8e+308 | 0 | 0.00293 | 0.104 | 193 | 0 |
mu_motor | b_log_income_k_par_act | -0.0105 | 1.8e+308 | 1.8e+308 | 0 | -0.0471 | -0.151 | 163 | 0 |
mu_motor | b_non_work_dad_kid_ace | 0.0639 | 1.8e+308 | 1.8e+308 | 0 | 0.0403 | 0.07 | 148 | 0 |
mu_motor | b_non_work_dad_kid_car | 0.0702 | 1.8e+308 | 1.8e+308 | 0 | 0.115 | 0.662 | 230 | 0 |
mu_motor | b_non_work_dad_par_act | 0.0534 | 1.8e+308 | 1.8e+308 | 0 | 0.202 | 0.194 | 108 | 0 |
mu_motor | b_non_work_mom_kid_act | 0.0939 | 1.8e+308 | 1.8e+308 | 0 | 0.138 | 0.317 | 190 | 0 |
mu_motor | b_non_work_mom_kid_car | 0.0887 | 1.8e+308 | 1.8e+308 | 0 | 0.22 | 0.723 | 268 | 0 |
mu_motor | b_non_work_mom_par_act | 0.023 | 1.8e+308 | 1.8e+308 | 0 | 0.0326 | 0.0574 | 146 | 0 |
mu_motor | b_veh_per_driver_kid_act | -0.0344 | 1.8e+308 | 1.8e+308 | 0 | -0.0539 | -0.137 | 155 | 0 |
mu_motor | b_veh_per_driver_kid_car | -0.0106 | 1.8e+308 | 1.8e+308 | 0 | -0.00473 | -0.132 | 191 | 0 |
mu_motor | b_veh_per_driver_par_act | 0.0757 | 1.8e+308 | 1.8e+308 | 0 | 0.381 | 0.238 | 78.6 | 0 |
mu_motor | b_y2017_kid_act | -0.00406 | 1.8e+308 | 1.8e+308 | 0 | -0.0871 | -0.147 | 132 | 0 |
mu_motor | b_y2017_kid_car | 0.00586 | 1.8e+308 | 1.8e+308 | 0 | 0.0646 | 0.563 | 213 | 0 |
mu_motor | b_y2017_par_act | -0.221 | 1.8e+308 | 1.8e+308 | 0 | -0.678 | -0.294 | 43.5 | 0 |
mu_motor | mu_active | 0.552 | 1.8e+308 | 30.4 | 0 | 2.8 | 0.272 | 11.3 | 0 |
mu_no_parent | alpha_KID_act | -0.0209 | 1.8e+308 | 4.48 | 7.62e-06 | -0.0448 | -0.179 | 3.94 | 8.21e-05 |
mu_no_parent | alpha_PAR_act | -0.00563 | 1.8e+308 | 4.56 | 5.12e-06 | -0.0417 | -0.109 | 3.9 | 9.72e-05 |
mu_no_parent | alpha_kid_CAR | -0.0062 | 1.8e+308 | 4.87 | 1.13e-06 | -0.0038 | -0.0718 | 4.4 | 1.08e-05 |
mu_no_parent | alpha_par_CAR | -0.000301 | 1.8e+308 | 5.09 | 3.53e-07 | -0.000511 | -0.388 | 4.59 | 4.38e-06 |
mu_no_parent | asc_kid_act | 0.0881 | 1.8e+308 | 9.39 | 0 | 0.119 | 0.365 | 8.56 | 0 |
mu_no_parent | asc_kid_car | -0.0858 | 1.8e+308 | 7.02 | 2.15e-12 | -0.111 | -0.457 | 6.32 | 2.65e-10 |
mu_no_parent | asc_par_act | 0.1 | 1.8e+308 | 8.34 | 0 | 0.0951 | 0.119 | 6.88 | 5.88e-12 |
mu_no_parent | b_age_kid_act | -0.0247 | 1.8e+308 | 3.29 | 0.00101 | -0.0483 | -0.297 | 2.93 | 0.00339 |
mu_no_parent | b_age_kid_car | 0.0745 | 1.8e+308 | 4.45 | 8.6e-06 | 0.0873 | 0.463 | 4 | 6.28e-05 |
mu_no_parent | b_age_par_act | 0.0218 | 1.8e+308 | 5.72 | 1.07e-08 | -0.0053 | -0.013 | 4.98 | 6.44e-07 |
mu_no_parent | b_female_kid_act | 0.0414 | 1.8e+308 | 7.08 | 1.41e-12 | 0.0477 | 0.0934 | 6.39 | 1.61e-10 |
mu_no_parent | b_female_kid_car | -0.0751 | 1.8e+308 | 5.67 | 1.41e-08 | -0.087 | -0.439 | 5.16 | 2.45e-07 |
mu_no_parent | b_female_par_act | -0.0006 | 1.8e+308 | 5.16 | 2.45e-07 | -0.0629 | -0.0546 | 4.13 | 3.69e-05 |
mu_no_parent | b_has_big_sib_kid_act | 0.228 | 1.8e+308 | -5.41 | 6.15e-08 | 0.0779 | 0.0136 | -4.97 | 6.62e-07 |
mu_no_parent | b_has_big_sib_kid_car | 1.4 | 1.8e+308 | -4.61 | 3.95e-06 | 1.69 | 0.43 | -4.56 | 5.07e-06 |
mu_no_parent | b_has_big_sib_par_act | 0.58 | 1.8e+308 | -0.37 | 0.711 | 1.87 | 0.112 | -0.211 | 0.833 |
mu_no_parent | b_has_lil_sib_kid_act | 0.046 | 1.8e+308 | 3.4 | 0.000679 | 0.0479 | 0.0936 | 3.08 | 0.00205 |
mu_no_parent | b_has_lil_sib_kid_car | 0.107 | 1.8e+308 | 4.07 | 4.74e-05 | 0.127 | 0.46 | 3.69 | 0.000223 |
mu_no_parent | b_has_lil_sib_par_act | 0.0161 | 1.8e+308 | 2.88 | 0.00396 | 0.0849 | 0.0611 | 2.29 | 0.022 |
mu_no_parent | b_log_density_kid_act | -0.77 | 1.8e+308 | -2.1 | 0.0361 | -0.988 | -0.32 | -1.64 | 0.1 |
mu_no_parent | b_log_density_kid_car | 0.151 | 1.8e+308 | 3.6 | 0.000314 | 0.149 | 0.384 | 3.69 | 0.000228 |
mu_no_parent | b_log_density_par_act | -0.95 | 1.8e+308 | -4.59 | 4.36e-06 | -1.49 | -0.373 | -4.03 | 5.69e-05 |
mu_no_parent | b_log_distance_kid_act | 0.0226 | 1.8e+308 | 6.59 | 4.43e-11 | 0.0125 | 0.109 | 5.86 | 4.52e-09 |
mu_no_parent | b_log_distance_kid_car | -0.0392 | 1.8e+308 | 5.47 | 4.41e-08 | -0.0445 | -0.47 | 4.95 | 7.4e-07 |
mu_no_parent | b_log_distance_par_act | 0.018 | 1.8e+308 | 6.25 | 4.1e-10 | -0.0274 | -0.0515 | 5.15 | 2.66e-07 |
mu_no_parent | b_log_income_k_kid_act | 0.0156 | 1.8e+308 | 5.28 | 1.29e-07 | 0.0234 | 0.0881 | 4.8 | 1.6e-06 |
mu_no_parent | b_log_income_k_kid_car | -0.000579 | 1.8e+308 | 5.16 | 2.5e-07 | -0.00182 | -0.0443 | 4.66 | 3.17e-06 |
mu_no_parent | b_log_income_k_par_act | 0.0103 | 1.8e+308 | 4.92 | 8.48e-07 | 0.0303 | 0.0664 | 4.5 | 6.66e-06 |
mu_no_parent | b_non_work_dad_kid_ace | -0.0399 | 1.8e+308 | 5.32 | 1.01e-07 | -0.0431 | -0.0512 | 4.81 | 1.51e-06 |
mu_no_parent | b_non_work_dad_kid_car | -0.0769 | 1.8e+308 | 5.79 | 7.23e-09 | -0.0996 | -0.394 | 5.29 | 1.21e-07 |
mu_no_parent | b_non_work_dad_par_act | -0.117 | 1.8e+308 | 3.06 | 0.00221 | -0.29 | -0.19 | 2.51 | 0.0119 |
mu_no_parent | b_non_work_mom_kid_act | -0.179 | 1.8e+308 | 5.27 | 1.33e-07 | -0.153 | -0.24 | 4.95 | 7.27e-07 |
mu_no_parent | b_non_work_mom_kid_car | -0.161 | 1.8e+308 | 6.21 | 5.23e-10 | -0.2 | -0.449 | 5.63 | 1.85e-08 |
mu_no_parent | b_non_work_mom_par_act | -0.133 | 1.8e+308 | 3.03 | 0.00244 | -0.0938 | -0.113 | 2.91 | 0.00362 |
mu_no_parent | b_veh_per_driver_kid_act | 0.132 | 1.8e+308 | 6.87 | 6.6e-12 | 0.16 | 0.278 | 6.2 | 5.64e-10 |
mu_no_parent | b_veh_per_driver_kid_car | -0.00295 | 1.8e+308 | 5.08 | 3.87e-07 | 0.00153 | 0.0291 | 4.62 | 3.77e-06 |
mu_no_parent | b_veh_per_driver_par_act | 0.145 | 1.8e+308 | 6.86 | 6.75e-12 | 0.0462 | 0.0197 | 4.19 | 2.78e-05 |
mu_no_parent | b_y2017_kid_act | 0.028 | 1.8e+308 | 5.67 | 1.45e-08 | 0.174 | 0.201 | 5.18 | 2.26e-07 |
mu_no_parent | b_y2017_kid_car | -0.0568 | 1.8e+308 | 5.54 | 2.95e-08 | -0.0623 | -0.371 | 5.05 | 4.33e-07 |
mu_no_parent | b_y2017_par_act | -0.227 | 1.8e+308 | -2.94 | 0.00331 | 0.0183 | 0.00543 | -1.97 | 0.0492 |
mu_no_parent | mu_active | -0.412 | 1.8e+308 | -0.306 | 0.76 | -1.57 | -0.104 | -0.125 | 0.9 |
mu_no_parent | mu_motor | -0.22 | 1.8e+308 | 1.8e+308 | 0 | -0.365 | -0.4 | -89.5 | 0 |
mu_parent | alpha_KID_act | 0.0201 | 1.8e+308 | 3.67 | 0.000239 | 0.174 | 0.849 | 1.73 | 0.0834 |
mu_parent | alpha_PAR_act | 0.0449 | 1.8e+308 | 4.57 | 4.89e-06 | 0.304 | 0.967 | 2.18 | 0.0293 |
mu_parent | alpha_kid_CAR | -0.00433 | 1.8e+308 | 4.03 | 5.65e-05 | -0.034 | -0.784 | 1.69 | 0.0908 |
mu_parent | alpha_par_CAR | 7.35e-05 | 1.8e+308 | 4.66 | 3.22e-06 | 0.000316 | 0.292 | 1.97 | 0.0484 |
mu_parent | asc_kid_act | 0.0267 | 1.8e+308 | 14 | 0 | 0.118 | 0.441 | 6.79 | 1.14e-11 |
mu_parent | asc_kid_car | 0.0126 | 1.8e+308 | 10.9 | 0 | 0.0839 | 0.42 | 5.18 | 2.22e-07 |
mu_parent | asc_par_act | 0.112 | 1.8e+308 | 13.4 | 0 | 0.536 | 0.818 | 9.67 | 0 |
mu_parent | b_age_kid_act | -0.00649 | 1.8e+308 | 0.206 | 0.837 | -0.000413 | -0.0031 | 0.0942 | 0.925 |
mu_parent | b_age_kid_car | 0.00318 | 1.8e+308 | 2.18 | 0.0291 | 0.0335 | 0.217 | 0.995 | 0.32 |
mu_parent | b_age_par_act | 0.0387 | 1.8e+308 | 6.6 | 4.06e-11 | 0.236 | 0.708 | 3.5 | 0.000468 |
mu_parent | b_female_kid_act | 0.0341 | 1.8e+308 | 8.29 | 2.22e-16 | 0.181 | 0.433 | 4.94 | 7.89e-07 |
mu_parent | b_female_kid_car | -0.00341 | 1.8e+308 | 6.53 | 6.67e-11 | -0.0378 | -0.232 | 2.96 | 0.00308 |
mu_parent | b_female_par_act | 0.0903 | 1.8e+308 | 4.45 | 8.47e-06 | 0.693 | 0.734 | 4.25 | 2.09e-05 |
mu_parent | b_has_big_sib_kid_act | 0.182 | 1.8e+308 | -6.28 | 3.49e-10 | 2.16 | 0.461 | -6.24 | 4.44e-10 |
mu_parent | b_has_big_sib_kid_car | 0.0941 | 1.8e+308 | -5.28 | 1.27e-07 | 0.915 | 0.284 | -5.37 | 7.84e-08 |
mu_parent | b_has_big_sib_par_act | -1.55 | 1.8e+308 | -0.773 | 0.44 | -11.7 | -0.859 | -0.424 | 0.671 |
mu_parent | b_has_lil_sib_kid_act | -0.0212 | 1.8e+308 | 0.407 | 0.684 | -0.134 | -0.32 | 0.218 | 0.827 |
mu_parent | b_has_lil_sib_kid_car | 0.00358 | 1.8e+308 | 1.07 | 0.286 | 0.0443 | 0.196 | 0.537 | 0.591 |
mu_parent | b_has_lil_sib_par_act | -0.148 | 1.8e+308 | 0.253 | 0.801 | -0.931 | -0.817 | 0.126 | 0.899 |
mu_parent | b_log_density_kid_act | -0.261 | 1.8e+308 | -4.14 | 3.48e-05 | -1.67 | -0.66 | -2.6 | 0.0094 |
mu_parent | b_log_density_kid_car | -0.00387 | 1.8e+308 | 0.669 | 0.504 | -0.013 | -0.0408 | 0.505 | 0.614 |
mu_parent | b_log_density_par_act | -0.237 | 1.8e+308 | -6.18 | 6.21e-10 | -0.412 | -0.126 | -5.33 | 1.01e-07 |
mu_parent | b_log_distance_kid_act | 0.0161 | 1.8e+308 | 9.02 | 0 | 0.0767 | 0.821 | 3.8 | 0.000146 |
mu_parent | b_log_distance_kid_car | -0.00134 | 1.8e+308 | 6.02 | 1.75e-09 | -0.0156 | -0.201 | 2.57 | 0.0103 |
mu_parent | b_log_distance_par_act | 0.0682 | 1.8e+308 | 12.5 | 0 | 0.428 | 0.982 | 6.1 | 1.04e-09 |
mu_parent | b_log_income_k_kid_act | 0.00787 | 1.8e+308 | 4.76 | 1.96e-06 | 0.0351 | 0.161 | 2.26 | 0.024 |
mu_parent | b_log_income_k_kid_car | -0.000131 | 1.8e+308 | 4.77 | 1.85e-06 | -0.00321 | -0.0955 | 2.05 | 0.0399 |
mu_parent | b_log_income_k_par_act | -0.0117 | 1.8e+308 | 3.46 | 0.000532 | -0.112 | -0.3 | 1.72 | 0.0849 |
mu_parent | b_non_work_dad_kid_ace | -0.0306 | 1.8e+308 | 4.07 | 4.7e-05 | -0.332 | -0.481 | 2.27 | 0.0233 |
mu_parent | b_non_work_dad_kid_car | -0.00443 | 1.8e+308 | 6.38 | 1.77e-10 | -0.049 | -0.236 | 3.15 | 0.00163 |
mu_parent | b_non_work_dad_par_act | 0.0597 | 1.8e+308 | 1.25 | 0.21 | 0.641 | 0.511 | 1.17 | 0.24 |
mu_parent | b_non_work_mom_kid_act | -0.0269 | 1.8e+308 | 4.98 | 6.49e-07 | -0.201 | -0.386 | 2.74 | 0.00618 |
mu_parent | b_non_work_mom_kid_car | -0.0085 | 1.8e+308 | 7.64 | 2.13e-14 | -0.0887 | -0.244 | 3.87 | 0.00011 |
mu_parent | b_non_work_mom_par_act | -0.0441 | 1.8e+308 | 0.812 | 0.417 | -0.135 | -0.197 | 0.552 | 0.581 |
mu_parent | b_veh_per_driver_kid_act | 0.0289 | 1.8e+308 | 6.32 | 2.66e-10 | 0.16 | 0.34 | 3.89 | 0.000101 |
mu_parent | b_veh_per_driver_kid_car | -0.00187 | 1.8e+308 | 4.48 | 7.57e-06 | -0.0114 | -0.264 | 1.98 | 0.0477 |
mu_parent | b_veh_per_driver_par_act | 0.234 | 1.8e+308 | 6.62 | 3.6e-11 | 1.51 | 0.788 | 4.45 | 8.7e-06 |
mu_parent | b_y2017_kid_act | -0.0729 | 1.8e+308 | 3.98 | 6.84e-05 | -0.536 | -0.756 | 1.89 | 0.0592 |
mu_parent | b_y2017_kid_car | -0.00751 | 1.8e+308 | 5.96 | 2.57e-09 | -0.0556 | -0.404 | 2.67 | 0.00756 |
mu_parent | b_y2017_par_act | -0.481 | 1.8e+308 | -4.82 | 1.46e-06 | -2.53 | -0.915 | -2.53 | 0.0115 |
mu_parent | mu_active | 1.53 | 1.8e+308 | -1.03 | 0.303 | 11.7 | 0.949 | -0.419 | 0.675 |
mu_parent | mu_motor | 0.0476 | 1.8e+308 | 1.8e+308 | 0 | 0.2 | 0.266 | -142 | 0 |
mu_parent | mu_no_parent | 0.0412 | 1.8e+308 | -3.19 | 0.00144 | -0.0509 | -0.0464 | -2.25 | 0.0244 |
Smallest eigenvalue: -211585
+Largest eigenvalue: 2.88797e+06
+Condition number: -13.6492
+ \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/cross-nest/cross_nest.pickle b/models/IATBR plan/4 alternatives/cross-nest/cross_nest.pickle new file mode 100644 index 0000000..79e5fcf Binary files /dev/null and b/models/IATBR plan/4 alternatives/cross-nest/cross_nest.pickle differ diff --git a/models/IATBR plan/4 alternatives/ind-nest/__ind_nests.iter b/models/IATBR plan/4 alternatives/ind-nest/__ind_nests.iter new file mode 100644 index 0000000..2fc3a29 --- /dev/null +++ b/models/IATBR plan/4 alternatives/ind-nest/__ind_nests.iter @@ -0,0 +1,38 @@ +asc_kid_act = -4.104011840553357 +asc_kid_car = -4.0729382533155 +asc_par_act = -4.929215365488686 +b_age_kid_act = 2.2477575007796733 +b_age_kid_car = 2.2250862266129987 +b_age_par_act = -2.1888189850926256 +b_female_kid_act = -2.8293677488808333 +b_female_kid_car = -2.7929030158373442 +b_female_par_act = -1.2224872395182238 +b_has_big_sib_kid_act = 3.997589425671292 +b_has_big_sib_kid_car = 4.005903769327959 +b_has_big_sib_par_act = 0.8533323005926954 +b_has_lil_sib_kid_act = 3.052517489356268 +b_has_lil_sib_kid_car = 3.0789930969513537 +b_has_lil_sib_par_act = 2.9454322288170722 +b_log_density_kid_act = 1.0534018723271965 +b_log_density_kid_car = 1.0251522501534798 +b_log_density_par_act = 3.4788443884380067 +b_log_distance_kid_act = -1.359553040281869 +b_log_distance_kid_car = -1.3376559846510532 +b_log_distance_par_act = -1.5177562646655853 +b_log_income_k_kid_act = -0.5728807954948306 +b_log_income_k_kid_car = -0.5718765584800294 +b_log_income_k_par_act = 0.5983580349921319 +b_non_work_dad_kid_ace = -1.0833311574922633 +b_non_work_dad_kid_car = -1.0695858322728584 +b_non_work_dad_par_act = 1.905511550479955 +b_non_work_mom_kid_act = -2.608124911911315 +b_non_work_mom_kid_car = -2.6605210436747075 +b_non_work_mom_par_act = 3.210995564659463 +b_veh_per_driver_kid_act = -2.308482196478211 +b_veh_per_driver_kid_car = -1.734656270433022 +b_veh_per_driver_par_act = -96.78588722068422 +b_y2017_kid_act = -2.5147393026500287 +b_y2017_kid_car = -2.502102330842429 +b_y2017_par_act = 23.808772729621243 +mu_kid = 74.46835114706923 +mu_parent = 1.136367686184986 diff --git a/models/IATBR plan/4 alternatives/ind-nest/biogeme.toml b/models/IATBR plan/4 alternatives/ind-nest/biogeme.toml new file mode 100644 index 0000000..ebd0919 --- /dev/null +++ b/models/IATBR plan/4 alternatives/ind-nest/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on March 27, 2024. 11:07:52 + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 10000 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + diff --git a/models/IATBR plan/4 alternatives/ind-nest/ind_nests.html b/models/IATBR plan/4 alternatives/ind-nest/ind_nests.html new file mode 100644 index 0000000..be9f23e --- /dev/null +++ b/models/IATBR plan/4 alternatives/ind-nest/ind_nests.html @@ -0,0 +1,810 @@ + + + + +biogeme 3.2.13 [2024-04-05]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-06 00:46:14.830988
+Report file: | ind_nests.html |
Database name: | est |
Number of estimated parameters: | 38 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -6806.705 |
Final log likelihood: | -4214.44 |
Likelihood ratio test for the init. model: | 5184.531 |
Rho-square for the init. model: | 0.381 |
Rho-square-bar for the init. model: | 0.375 |
Akaike Information Criterion: | 8504.879 |
Bayesian Information Criterion: | 8751.842 |
Final gradient norm: | 5.6383E-02 |
Nbr of threads: | 12 |
Relative gradient: | 6.025619898399379e-06 |
Cause of termination: | Relative gradient = 6e-06 <= 6.1e-06 |
Number of function evaluations: | 5640 |
Number of gradient evaluations: | 5633 |
Number of hessian evaluations: | 5632 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 5639 |
Proportion of Hessian calculation: | 5632/5632 = 100.0% |
Optimization time: | 7:10:10.554931 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
asc_kid_act | -4.1 | 0.358 | -11.5 | 0 |
asc_kid_car | -4.07 | 0.358 | -11.4 | 0 |
asc_par_act | -4.93 | 1.34 | -3.69 | 0.000227 |
b_age_kid_act | 2.25 | 0.168 | 13.4 | 0 |
b_age_kid_car | 2.23 | 0.168 | 13.2 | 0 |
b_age_par_act | -2.19 | 0.61 | -3.59 | 0.00033 |
b_female_kid_act | -2.83 | 0.666 | -4.25 | 2.13e-05 |
b_female_kid_car | -2.79 | 0.665 | -4.2 | 2.7e-05 |
b_female_par_act | -1.22 | 1.21 | -1.01 | 0.314 |
b_has_big_sib_kid_act | 4 | 0.702 | 5.69 | 1.24e-08 |
b_has_big_sib_kid_car | 4.01 | 0.703 | 5.7 | 1.2e-08 |
b_has_big_sib_par_act | 0.853 | 1.23 | 0.692 | 0.489 |
b_has_lil_sib_kid_act | 3.05 | 0.701 | 4.36 | 1.33e-05 |
b_has_lil_sib_kid_car | 3.08 | 0.702 | 4.39 | 1.14e-05 |
b_has_lil_sib_par_act | 2.95 | 1.49 | 1.98 | 0.0477 |
b_log_density_kid_act | 1.05 | 0.264 | 3.99 | 6.72e-05 |
b_log_density_kid_car | 1.03 | 0.264 | 3.88 | 0.000106 |
b_log_density_par_act | 3.48 | 0.991 | 3.51 | 0.000446 |
b_log_distance_kid_act | -1.36 | 0.0705 | -19.3 | 0 |
b_log_distance_kid_car | -1.34 | 0.0706 | -18.9 | 0 |
b_log_distance_par_act | -1.52 | 0.315 | -4.82 | 1.45e-06 |
b_log_income_k_kid_act | -0.573 | 0.392 | -1.46 | 0.144 |
b_log_income_k_kid_car | -0.572 | 0.392 | -1.46 | 0.144 |
b_log_income_k_par_act | 0.598 | 0.672 | 0.891 | 0.373 |
b_non_work_dad_kid_ace | -1.08 | 1.08 | -1 | 0.316 |
b_non_work_dad_kid_car | -1.07 | 1.08 | -0.99 | 0.322 |
b_non_work_dad_par_act | 1.91 | 1.72 | 1.11 | 0.268 |
b_non_work_mom_kid_act | -2.61 | 0.716 | -3.64 | 0.000268 |
b_non_work_mom_kid_car | -2.66 | 0.716 | -3.72 | 0.000203 |
b_non_work_mom_par_act | 3.21 | 1.38 | 2.33 | 0.0198 |
b_veh_per_driver_kid_act | -2.31 | 7.08 | -0.326 | 0.744 |
b_veh_per_driver_kid_car | -1.73 | 7.05 | -0.246 | 0.806 |
b_veh_per_driver_par_act | -96.8 | 25.2 | -3.84 | 0.000124 |
b_y2017_kid_act | -2.51 | 0.823 | -3.06 | 0.00223 |
b_y2017_kid_car | -2.5 | 0.823 | -3.04 | 0.00236 |
b_y2017_par_act | 23.8 | 5.72 | 4.16 | 3.18e-05 |
mu_kid | 74.5 | 39.8 | 1.87 | 0.0612 |
mu_parent | 1.14 | 0.279 | 4.07 | 4.73e-05 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_kid_car | asc_kid_act | 0.122 | 0.954 | 0.288 | 0.774 | 0.128 | 0.999 | 1.62 | 0.106 |
asc_par_act | asc_kid_act | 0.0506 | 0.122 | -0.706 | 0.48 | 0.0472 | 0.0987 | -0.611 | 0.541 |
asc_par_act | asc_kid_car | 0.0466 | 0.113 | -0.731 | 0.465 | 0.0469 | 0.0981 | -0.634 | 0.526 |
b_age_kid_act | asc_kid_act | -0.0313 | -0.535 | 13.6 | 0 | -0.032 | -0.531 | 13.5 | 0 |
b_age_kid_act | asc_kid_car | -0.0294 | -0.502 | 13.7 | 0 | -0.0319 | -0.531 | 13.5 | 0 |
b_age_kid_act | asc_par_act | 0.0164 | 0.0869 | 6.22 | 4.99e-10 | 0.0298 | 0.133 | 5.42 | 6.1e-08 |
b_age_kid_car | asc_kid_act | -0.027 | -0.434 | 13.7 | 0 | -0.0319 | -0.529 | 13.5 | 0 |
b_age_kid_car | asc_kid_car | -0.0335 | -0.54 | 13.3 | 0 | -0.0321 | -0.533 | 13.4 | 0 |
b_age_kid_car | asc_par_act | 0.0193 | 0.0961 | 6.21 | 5.46e-10 | 0.03 | 0.133 | 5.4 | 6.7e-08 |
b_age_kid_car | b_age_kid_act | 0.0254 | 0.893 | -0.289 | 0.773 | 0.0282 | 0.997 | -1.79 | 0.0738 |
b_age_par_act | asc_kid_act | -0.00614 | -0.0315 | 2.9 | 0.00378 | -0.00762 | -0.0349 | 2.67 | 0.00762 |
b_age_par_act | asc_kid_car | -0.00736 | -0.0378 | 2.84 | 0.00449 | -0.0077 | -0.0353 | 2.63 | 0.00865 |
b_age_par_act | asc_par_act | 0.277 | 0.439 | 2.64 | 0.0084 | 0.449 | 0.55 | 2.44 | 0.0147 |
b_age_par_act | b_age_kid_act | 0.0204 | 0.229 | -8.34 | 0 | 0.0273 | 0.266 | -7.55 | 4.35e-14 |
b_age_par_act | b_age_kid_car | 0.0213 | 0.225 | -8.27 | 2.22e-16 | 0.0273 | 0.266 | -7.51 | 5.86e-14 |
b_female_kid_act | asc_kid_act | -0.0142 | -0.0593 | 1.64 | 0.1 | -0.014 | -0.0588 | 1.65 | 0.0996 |
b_female_kid_act | asc_kid_car | -0.0177 | -0.0742 | 1.59 | 0.111 | -0.0142 | -0.0597 | 1.61 | 0.108 |
b_female_kid_act | asc_par_act | 0.0155 | 0.0201 | 1.59 | 0.113 | 0.0145 | 0.0163 | 1.42 | 0.157 |
b_female_kid_act | b_age_kid_act | 0.000605 | 0.00555 | -7.4 | 1.34e-13 | 0.000567 | 0.00507 | -7.41 | 1.31e-13 |
b_female_kid_act | b_age_kid_car | 0.00319 | 0.0275 | -7.38 | 1.55e-13 | 0.000801 | 0.00715 | -7.38 | 1.64e-13 |
b_female_kid_act | b_age_par_act | 0.0106 | 0.0291 | -0.754 | 0.451 | 0.00412 | 0.0101 | -0.713 | 0.476 |
b_female_kid_car | asc_kid_act | -0.0211 | -0.0876 | 1.66 | 0.0966 | -0.0141 | -0.059 | 1.69 | 0.0903 |
b_female_kid_car | asc_kid_car | -0.0111 | -0.0461 | 1.65 | 0.0992 | -0.014 | -0.0587 | 1.65 | 0.098 |
b_female_kid_car | asc_par_act | 0.0109 | 0.014 | 1.61 | 0.108 | 0.0144 | 0.0162 | 1.44 | 0.15 |
b_female_kid_car | b_age_kid_act | 0.00286 | 0.026 | -7.32 | 2.41e-13 | 0.000734 | 0.00656 | -7.36 | 1.89e-13 |
b_female_kid_car | b_age_kid_car | -0.00443 | -0.038 | -7.16 | 8.27e-13 | 0.000776 | 0.00693 | -7.32 | 2.43e-13 |
b_female_kid_car | b_age_par_act | 0.00913 | 0.0249 | -0.706 | 0.48 | 0.0042 | 0.0103 | -0.673 | 0.501 |
b_female_kid_car | b_female_kid_act | 0.441 | 0.982 | 0.287 | 0.774 | 0.443 | 0.999 | 1.52 | 0.128 |
b_female_par_act | asc_kid_act | -0.00394 | -0.00908 | 2.27 | 0.023 | 0.000411 | 0.000944 | 2.28 | 0.0228 |
b_female_par_act | asc_kid_car | -0.00526 | -0.0121 | 2.25 | 0.0246 | -0.00013 | -0.0003 | 2.25 | 0.0243 |
b_female_par_act | asc_par_act | 0.155 | 0.111 | 2.35 | 0.019 | 0.178 | 0.11 | 2.17 | 0.0297 |
b_female_par_act | b_age_kid_act | 0.00777 | 0.0392 | -2.85 | 0.00435 | 0.00677 | 0.0332 | -2.84 | 0.00445 |
b_female_par_act | b_age_kid_car | 0.00873 | 0.0415 | -2.83 | 0.00464 | 0.00718 | 0.0351 | -2.83 | 0.00471 |
b_female_par_act | b_age_par_act | 0.103 | 0.156 | 0.773 | 0.439 | 0.153 | 0.207 | 0.779 | 0.436 |
b_female_par_act | b_female_kid_act | 0.15 | 0.185 | 1.26 | 0.206 | 0.149 | 0.184 | 1.26 | 0.207 |
b_female_par_act | b_female_kid_car | 0.148 | 0.182 | 1.23 | 0.218 | 0.148 | 0.183 | 1.23 | 0.217 |
b_has_big_sib_kid_act | asc_kid_act | -0.0543 | -0.216 | 9.49 | 0 | -0.0542 | -0.216 | 9.48 | 0 |
b_has_big_sib_kid_act | asc_kid_car | -0.0549 | -0.219 | 9.44 | 0 | -0.0543 | -0.216 | 9.45 | 0 |
b_has_big_sib_kid_act | asc_par_act | -0.00333 | -0.0041 | 6.59 | 4.53e-11 | 0.047 | 0.0501 | 6.04 | 1.57e-09 |
b_has_big_sib_kid_act | b_age_kid_act | 0.0202 | 0.176 | 2.53 | 0.0115 | 0.0209 | 0.177 | 2.53 | 0.0115 |
b_has_big_sib_kid_act | b_age_kid_car | 0.0206 | 0.169 | 2.55 | 0.0107 | 0.021 | 0.178 | 2.56 | 0.0105 |
b_has_big_sib_kid_act | b_age_par_act | 0.0117 | 0.0306 | 7.07 | 1.6e-12 | 0.0357 | 0.0835 | 6.95 | 3.74e-12 |
b_has_big_sib_kid_act | b_female_kid_act | -0.0143 | -0.0306 | 6.94 | 3.8e-12 | -0.00782 | -0.0167 | 7 | 2.59e-12 |
b_has_big_sib_kid_act | b_female_kid_car | -0.0151 | -0.0319 | 6.87 | 6.22e-12 | -0.00742 | -0.0159 | 6.96 | 3.29e-12 |
b_has_big_sib_kid_act | b_female_par_act | -7.58e-05 | -8.9e-05 | 3.73 | 0.000195 | 0.0115 | 0.0135 | 3.74 | 0.000181 |
b_has_big_sib_kid_car | asc_kid_act | -0.0559 | -0.222 | 9.47 | 0 | -0.0545 | -0.217 | 9.48 | 0 |
b_has_big_sib_kid_car | asc_kid_car | -0.0535 | -0.213 | 9.47 | 0 | -0.0546 | -0.217 | 9.45 | 0 |
b_has_big_sib_kid_car | asc_par_act | -0.00437 | -0.00538 | 6.59 | 4.49e-11 | 0.0468 | 0.0498 | 6.04 | 1.53e-09 |
b_has_big_sib_kid_car | b_age_kid_act | 0.0207 | 0.18 | 2.54 | 0.0111 | 0.0212 | 0.18 | 2.54 | 0.0111 |
b_has_big_sib_kid_car | b_age_kid_car | 0.0189 | 0.155 | 2.55 | 0.0106 | 0.0213 | 0.18 | 2.57 | 0.0101 |
b_has_big_sib_kid_car | b_age_par_act | 0.0114 | 0.0298 | 7.07 | 1.56e-12 | 0.0357 | 0.0833 | 6.95 | 3.62e-12 |
b_has_big_sib_kid_car | b_female_kid_act | -0.0153 | -0.0326 | 6.94 | 3.82e-12 | -0.00778 | -0.0166 | 7 | 2.49e-12 |
b_has_big_sib_kid_car | b_female_kid_car | -0.0124 | -0.0263 | 6.9 | 5.22e-12 | -0.00732 | -0.0157 | 6.97 | 3.16e-12 |
b_has_big_sib_kid_car | b_female_par_act | -0.000427 | -0.000502 | 3.73 | 0.000191 | 0.0114 | 0.0133 | 3.75 | 0.000178 |
b_has_big_sib_kid_car | b_has_big_sib_kid_act | 0.493 | 0.999 | 0.243 | 0.808 | 0.493 | 1 | 0.433 | 0.665 |
b_has_big_sib_par_act | asc_kid_act | -0.0183 | -0.041 | 3.79 | 0.000152 | -0.0164 | -0.0371 | 3.82 | 0.000132 |
b_has_big_sib_par_act | asc_kid_car | -0.0183 | -0.0411 | 3.76 | 0.000167 | -0.0167 | -0.0378 | 3.8 | 0.000146 |
b_has_big_sib_par_act | asc_par_act | -0.179 | -0.124 | 3.21 | 0.00133 | -0.0555 | -0.0337 | 3.13 | 0.00177 |
b_has_big_sib_par_act | b_age_kid_act | 0.00444 | 0.0218 | -1.11 | 0.265 | 0.00769 | 0.0371 | -1.13 | 0.26 |
b_has_big_sib_par_act | b_age_kid_car | 0.00446 | 0.0207 | -1.09 | 0.274 | 0.00787 | 0.0379 | -1.11 | 0.268 |
b_has_big_sib_par_act | b_age_par_act | 0.0405 | 0.0597 | 2.29 | 0.022 | 0.0666 | 0.0885 | 2.29 | 0.0218 |
b_has_big_sib_par_act | b_female_kid_act | -0.0049 | -0.00591 | 2.6 | 0.00927 | -0.00209 | -0.00255 | 2.62 | 0.00867 |
b_has_big_sib_par_act | b_female_kid_car | -0.00494 | -0.0059 | 2.57 | 0.0101 | -0.00237 | -0.00289 | 2.6 | 0.00936 |
b_has_big_sib_par_act | b_female_par_act | -0.0375 | -0.0249 | 1.18 | 0.238 | -0.0705 | -0.0471 | 1.17 | 0.241 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 0.163 | 0.186 | -2.4 | 0.0164 | 0.169 | 0.195 | -2.43 | 0.0152 |
b_has_big_sib_par_act | b_has_big_sib_kid_car | 0.163 | 0.186 | -2.41 | 0.0161 | 0.169 | 0.194 | -2.43 | 0.0149 |
b_has_lil_sib_kid_act | asc_kid_act | -0.045 | -0.179 | 8.48 | 0 | -0.0416 | -0.166 | 8.54 | 0 |
b_has_lil_sib_kid_act | asc_kid_car | -0.0469 | -0.187 | 8.43 | 0 | -0.0413 | -0.165 | 8.51 | 0 |
b_has_lil_sib_kid_act | asc_par_act | -0.0665 | -0.0819 | 5.69 | 1.24e-08 | -0.0646 | -0.0689 | 5.14 | 2.69e-07 |
b_has_lil_sib_kid_act | b_age_kid_act | 0.00113 | 0.00979 | 1.12 | 0.264 | -0.00189 | -0.0161 | 1.11 | 0.266 |
b_has_lil_sib_kid_act | b_age_kid_car | 0.00253 | 0.0207 | 1.15 | 0.251 | -0.00222 | -0.0188 | 1.14 | 0.253 |
b_has_lil_sib_kid_act | b_age_par_act | -0.0226 | -0.0591 | 5.73 | 9.9e-09 | -0.0311 | -0.0727 | 5.45 | 5.04e-08 |
b_has_lil_sib_kid_act | b_female_kid_act | -0.00609 | -0.013 | 6.03 | 1.62e-09 | -0.00871 | -0.0187 | 6.03 | 1.64e-09 |
b_has_lil_sib_kid_act | b_female_kid_car | -0.00834 | -0.0176 | 5.96 | 2.57e-09 | -0.00818 | -0.0175 | 6 | 2.02e-09 |
b_has_lil_sib_kid_act | b_female_par_act | -0.0138 | -0.0162 | 3.03 | 0.00245 | -0.0171 | -0.0201 | 3.02 | 0.0025 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 0.132 | 0.268 | -1.11 | 0.266 | 0.129 | 0.262 | -1.11 | 0.268 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_car | 0.132 | 0.267 | -1.12 | 0.262 | 0.129 | 0.262 | -1.12 | 0.264 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 0.0496 | 0.0567 | 1.58 | 0.115 | 0.0502 | 0.0581 | 1.59 | 0.112 |
b_has_lil_sib_kid_car | asc_kid_act | -0.05 | -0.198 | 8.42 | 0 | -0.0418 | -0.166 | 8.56 | 0 |
b_has_lil_sib_kid_car | asc_kid_car | -0.0421 | -0.167 | 8.48 | 0 | -0.0412 | -0.164 | 8.53 | 0 |
b_has_lil_sib_kid_car | asc_par_act | -0.0699 | -0.0855 | 5.7 | 1.22e-08 | -0.0647 | -0.069 | 5.16 | 2.47e-07 |
b_has_lil_sib_kid_car | b_age_kid_act | 0.00277 | 0.024 | 1.15 | 0.249 | -0.00188 | -0.0159 | 1.15 | 0.251 |
b_has_lil_sib_kid_car | b_age_kid_car | -0.00303 | -0.0247 | 1.17 | 0.243 | -0.00239 | -0.0202 | 1.18 | 0.239 |
b_has_lil_sib_kid_car | b_age_par_act | -0.0237 | -0.0615 | 5.74 | 9.7e-09 | -0.0311 | -0.0727 | 5.47 | 4.39e-08 |
b_has_lil_sib_kid_car | b_female_kid_act | -0.00911 | -0.0193 | 6.02 | 1.71e-09 | -0.00879 | -0.0188 | 6.05 | 1.42e-09 |
b_has_lil_sib_kid_car | b_female_kid_car | 0.000189 | 0.000398 | 6.02 | 1.74e-09 | -0.00803 | -0.0172 | 6.02 | 1.73e-09 |
b_has_lil_sib_kid_car | b_female_par_act | -0.0149 | -0.0174 | 3.04 | 0.00235 | -0.0175 | -0.0205 | 3.04 | 0.00236 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_act | 0.132 | 0.266 | -1.08 | 0.282 | 0.129 | 0.262 | -1.08 | 0.281 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_car | 0.134 | 0.27 | -1.09 | 0.276 | 0.129 | 0.262 | -1.09 | 0.277 |
b_has_lil_sib_kid_car | b_has_big_sib_par_act | 0.0495 | 0.0564 | 1.59 | 0.111 | 0.05 | 0.0578 | 1.61 | 0.108 |
b_has_lil_sib_kid_car | b_has_lil_sib_kid_act | 0.492 | 0.991 | 0.283 | 0.778 | 0.491 | 0.999 | 1.11 | 0.268 |
b_has_lil_sib_par_act | asc_kid_act | -0.0217 | -0.0434 | 4.83 | 1.36e-06 | -0.0152 | -0.0286 | 4.58 | 4.7e-06 |
b_has_lil_sib_par_act | asc_kid_car | -0.0195 | -0.0391 | 4.82 | 1.47e-06 | -0.0145 | -0.0273 | 4.56 | 5.14e-06 |
b_has_lil_sib_par_act | asc_par_act | -0.708 | -0.438 | 3.63 | 0.000286 | -1.03 | -0.517 | 3.2 | 0.00138 |
b_has_lil_sib_par_act | b_age_kid_act | -0.0178 | -0.0776 | 0.491 | 0.624 | -0.0338 | -0.135 | 0.459 | 0.646 |
b_has_lil_sib_par_act | b_age_kid_car | -0.0193 | -0.0797 | 0.506 | 0.613 | -0.0343 | -0.137 | 0.474 | 0.636 |
b_has_lil_sib_par_act | b_age_par_act | -0.265 | -0.347 | 3.08 | 0.00209 | -0.383 | -0.422 | 2.8 | 0.00503 |
b_has_lil_sib_par_act | b_female_kid_act | -0.0162 | -0.0174 | 3.7 | 0.000215 | -0.0182 | -0.0183 | 3.52 | 0.000432 |
b_has_lil_sib_par_act | b_female_kid_car | -0.0136 | -0.0145 | 3.68 | 0.000237 | -0.0175 | -0.0177 | 3.5 | 0.000468 |
b_has_lil_sib_par_act | b_female_par_act | -0.175 | -0.103 | 2.14 | 0.032 | -0.249 | -0.138 | 2.04 | 0.0416 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 0.0386 | 0.0393 | -0.683 | 0.495 | 0.00684 | 0.00655 | -0.641 | 0.521 |
b_has_lil_sib_par_act | b_has_big_sib_kid_car | 0.0391 | 0.0398 | -0.688 | 0.491 | 0.00703 | 0.00672 | -0.646 | 0.518 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 0.412 | 0.236 | 1.28 | 0.202 | 0.335 | 0.183 | 1.2 | 0.232 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 0.197 | 0.201 | -0.0747 | 0.94 | 0.207 | 0.198 | -0.0707 | 0.944 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_car | 0.199 | 0.202 | -0.0931 | 0.926 | 0.207 | 0.198 | -0.0882 | 0.93 |
b_log_density_kid_act | asc_kid_act | -0.0576 | -0.62 | 9.26 | 0 | -0.0585 | -0.619 | 9.19 | 0 |
b_log_density_kid_act | asc_kid_car | -0.0547 | -0.59 | 9.29 | 0 | -0.0584 | -0.618 | 9.14 | 0 |
b_log_density_kid_act | asc_par_act | -0.0579 | -0.193 | 4.85 | 1.23e-06 | -0.0745 | -0.211 | 4.22 | 2.4e-05 |
b_log_density_kid_act | b_age_kid_act | 5.89e-05 | 0.00139 | -3.9 | 9.72e-05 | -0.00116 | -0.0262 | -3.77 | 0.000164 |
b_log_density_kid_act | b_age_kid_car | -0.00202 | -0.045 | -3.68 | 0.000234 | -0.00117 | -0.0262 | -3.7 | 0.00022 |
b_log_density_kid_act | b_age_par_act | -0.0171 | -0.121 | 5.14 | 2.82e-07 | -0.023 | -0.143 | 4.64 | 3.42e-06 |
b_log_density_kid_act | b_female_kid_act | -0.0061 | -0.0353 | 5.36 | 8.24e-08 | -0.0062 | -0.0353 | 5.36 | 8.42e-08 |
b_log_density_kid_act | b_female_kid_car | -0.00276 | -0.0158 | 5.31 | 1.12e-07 | -0.00633 | -0.036 | 5.31 | 1.11e-07 |
b_log_density_kid_act | b_female_par_act | -0.012 | -0.0382 | 1.82 | 0.0685 | -0.0113 | -0.0353 | 1.82 | 0.069 |
b_log_density_kid_act | b_has_big_sib_kid_act | 0.000569 | 0.00313 | -3.94 | 8.22e-05 | -0.00299 | -0.0161 | -3.9 | 9.47e-05 |
b_log_density_kid_act | b_has_big_sib_kid_car | 0.00133 | 0.0073 | -3.95 | 7.75e-05 | -0.00311 | -0.0167 | -3.91 | 9.21e-05 |
b_log_density_kid_act | b_has_big_sib_par_act | 0.00222 | 0.00686 | 0.158 | 0.875 | -0.00581 | -0.0178 | 0.158 | 0.874 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 0.0041 | 0.0225 | -2.69 | 0.00717 | 0.0048 | 0.0259 | -2.69 | 0.0071 |
b_log_density_kid_act | b_has_lil_sib_kid_car | 0.00654 | 0.0357 | -2.72 | 0.00646 | 0.0048 | 0.0259 | -2.73 | 0.00642 |
b_log_density_kid_act | b_has_lil_sib_par_act | 0.0289 | 0.0796 | -1.35 | 0.177 | 0.0406 | 0.103 | -1.28 | 0.202 |
b_log_density_kid_car | asc_kid_act | -0.0522 | -0.544 | 9.3 | 0 | -0.0582 | -0.615 | 9.14 | 0 |
b_log_density_kid_car | asc_kid_car | -0.0599 | -0.626 | 9.02 | 0 | -0.0584 | -0.617 | 9.09 | 0 |
b_log_density_kid_car | asc_par_act | -0.0544 | -0.176 | 4.83 | 1.35e-06 | -0.0742 | -0.21 | 4.2 | 2.62e-05 |
b_log_density_kid_car | b_age_kid_act | -0.0017 | -0.0387 | -3.83 | 0.000128 | -0.00127 | -0.0286 | -3.85 | 0.000117 |
b_log_density_kid_car | b_age_kid_car | 0.00391 | 0.0842 | -3.91 | 9.07e-05 | -0.00108 | -0.0242 | -3.79 | 0.000153 |
b_log_density_kid_car | b_age_par_act | -0.016 | -0.11 | 5.08 | 3.84e-07 | -0.023 | -0.143 | 4.6 | 4.16e-06 |
b_log_density_kid_car | b_female_kid_act | -0.00287 | -0.0161 | 5.33 | 9.65e-08 | -0.00604 | -0.0343 | 5.32 | 1.04e-07 |
b_log_density_kid_car | b_female_kid_car | -0.0119 | -0.0659 | 5.16 | 2.51e-07 | -0.00645 | -0.0366 | 5.27 | 1.39e-07 |
b_log_density_kid_car | b_female_par_act | -0.0108 | -0.0333 | 1.8 | 0.0722 | -0.0109 | -0.0338 | 1.8 | 0.0724 |
b_log_density_kid_car | b_has_big_sib_kid_act | 0.00116 | 0.00615 | -3.96 | 7.37e-05 | -0.00329 | -0.0177 | -3.94 | 8.19e-05 |
b_log_density_kid_car | b_has_big_sib_kid_car | -0.000892 | -0.00474 | -3.96 | 7.54e-05 | -0.00346 | -0.0186 | -3.95 | 7.97e-05 |
b_log_density_kid_car | b_has_big_sib_par_act | 0.00224 | 0.00673 | 0.135 | 0.892 | -0.00558 | -0.0171 | 0.136 | 0.892 |
b_log_density_kid_car | b_has_lil_sib_kid_act | 0.00585 | 0.0311 | -2.72 | 0.00644 | 0.00448 | 0.0242 | -2.73 | 0.00637 |
b_log_density_kid_car | b_has_lil_sib_kid_car | -0.000712 | -0.00377 | -2.72 | 0.00662 | 0.00424 | 0.0228 | -2.76 | 0.00577 |
b_log_density_kid_car | b_has_lil_sib_par_act | 0.0269 | 0.0718 | -1.37 | 0.172 | 0.04 | 0.102 | -1.29 | 0.196 |
b_log_density_kid_car | b_log_density_kid_act | 0.0646 | 0.931 | -0.287 | 0.774 | 0.0697 | 0.998 | -1.62 | 0.105 |
b_log_density_par_act | asc_kid_act | -0.0248 | -0.0809 | 7.95 | 1.78e-15 | -0.027 | -0.0762 | 7.03 | 2.09e-12 |
b_log_density_par_act | asc_kid_car | -0.0222 | -0.0724 | 7.94 | 2e-15 | -0.0266 | -0.075 | 7 | 2.5e-12 |
b_log_density_par_act | asc_par_act | -0.869 | -0.878 | 4.31 | 1.64e-05 | -1.18 | -0.891 | 3.71 | 0.000205 |
b_log_density_par_act | b_age_kid_act | -0.0181 | -0.129 | 1.38 | 0.167 | -0.0256 | -0.153 | 1.2 | 0.232 |
b_log_density_par_act | b_age_kid_car | -0.02 | -0.135 | 1.4 | 0.162 | -0.0258 | -0.155 | 1.22 | 0.224 |
b_log_density_par_act | b_age_par_act | -0.275 | -0.59 | 4.51 | 6.52e-06 | -0.371 | -0.614 | 3.92 | 9.02e-05 |
b_log_density_par_act | b_female_kid_act | -0.0163 | -0.0285 | 5.74 | 9.74e-09 | -0.00759 | -0.0115 | 5.26 | 1.46e-07 |
b_log_density_par_act | b_female_kid_car | -0.0132 | -0.0229 | 5.7 | 1.21e-08 | -0.00725 | -0.011 | 5.23 | 1.71e-07 |
b_log_density_par_act | b_female_par_act | -0.158 | -0.152 | 2.96 | 0.00305 | -0.205 | -0.17 | 2.78 | 0.00548 |
b_log_density_par_act | b_has_big_sib_kid_act | -0.00889 | -0.0148 | -0.465 | 0.642 | -0.0483 | -0.0694 | -0.414 | 0.679 |
b_log_density_par_act | b_has_big_sib_kid_car | -0.00819 | -0.0136 | -0.473 | 0.636 | -0.0481 | -0.0691 | -0.42 | 0.674 |
b_log_density_par_act | b_has_big_sib_par_act | 0.0162 | 0.0152 | 1.75 | 0.0799 | -0.0443 | -0.0363 | 1.63 | 0.103 |
b_log_density_par_act | b_has_lil_sib_kid_act | 0.0368 | 0.0612 | 0.397 | 0.691 | 0.0376 | 0.0541 | 0.361 | 0.718 |
b_log_density_par_act | b_has_lil_sib_kid_car | 0.039 | 0.0645 | 0.372 | 0.71 | 0.0378 | 0.0543 | 0.338 | 0.735 |
b_log_density_par_act | b_has_lil_sib_par_act | 0.416 | 0.347 | 0.391 | 0.696 | 0.564 | 0.383 | 0.371 | 0.711 |
b_log_density_par_act | b_log_density_kid_act | 0.0492 | 0.222 | 2.9 | 0.00378 | 0.0596 | 0.228 | 2.51 | 0.012 |
b_log_density_par_act | b_log_density_kid_car | 0.0468 | 0.204 | 2.91 | 0.0036 | 0.0592 | 0.226 | 2.54 | 0.0111 |
b_log_distance_kid_act | asc_kid_act | 0.00589 | 0.24 | 7.89 | 2.89e-15 | 0.00485 | 0.192 | 7.81 | 5.77e-15 |
b_log_distance_kid_act | asc_kid_car | 0.00428 | 0.175 | 7.71 | 1.27e-14 | 0.00476 | 0.189 | 7.73 | 1.11e-14 |
b_log_distance_kid_act | asc_par_act | 0.0319 | 0.401 | 3.16 | 0.0016 | 0.039 | 0.414 | 2.73 | 0.00641 |
b_log_distance_kid_act | b_age_kid_act | -0.00125 | -0.111 | -19.6 | 0 | -0.000934 | -0.0788 | -19.3 | 0 |
b_log_distance_kid_act | b_age_kid_car | -7.77e-05 | -0.00652 | -19.2 | 0 | -0.000873 | -0.0735 | -19.1 | 0 |
b_log_distance_kid_act | b_age_par_act | 0.0131 | 0.349 | 1.58 | 0.114 | 0.0173 | 0.402 | 1.42 | 0.156 |
b_log_distance_kid_act | b_female_kid_act | 0.00312 | 0.0682 | 2.21 | 0.0273 | 0.00289 | 0.0615 | 2.21 | 0.0271 |
b_log_distance_kid_act | b_female_kid_car | 0.00124 | 0.0269 | 2.13 | 0.0336 | 0.0028 | 0.0597 | 2.16 | 0.0311 |
b_log_distance_kid_act | b_female_par_act | 0.0087 | 0.105 | -0.114 | 0.91 | 0.0119 | 0.139 | -0.114 | 0.91 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -0.000261 | -0.00542 | -7.59 | 3.2e-14 | 0.00126 | 0.0255 | -7.61 | 2.73e-14 |
b_log_distance_kid_act | b_has_big_sib_kid_car | -0.00069 | -0.0143 | -7.59 | 3.18e-14 | 0.0012 | 0.0243 | -7.61 | 2.64e-14 |
b_log_distance_kid_act | b_has_big_sib_par_act | -0.00141 | -0.0165 | -1.77 | 0.0761 | 0.0018 | 0.0207 | -1.79 | 0.0729 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -0.00315 | -0.0653 | -6.21 | 5.27e-10 | -0.00409 | -0.0828 | -6.21 | 5.22e-10 |
b_log_distance_kid_act | b_has_lil_sib_kid_car | -0.00452 | -0.0932 | -6.2 | 5.7e-10 | -0.00417 | -0.0843 | -6.24 | 4.29e-10 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -0.0222 | -0.231 | -3.04 | 0.00237 | -0.0314 | -0.299 | -2.85 | 0.00436 |
b_log_distance_kid_act | b_log_density_kid_act | -0.00174 | -0.0976 | -8.78 | 0 | -0.00118 | -0.0632 | -8.69 | 0 |
b_log_distance_kid_act | b_log_density_kid_car | -0.000273 | -0.0148 | -8.6 | 0 | -0.00109 | -0.0587 | -8.59 | 0 |
b_log_distance_kid_act | b_log_density_par_act | -0.0208 | -0.354 | -5.48 | 4.18e-08 | -0.0259 | -0.371 | -4.75 | 2.06e-06 |
b_log_distance_kid_car | asc_kid_act | 0.00171 | 0.0529 | 7.59 | 3.15e-14 | 0.00475 | 0.188 | 7.86 | 3.77e-15 |
b_log_distance_kid_car | asc_kid_car | 0.00827 | 0.255 | 7.92 | 2.44e-15 | 0.00487 | 0.193 | 7.79 | 6.44e-15 |
b_log_distance_kid_car | asc_par_act | 0.0291 | 0.278 | 3.16 | 0.00155 | 0.0389 | 0.412 | 2.74 | 0.00609 |
b_log_distance_kid_car | b_age_kid_act | 0.000106 | 0.00717 | -19.2 | 0 | -0.000862 | -0.0726 | -19.2 | 0 |
b_log_distance_kid_car | b_age_kid_car | -0.00467 | -0.297 | -16.3 | 0 | -0.000939 | -0.0789 | -19 | 0 |
b_log_distance_kid_car | b_age_par_act | 0.0122 | 0.247 | 1.61 | 0.108 | 0.0172 | 0.401 | 1.46 | 0.146 |
b_log_distance_kid_car | b_female_kid_act | 0.000629 | 0.0104 | 2.22 | 0.0265 | 0.00272 | 0.0578 | 2.24 | 0.0249 |
b_log_distance_kid_car | b_female_kid_car | 0.00829 | 0.136 | 2.18 | 0.029 | 0.00282 | 0.06 | 2.19 | 0.0286 |
b_log_distance_kid_car | b_female_par_act | 0.00778 | 0.0708 | -0.0952 | 0.924 | 0.0116 | 0.135 | -0.0955 | 0.924 |
b_log_distance_kid_car | b_has_big_sib_kid_act | -0.000716 | -0.0113 | -7.53 | 5.22e-14 | 0.00138 | 0.0279 | -7.58 | 3.42e-14 |
b_log_distance_kid_car | b_has_big_sib_kid_car | 0.00103 | 0.0162 | -7.56 | 4.04e-14 | 0.00137 | 0.0275 | -7.59 | 3.31e-14 |
b_log_distance_kid_car | b_has_big_sib_par_act | -0.00144 | -0.0127 | -1.75 | 0.0793 | 0.00161 | 0.0184 | -1.78 | 0.0758 |
b_log_distance_kid_car | b_has_lil_sib_kid_act | -0.0045 | -0.0708 | -6.14 | 8.13e-10 | -0.00384 | -0.0776 | -6.18 | 6.23e-10 |
b_log_distance_kid_car | b_has_lil_sib_kid_car | 0.00108 | 0.0169 | -6.22 | 5.13e-10 | -0.00375 | -0.0757 | -6.22 | 5.06e-10 |
b_log_distance_kid_car | b_has_lil_sib_par_act | -0.0207 | -0.163 | -3.02 | 0.0025 | -0.031 | -0.295 | -2.84 | 0.00456 |
b_log_distance_kid_car | b_log_density_kid_act | 0.000275 | 0.0117 | -8.74 | 0 | -0.00119 | -0.064 | -8.6 | 0 |
b_log_distance_kid_car | b_log_density_kid_car | -0.00569 | -0.235 | -7.82 | 5.33e-15 | -0.0013 | -0.0695 | -8.49 | 0 |
b_log_distance_kid_car | b_log_density_par_act | -0.0189 | -0.244 | -5.46 | 4.78e-08 | -0.0257 | -0.367 | -4.73 | 2.27e-06 |
b_log_distance_kid_car | b_log_distance_kid_act | 0.00358 | 0.576 | 0.289 | 0.773 | 0.00491 | 0.987 | 1.89 | 0.0583 |
b_log_distance_par_act | asc_kid_act | 0.00433 | 0.0441 | 5.86 | 4.57e-09 | 0.00254 | 0.0225 | 5.48 | 4.16e-08 |
b_log_distance_par_act | asc_kid_car | 0.0031 | 0.0316 | 5.76 | 8.46e-09 | 0.00248 | 0.022 | 5.42 | 5.94e-08 |
b_log_distance_par_act | asc_par_act | 0.247 | 0.777 | 3.56 | 0.000375 | 0.343 | 0.814 | 3.11 | 0.00185 |
b_log_distance_par_act | b_age_kid_act | 0.00685 | 0.153 | -12.7 | 0 | 0.0107 | 0.202 | -11.6 | 0 |
b_log_distance_par_act | b_age_kid_car | 0.00775 | 0.163 | -12.5 | 0 | 0.0107 | 0.202 | -11.5 | 0 |
b_log_distance_par_act | b_age_par_act | 0.108 | 0.723 | 1.7 | 0.0894 | 0.151 | 0.785 | 1.63 | 0.103 |
b_log_distance_par_act | b_female_kid_act | 0.00698 | 0.0381 | 1.84 | 0.0653 | 0.00773 | 0.0369 | 1.81 | 0.0707 |
b_log_distance_par_act | b_female_kid_car | 0.00554 | 0.03 | 1.77 | 0.0761 | 0.00775 | 0.037 | 1.76 | 0.0789 |
b_log_distance_par_act | b_female_par_act | 0.0631 | 0.19 | -0.248 | 0.804 | 0.0723 | 0.189 | -0.247 | 0.805 |
b_log_distance_par_act | b_has_big_sib_kid_act | 0.00357 | 0.0186 | -7.36 | 1.79e-13 | 0.0173 | 0.078 | -7.39 | 1.52e-13 |
b_log_distance_par_act | b_has_big_sib_kid_car | 0.00325 | 0.0168 | -7.37 | 1.76e-13 | 0.0172 | 0.0778 | -7.39 | 1.47e-13 |
b_log_distance_par_act | b_has_big_sib_par_act | -0.00459 | -0.0135 | -1.86 | 0.0635 | 0.0225 | 0.0578 | -1.89 | 0.0589 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -0.0154 | -0.0797 | -5.9 | 3.6e-09 | -0.0172 | -0.078 | -5.78 | 7.41e-09 |
b_log_distance_par_act | b_has_lil_sib_kid_car | -0.0164 | -0.0847 | -5.9 | 3.65e-09 | -0.0172 | -0.078 | -5.81 | 6.23e-09 |
b_log_distance_par_act | b_has_lil_sib_par_act | -0.168 | -0.437 | -2.9 | 0.00373 | -0.254 | -0.543 | -2.66 | 0.00787 |
b_log_distance_par_act | b_log_density_kid_act | -0.0113 | -0.158 | -6.33 | 2.48e-10 | -0.0148 | -0.178 | -5.77 | 8.04e-09 |
b_log_distance_par_act | b_log_density_kid_car | -0.0101 | -0.138 | -6.22 | 5.03e-10 | -0.0148 | -0.177 | -5.7 | 1.17e-08 |
b_log_distance_par_act | b_log_density_par_act | -0.163 | -0.695 | -4.69 | 2.71e-06 | -0.219 | -0.701 | -4.05 | 5.03e-05 |
b_log_distance_par_act | b_log_distance_kid_act | 0.0103 | 0.549 | -0.649 | 0.516 | 0.0124 | 0.557 | -0.561 | 0.575 |
b_log_distance_par_act | b_log_distance_kid_car | 0.00947 | 0.381 | -0.709 | 0.478 | 0.0124 | 0.555 | -0.639 | 0.523 |
b_log_income_k_kid_act | asc_kid_act | -0.073 | -0.517 | 5.39 | 7.15e-08 | -0.0744 | -0.53 | 5.38 | 7.42e-08 |
b_log_income_k_kid_act | asc_kid_car | -0.0726 | -0.515 | 5.35 | 9e-08 | -0.0741 | -0.528 | 5.34 | 9.36e-08 |
b_log_income_k_kid_act | asc_par_act | -0.0252 | -0.0552 | 3.51 | 0.000455 | -0.0351 | -0.0669 | 3.07 | 0.00213 |
b_log_income_k_kid_act | b_age_kid_act | 0.0033 | 0.0512 | -6.73 | 1.74e-11 | 0.00401 | 0.0609 | -6.76 | 1.35e-11 |
b_log_income_k_kid_act | b_age_kid_car | 0.00305 | 0.0446 | -6.6 | 4.11e-11 | 0.00395 | 0.0598 | -6.7 | 2.02e-11 |
b_log_income_k_kid_act | b_age_par_act | 0.000682 | 0.00317 | 2.41 | 0.0162 | -0.00624 | -0.0261 | 2.2 | 0.0276 |
b_log_income_k_kid_act | b_female_kid_act | -0.00136 | -0.00517 | 2.91 | 0.00367 | 0.00145 | 0.00557 | 2.93 | 0.00341 |
b_log_income_k_kid_act | b_female_kid_car | -0.000955 | -0.0036 | 2.84 | 0.00449 | 0.00148 | 0.00566 | 2.88 | 0.00396 |
b_log_income_k_kid_act | b_female_par_act | -0.000531 | -0.00111 | 0.509 | 0.611 | -0.00782 | -0.0164 | 0.507 | 0.612 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 0.00153 | 0.00551 | -5.69 | 1.28e-08 | 0.00547 | 0.0199 | -5.73 | 9.91e-09 |
b_log_income_k_kid_act | b_has_big_sib_kid_car | 0.00162 | 0.00584 | -5.7 | 1.22e-08 | 0.00559 | 0.0203 | -5.74 | 9.51e-09 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 0.00264 | 0.00538 | -1.09 | 0.274 | 0.00292 | 0.00604 | -1.1 | 0.27 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 0.0121 | 0.0435 | -4.59 | 4.54e-06 | 0.0119 | 0.0435 | -4.6 | 4.22e-06 |
b_log_income_k_kid_act | b_has_lil_sib_kid_car | 0.0124 | 0.0443 | -4.6 | 4.2e-06 | 0.0121 | 0.0441 | -4.63 | 3.62e-06 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 0.00449 | 0.00814 | -2.43 | 0.0153 | 0.0126 | 0.0216 | -2.3 | 0.0215 |
b_log_income_k_kid_act | b_log_density_kid_act | 0.00436 | 0.0427 | -3.51 | 0.000442 | 0.00692 | 0.0668 | -3.55 | 0.000383 |
b_log_income_k_kid_act | b_log_density_kid_car | 0.00405 | 0.0383 | -3.41 | 0.000643 | 0.00672 | 0.0648 | -3.49 | 0.000491 |
b_log_income_k_kid_act | b_log_density_par_act | 0.00193 | 0.00572 | -4.31 | 1.64e-05 | 0.0138 | 0.0355 | -3.85 | 0.000118 |
b_log_income_k_kid_act | b_log_distance_kid_act | -0.00178 | -0.0657 | 1.94 | 0.052 | -0.00206 | -0.0745 | 1.95 | 0.0512 |
b_log_income_k_kid_act | b_log_distance_kid_car | -0.00153 | -0.043 | 1.87 | 0.0613 | -0.00196 | -0.0709 | 1.9 | 0.0579 |
b_log_income_k_kid_act | b_log_distance_par_act | -0.000443 | -0.00409 | 1.96 | 0.0497 | -0.00275 | -0.0222 | 1.86 | 0.0631 |
b_log_income_k_kid_car | asc_kid_act | -0.0732 | -0.518 | 5.39 | 7.21e-08 | -0.0742 | -0.529 | 5.39 | 7.21e-08 |
b_log_income_k_kid_car | asc_kid_car | -0.0725 | -0.514 | 5.35 | 8.86e-08 | -0.074 | -0.528 | 5.34 | 9.13e-08 |
b_log_income_k_kid_car | asc_par_act | -0.0253 | -0.0555 | 3.51 | 0.000454 | -0.035 | -0.0669 | 3.07 | 0.00212 |
b_log_income_k_kid_car | b_age_kid_act | 0.00337 | 0.0521 | -6.72 | 1.76e-11 | 0.00403 | 0.0612 | -6.77 | 1.32e-11 |
b_log_income_k_kid_car | b_age_kid_car | 0.00284 | 0.0415 | -6.59 | 4.45e-11 | 0.00396 | 0.0601 | -6.71 | 1.99e-11 |
b_log_income_k_kid_car | b_age_par_act | 0.000642 | 0.00298 | 2.41 | 0.0161 | -0.00616 | -0.0258 | 2.21 | 0.0274 |
b_log_income_k_kid_car | b_female_kid_act | -0.00148 | -0.00561 | 2.91 | 0.00367 | 0.00135 | 0.00516 | 2.93 | 0.00339 |
b_log_income_k_kid_car | b_female_kid_car | -0.00063 | -0.00237 | 2.84 | 0.00445 | 0.00136 | 0.00523 | 2.88 | 0.00394 |
b_log_income_k_kid_car | b_female_par_act | -0.000573 | -0.0012 | 0.51 | 0.61 | -0.00786 | -0.0165 | 0.508 | 0.612 |
b_log_income_k_kid_car | b_has_big_sib_kid_act | 0.0015 | 0.00543 | -5.69 | 1.3e-08 | 0.00557 | 0.0203 | -5.73 | 9.88e-09 |
b_log_income_k_kid_car | b_has_big_sib_kid_car | 0.0017 | 0.00613 | -5.7 | 1.23e-08 | 0.0057 | 0.0207 | -5.74 | 9.47e-09 |
b_log_income_k_kid_car | b_has_big_sib_par_act | 0.00264 | 0.00538 | -1.09 | 0.274 | 0.00304 | 0.0063 | -1.1 | 0.27 |
b_log_income_k_kid_car | b_has_lil_sib_kid_act | 0.012 | 0.0433 | -4.58 | 4.59e-06 | 0.012 | 0.0438 | -4.6 | 4.21e-06 |
b_log_income_k_kid_car | b_has_lil_sib_kid_car | 0.0126 | 0.0453 | -4.6 | 4.2e-06 | 0.0122 | 0.0445 | -4.63 | 3.62e-06 |
b_log_income_k_kid_car | b_has_lil_sib_par_act | 0.00456 | 0.00826 | -2.42 | 0.0153 | 0.0126 | 0.0216 | -2.3 | 0.0215 |
b_log_income_k_kid_car | b_log_density_kid_act | 0.00446 | 0.0435 | -3.51 | 0.000444 | 0.00682 | 0.0658 | -3.55 | 0.000386 |
b_log_income_k_kid_car | b_log_density_kid_car | 0.0038 | 0.0359 | -3.41 | 0.00066 | 0.00661 | 0.0638 | -3.48 | 0.000495 |
b_log_income_k_kid_car | b_log_density_par_act | 0.00202 | 0.00597 | -4.31 | 1.65e-05 | 0.0137 | 0.0354 | -3.85 | 0.000119 |
b_log_income_k_kid_car | b_log_distance_kid_act | -0.00183 | -0.0676 | 1.94 | 0.0519 | -0.00205 | -0.0742 | 1.95 | 0.0507 |
b_log_income_k_kid_car | b_log_distance_kid_car | -0.00132 | -0.037 | 1.88 | 0.0607 | -0.00195 | -0.0704 | 1.9 | 0.0574 |
b_log_income_k_kid_car | b_log_distance_par_act | -0.000483 | -0.00446 | 1.96 | 0.0496 | -0.00271 | -0.022 | 1.86 | 0.0627 |
b_log_income_k_kid_car | b_log_income_k_kid_act | 0.156 | 1 | 0.0912 | 0.927 | 0.154 | 1 | 0.1 | 0.92 |
b_log_income_k_par_act | asc_kid_act | -0.025 | -0.105 | 5.98 | 2.24e-09 | -0.021 | -0.0873 | 5.96 | 2.46e-09 |
b_log_income_k_par_act | asc_kid_car | -0.0249 | -0.105 | 5.94 | 2.81e-09 | -0.0215 | -0.0895 | 5.92 | 3.19e-09 |
b_log_income_k_par_act | asc_par_act | -0.238 | -0.311 | 3.68 | 0.000233 | -0.235 | -0.262 | 3.36 | 0.000785 |
b_log_income_k_par_act | b_age_kid_act | -0.000501 | -0.00462 | -2.41 | 0.0159 | -0.000944 | -0.00836 | -2.38 | 0.0175 |
b_log_income_k_par_act | b_age_kid_car | -0.000585 | -0.00508 | -2.37 | 0.0179 | -0.000581 | -0.00514 | -2.35 | 0.019 |
b_log_income_k_par_act | b_age_par_act | -0.0013 | -0.0036 | 3.24 | 0.0012 | -0.026 | -0.0634 | 2.98 | 0.00288 |
b_log_income_k_par_act | b_female_kid_act | -0.00178 | -0.00402 | 3.64 | 0.000277 | -0.00272 | -0.00608 | 3.61 | 0.000302 |
b_log_income_k_par_act | b_female_kid_car | -0.00164 | -0.00368 | 3.58 | 0.000341 | -0.00337 | -0.00754 | 3.57 | 0.000353 |
b_log_income_k_par_act | b_female_par_act | -0.0284 | -0.0353 | 1.3 | 0.194 | -0.0435 | -0.0534 | 1.28 | 0.199 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 0.00114 | 0.00246 | -3.52 | 0.000427 | -0.000525 | -0.00111 | -3.5 | 0.000472 |
b_log_income_k_par_act | b_has_big_sib_kid_car | 0.00117 | 0.00252 | -3.53 | 0.000415 | -0.000569 | -0.0012 | -3.5 | 0.000461 |
b_log_income_k_par_act | b_has_big_sib_par_act | 0.0557 | 0.0675 | -0.186 | 0.852 | 0.00465 | 0.00561 | -0.182 | 0.856 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 0.00695 | 0.0149 | -2.56 | 0.0105 | 0.00317 | 0.00674 | -2.54 | 0.0112 |
b_log_income_k_par_act | b_has_lil_sib_kid_car | 0.00705 | 0.015 | -2.58 | 0.00991 | 0.00283 | 0.006 | -2.56 | 0.0104 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 0.047 | 0.0506 | -1.55 | 0.122 | 0.0854 | 0.0854 | -1.49 | 0.137 |
b_log_income_k_par_act | b_log_density_kid_act | 0.00356 | 0.0207 | -0.643 | 0.52 | 0.00411 | 0.0231 | -0.635 | 0.525 |
b_log_income_k_par_act | b_log_density_kid_car | 0.00345 | 0.0194 | -0.6 | 0.548 | 0.00454 | 0.0256 | -0.596 | 0.551 |
b_log_income_k_par_act | b_log_density_par_act | 0.0457 | 0.0804 | -2.77 | 0.00561 | 0.0378 | 0.0568 | -2.47 | 0.0134 |
b_log_income_k_par_act | b_log_distance_kid_act | -0.00182 | -0.0398 | 2.92 | 0.00347 | 0.000168 | 0.00354 | 2.9 | 0.00374 |
b_log_income_k_par_act | b_log_distance_kid_car | -0.00173 | -0.0289 | 2.88 | 0.00398 | -0.000181 | -0.00381 | 2.86 | 0.00418 |
b_log_income_k_par_act | b_log_distance_par_act | -0.0163 | -0.0896 | 2.86 | 0.00427 | -0.0209 | -0.0987 | 2.75 | 0.00597 |
b_log_income_k_par_act | b_log_income_k_kid_act | 0.0528 | 0.202 | 1.67 | 0.0944 | 0.049 | 0.186 | 1.64 | 0.1 |
b_log_income_k_par_act | b_log_income_k_kid_car | 0.0528 | 0.202 | 1.67 | 0.0948 | 0.0491 | 0.186 | 1.64 | 0.1 |
b_non_work_dad_kid_ace | asc_kid_act | -0.0368 | -0.0951 | 2.58 | 0.00985 | -0.0422 | -0.109 | 2.57 | 0.0101 |
b_non_work_dad_kid_ace | asc_kid_car | -0.038 | -0.0984 | 2.55 | 0.0107 | -0.0415 | -0.108 | 2.55 | 0.0108 |
b_non_work_dad_kid_ace | asc_par_act | -0.014 | -0.0112 | 2.42 | 0.0157 | -0.0128 | -0.00888 | 2.23 | 0.0259 |
b_non_work_dad_kid_ace | b_age_kid_act | -0.0102 | -0.0579 | -3.02 | 0.00252 | -0.00999 | -0.055 | -3.02 | 0.0025 |
b_non_work_dad_kid_ace | b_age_kid_car | -0.00935 | -0.0499 | -3 | 0.00271 | -0.0103 | -0.0565 | -3 | 0.00268 |
b_non_work_dad_kid_ace | b_age_par_act | -0.00246 | -0.00418 | 0.912 | 0.362 | 0.00663 | 0.0101 | 0.896 | 0.371 |
b_non_work_dad_kid_ace | b_female_kid_act | 0.0115 | 0.0159 | 1.38 | 0.166 | 0.0136 | 0.0189 | 1.39 | 0.165 |
b_non_work_dad_kid_ace | b_female_kid_car | 0.0101 | 0.0139 | 1.35 | 0.177 | 0.0142 | 0.0198 | 1.36 | 0.174 |
b_non_work_dad_kid_ace | b_female_par_act | 0.0126 | 0.00963 | 0.0861 | 0.931 | 0.0199 | 0.0152 | 0.0863 | 0.931 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | 0.00815 | 0.0107 | -3.96 | 7.44e-05 | 0.0212 | 0.028 | -4 | 6.42e-05 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_car | 0.00782 | 0.0103 | -3.97 | 7.29e-05 | 0.0212 | 0.028 | -4 | 6.28e-05 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 0.00474 | 0.00352 | -1.18 | 0.239 | 0.00871 | 0.00654 | -1.19 | 0.236 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 0.0515 | 0.0678 | -3.31 | 0.000925 | 0.0549 | 0.0726 | -3.33 | 0.000883 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_car | 0.0504 | 0.0661 | -3.33 | 0.000882 | 0.0553 | 0.073 | -3.35 | 0.000819 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 0.0179 | 0.0119 | -2.29 | 0.0219 | 0.00568 | 0.00354 | -2.2 | 0.0281 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 0.000747 | 0.00266 | -1.92 | 0.0544 | 0.00434 | 0.0152 | -1.93 | 0.0537 |
b_non_work_dad_kid_ace | b_log_density_kid_car | 0.00186 | 0.00641 | -1.9 | 0.0579 | 0.00368 | 0.0129 | -1.9 | 0.0571 |
b_non_work_dad_kid_ace | b_log_density_par_act | 0.000391 | 0.000423 | -3.31 | 0.000933 | 4.48e-05 | 4.19e-05 | -3.11 | 0.00185 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | 0.00025 | 0.00337 | 0.255 | 0.799 | 0.000937 | 0.0123 | 0.256 | 0.798 |
b_non_work_dad_kid_ace | b_log_distance_kid_car | -0.000608 | -0.00621 | 0.234 | 0.815 | 0.00114 | 0.0149 | 0.235 | 0.814 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -0.000133 | -0.000447 | 0.39 | 0.697 | 0.0017 | 0.00501 | 0.387 | 0.699 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 0.0659 | 0.155 | -0.468 | 0.64 | 0.0722 | 0.17 | -0.471 | 0.638 |
b_non_work_dad_kid_ace | b_log_income_k_kid_car | 0.0659 | 0.154 | -0.468 | 0.64 | 0.0722 | 0.171 | -0.472 | 0.637 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 0.0249 | 0.0347 | -1.35 | 0.178 | 0.0206 | 0.0284 | -1.34 | 0.18 |
b_non_work_dad_kid_car | asc_kid_act | -0.0394 | -0.102 | 2.59 | 0.0097 | -0.0418 | -0.108 | 2.58 | 0.00977 |
b_non_work_dad_kid_car | asc_kid_car | -0.0355 | -0.0919 | 2.57 | 0.0103 | -0.0409 | -0.106 | 2.56 | 0.0105 |
b_non_work_dad_kid_car | asc_par_act | -0.0157 | -0.0126 | 2.42 | 0.0154 | -0.0132 | -0.00915 | 2.24 | 0.0254 |
b_non_work_dad_kid_car | b_age_kid_act | -0.00939 | -0.0531 | -3.01 | 0.00262 | -0.01 | -0.0553 | -3.01 | 0.00262 |
b_non_work_dad_kid_car | b_age_kid_car | -0.0122 | -0.0651 | -2.98 | 0.00291 | -0.0104 | -0.0572 | -2.99 | 0.00281 |
b_non_work_dad_kid_car | b_age_par_act | -0.003 | -0.00509 | 0.922 | 0.356 | 0.00638 | 0.00969 | 0.906 | 0.365 |
b_non_work_dad_kid_car | b_female_kid_act | 0.00994 | 0.0138 | 1.39 | 0.163 | 0.0139 | 0.0193 | 1.4 | 0.162 |
b_non_work_dad_kid_car | b_female_kid_car | 0.0145 | 0.0199 | 1.37 | 0.172 | 0.0146 | 0.0204 | 1.37 | 0.17 |
b_non_work_dad_kid_car | b_female_par_act | 0.012 | 0.00918 | 0.0945 | 0.925 | 0.0197 | 0.015 | 0.0948 | 0.924 |
b_non_work_dad_kid_car | b_has_big_sib_kid_act | 0.00786 | 0.0104 | -3.95 | 7.87e-05 | 0.0213 | 0.0281 | -3.98 | 6.77e-05 |
b_non_work_dad_kid_car | b_has_big_sib_kid_car | 0.0089 | 0.0117 | -3.96 | 7.61e-05 | 0.0213 | 0.0281 | -3.99 | 6.62e-05 |
b_non_work_dad_kid_car | b_has_big_sib_par_act | 0.00472 | 0.00351 | -1.17 | 0.243 | 0.0087 | 0.00653 | -1.18 | 0.239 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_act | 0.0506 | 0.0666 | -3.3 | 0.000974 | 0.0552 | 0.0729 | -3.31 | 0.000923 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_car | 0.054 | 0.0706 | -3.32 | 0.000899 | 0.0557 | 0.0736 | -3.33 | 0.000854 |
b_non_work_dad_kid_car | b_has_lil_sib_par_act | 0.0189 | 0.0125 | -2.28 | 0.0224 | 0.00651 | 0.00405 | -2.19 | 0.0287 |
b_non_work_dad_kid_car | b_log_density_kid_act | 0.002 | 0.00714 | -1.91 | 0.0559 | 0.00385 | 0.0135 | -1.91 | 0.0555 |
b_non_work_dad_kid_car | b_log_density_kid_car | -0.00152 | -0.00526 | -1.88 | 0.0604 | 0.00305 | 0.0107 | -1.89 | 0.059 |
b_non_work_dad_kid_car | b_log_density_par_act | 0.00154 | 0.00167 | -3.3 | 0.000965 | 0.000339 | 0.000317 | -3.1 | 0.00191 |
b_non_work_dad_kid_car | b_log_distance_kid_act | -0.000457 | -0.00615 | 0.267 | 0.789 | 0.000897 | 0.0118 | 0.268 | 0.789 |
b_non_work_dad_kid_car | b_log_distance_kid_car | 0.00227 | 0.0232 | 0.247 | 0.805 | 0.00117 | 0.0154 | 0.248 | 0.804 |
b_non_work_dad_kid_car | b_log_distance_par_act | -0.000675 | -0.00227 | 0.401 | 0.688 | 0.00158 | 0.00464 | 0.399 | 0.69 |
b_non_work_dad_kid_car | b_log_income_k_kid_act | 0.066 | 0.155 | -0.455 | 0.649 | 0.0722 | 0.171 | -0.458 | 0.647 |
b_non_work_dad_kid_car | b_log_income_k_kid_car | 0.0662 | 0.155 | -0.456 | 0.649 | 0.0723 | 0.171 | -0.459 | 0.646 |
b_non_work_dad_kid_car | b_log_income_k_par_act | 0.0249 | 0.0347 | -1.34 | 0.182 | 0.0205 | 0.0282 | -1.33 | 0.184 |
b_non_work_dad_kid_car | b_non_work_dad_kid_ace | 1.17 | 0.999 | 0.247 | 0.805 | 1.17 | 1 | 0.471 | 0.638 |
b_non_work_dad_par_act | asc_kid_act | -0.0162 | -0.0249 | 3.22 | 0.00129 | -0.0137 | -0.0222 | 3.4 | 0.000664 |
b_non_work_dad_par_act | asc_kid_car | -0.016 | -0.0245 | 3.2 | 0.00136 | -0.0139 | -0.0226 | 3.39 | 0.000708 |
b_non_work_dad_par_act | asc_par_act | -0.21 | -0.0994 | 3.03 | 0.00243 | -0.114 | -0.0493 | 3.06 | 0.00218 |
b_non_work_dad_par_act | b_age_kid_act | -0.00648 | -0.0217 | -0.187 | 0.852 | 7.38e-05 | 0.000255 | -0.198 | 0.843 |
b_non_work_dad_par_act | b_age_kid_car | -0.00667 | -0.0211 | -0.174 | 0.862 | 0.000234 | 0.000807 | -0.185 | 0.853 |
b_non_work_dad_par_act | b_age_par_act | -0.0764 | -0.0769 | 2.11 | 0.0351 | -0.0615 | -0.0587 | 2.2 | 0.0276 |
b_non_work_dad_par_act | b_female_kid_act | 0.00875 | 0.0072 | 2.44 | 0.0145 | 0.0176 | 0.0153 | 2.58 | 0.00989 |
b_non_work_dad_par_act | b_female_kid_car | 0.00905 | 0.00738 | 2.42 | 0.0154 | 0.0173 | 0.0151 | 2.56 | 0.0105 |
b_non_work_dad_par_act | b_female_par_act | 0.0263 | 0.0119 | 1.44 | 0.151 | 0.0191 | 0.00916 | 1.49 | 0.136 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 0.00111 | 0.000869 | -1.07 | 0.284 | 0.00461 | 0.00382 | -1.13 | 0.26 |
b_non_work_dad_par_act | b_has_big_sib_kid_car | 0.00118 | 0.000921 | -1.08 | 0.282 | 0.00453 | 0.00375 | -1.13 | 0.258 |
b_non_work_dad_par_act | b_has_big_sib_par_act | 0.00497 | 0.00219 | 0.477 | 0.633 | 0.0249 | 0.0117 | 0.5 | 0.617 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 0.0246 | 0.0192 | -0.591 | 0.555 | 0.00787 | 0.00653 | -0.619 | 0.536 |
b_non_work_dad_par_act | b_has_lil_sib_kid_car | 0.0248 | 0.0193 | -0.604 | 0.546 | 0.0079 | 0.00654 | -0.633 | 0.527 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 0.155 | 0.0607 | -0.466 | 0.641 | 0.191 | 0.0746 | -0.475 | 0.635 |
b_non_work_dad_par_act | b_log_density_kid_act | 0.00494 | 0.0105 | 0.463 | 0.643 | 0.00304 | 0.00669 | 0.49 | 0.624 |
b_non_work_dad_par_act | b_log_density_kid_car | 0.00471 | 0.00965 | 0.478 | 0.632 | 0.00323 | 0.0071 | 0.506 | 0.613 |
b_non_work_dad_par_act | b_log_density_par_act | 0.0537 | 0.0344 | -0.792 | 0.429 | -0.000395 | -0.000232 | -0.792 | 0.428 |
b_non_work_dad_par_act | b_log_distance_kid_act | -0.00441 | -0.0353 | 1.79 | 0.074 | 0.000686 | 0.00565 | 1.9 | 0.0579 |
b_non_work_dad_par_act | b_log_distance_kid_car | -0.00424 | -0.0257 | 1.77 | 0.0761 | 0.000438 | 0.0036 | 1.88 | 0.0596 |
b_non_work_dad_par_act | b_log_distance_par_act | -0.0385 | -0.0769 | 1.84 | 0.0664 | -0.00512 | -0.00944 | 1.95 | 0.0508 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 0.0261 | 0.0363 | 1.34 | 0.181 | 0.0175 | 0.026 | 1.41 | 0.158 |
b_non_work_dad_par_act | b_log_income_k_kid_car | 0.0261 | 0.0363 | 1.34 | 0.181 | 0.0176 | 0.0261 | 1.41 | 0.158 |
b_non_work_dad_par_act | b_log_income_k_par_act | 0.149 | 0.123 | 0.702 | 0.483 | 0.212 | 0.183 | 0.756 | 0.45 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 0.379 | 0.192 | 1.55 | 0.122 | 0.342 | 0.184 | 1.61 | 0.107 |
b_non_work_dad_par_act | b_non_work_dad_kid_car | 0.379 | 0.192 | 1.54 | 0.124 | 0.343 | 0.184 | 1.6 | 0.109 |
b_non_work_mom_kid_act | asc_kid_act | -0.0384 | -0.149 | 1.76 | 0.0791 | -0.0331 | -0.129 | 1.78 | 0.0752 |
b_non_work_mom_kid_act | asc_kid_car | -0.034 | -0.132 | 1.73 | 0.0835 | -0.033 | -0.129 | 1.74 | 0.0813 |
b_non_work_mom_kid_act | asc_par_act | -0.0587 | -0.0703 | 1.65 | 0.0987 | -0.0537 | -0.0561 | 1.5 | 0.135 |
b_non_work_mom_kid_act | b_age_kid_act | 0.00457 | 0.0387 | -6.62 | 3.64e-11 | 0.00434 | 0.0361 | -6.66 | 2.76e-11 |
b_non_work_mom_kid_act | b_age_kid_car | 0.00131 | 0.0105 | -6.53 | 6.68e-11 | 0.00424 | 0.0352 | -6.63 | 3.45e-11 |
b_non_work_mom_kid_act | b_age_par_act | -0.018 | -0.0457 | -0.454 | 0.65 | -0.015 | -0.0345 | -0.439 | 0.661 |
b_non_work_mom_kid_act | b_female_kid_act | -0.00737 | -0.0153 | 0.223 | 0.823 | -0.0215 | -0.0452 | 0.221 | 0.825 |
b_non_work_mom_kid_act | b_female_kid_car | -0.00214 | -0.0044 | 0.187 | 0.852 | -0.0211 | -0.0442 | 0.185 | 0.853 |
b_non_work_mom_kid_act | b_female_par_act | -0.0142 | -0.0163 | -0.975 | 0.329 | -0.0161 | -0.0185 | -0.975 | 0.329 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -0.00674 | -0.0133 | -6.52 | 7.12e-11 | 0.00236 | 0.00469 | -6.6 | 4e-11 |
b_non_work_mom_kid_act | b_has_big_sib_kid_car | -0.00555 | -0.011 | -6.53 | 6.5e-11 | 0.00269 | 0.00535 | -6.61 | 3.8e-11 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | -0.00513 | -0.00572 | -2.4 | 0.0164 | 0.00591 | 0.0067 | -2.43 | 0.0149 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -0.0333 | -0.0656 | -5.44 | 5.19e-08 | -0.0325 | -0.0648 | -5.48 | 4.34e-08 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_car | -0.0295 | -0.0578 | -5.48 | 4.35e-08 | -0.0324 | -0.0646 | -5.5 | 3.8e-08 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | 0.0206 | 0.0204 | -3.56 | 0.000375 | 0.0295 | 0.0277 | -3.4 | 0.000671 |
b_non_work_mom_kid_act | b_log_density_kid_act | -0.00768 | -0.041 | -4.71 | 2.43e-06 | -0.00974 | -0.0515 | -4.72 | 2.35e-06 |
b_non_work_mom_kid_act | b_log_density_kid_car | -0.0118 | -0.0608 | -4.63 | 3.66e-06 | -0.00997 | -0.0527 | -4.68 | 2.83e-06 |
b_non_work_mom_kid_act | b_log_density_par_act | 0.0301 | 0.0487 | -5.57 | 2.5e-08 | 0.0221 | 0.0312 | -5.06 | 4.29e-07 |
b_non_work_mom_kid_act | b_log_distance_kid_act | -0.000123 | -0.00249 | -1.72 | 0.0851 | 0.000594 | 0.0118 | -1.74 | 0.0822 |
b_non_work_mom_kid_act | b_log_distance_kid_car | 0.00303 | 0.0463 | -1.76 | 0.0789 | 0.000713 | 0.0141 | -1.77 | 0.0769 |
b_non_work_mom_kid_act | b_log_distance_par_act | -0.0129 | -0.0651 | -1.38 | 0.167 | -0.011 | -0.0488 | -1.37 | 0.171 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 0.0549 | 0.193 | -2.7 | 0.00686 | 0.0471 | 0.168 | -2.69 | 0.00711 |
b_non_work_mom_kid_act | b_log_income_k_kid_car | 0.055 | 0.193 | -2.71 | 0.00682 | 0.0471 | 0.168 | -2.69 | 0.00706 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 0.0164 | 0.0343 | -3.33 | 0.000874 | 0.0145 | 0.0302 | -3.32 | 0.00091 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -0.0258 | -0.033 | -1.16 | 0.248 | 0.000432 | 0.00056 | -1.18 | 0.239 |
b_non_work_mom_kid_act | b_non_work_dad_kid_car | -0.0238 | -0.0305 | -1.17 | 0.243 | 0.000387 | 0.0005 | -1.19 | 0.235 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -0.01 | -0.00763 | -2.3 | 0.0217 | 0.00884 | 0.00718 | -2.43 | 0.0152 |
b_non_work_mom_kid_car | asc_kid_act | -0.0284 | -0.108 | 1.7 | 0.0897 | -0.0329 | -0.128 | 1.72 | 0.086 |
b_non_work_mom_kid_car | asc_kid_car | -0.0435 | -0.166 | 1.63 | 0.104 | -0.0333 | -0.13 | 1.68 | 0.0931 |
b_non_work_mom_kid_car | asc_par_act | -0.0521 | -0.0613 | 1.61 | 0.107 | -0.0529 | -0.0553 | 1.46 | 0.144 |
b_non_work_mom_kid_car | b_age_kid_act | 0.00132 | 0.011 | -6.54 | 6.07e-11 | 0.00425 | 0.0353 | -6.73 | 1.74e-11 |
b_non_work_mom_kid_car | b_age_kid_car | 0.0123 | 0.0966 | -6.62 | 3.54e-11 | 0.0045 | 0.0373 | -6.7 | 2.11e-11 |
b_non_work_mom_kid_car | b_age_par_act | -0.0159 | -0.0397 | -0.506 | 0.613 | -0.0147 | -0.0337 | -0.493 | 0.622 |
b_non_work_mom_kid_car | b_female_kid_act | -0.0014 | -0.00285 | 0.17 | 0.865 | -0.0208 | -0.0436 | 0.169 | 0.866 |
b_non_work_mom_kid_car | b_female_kid_car | -0.019 | -0.0385 | 0.13 | 0.896 | -0.0208 | -0.0436 | 0.133 | 0.895 |
b_non_work_mom_kid_car | b_female_par_act | -0.012 | -0.0135 | -1.01 | 0.313 | -0.0152 | -0.0175 | -1.01 | 0.311 |
b_non_work_mom_kid_car | b_has_big_sib_kid_act | -0.00566 | -0.011 | -6.52 | 7.06e-11 | 0.00238 | 0.00472 | -6.65 | 2.83e-11 |
b_non_work_mom_kid_car | b_has_big_sib_kid_car | -0.00967 | -0.0188 | -6.5 | 8e-11 | 0.00261 | 0.00519 | -6.66 | 2.71e-11 |
b_non_work_mom_kid_car | b_has_big_sib_par_act | -0.00508 | -0.00556 | -2.43 | 0.0153 | 0.00626 | 0.00709 | -2.47 | 0.0135 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_act | -0.03 | -0.0582 | -5.47 | 4.61e-08 | -0.0333 | -0.0663 | -5.52 | 3.36e-08 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_car | -0.0429 | -0.0827 | -5.41 | 6.14e-08 | -0.0336 | -0.067 | -5.54 | 2.97e-08 |
b_non_work_mom_kid_car | b_has_lil_sib_par_act | 0.0169 | 0.0164 | -3.57 | 0.000354 | 0.0282 | 0.0264 | -3.43 | 0.000601 |
b_non_work_mom_kid_car | b_log_density_kid_act | -0.0125 | -0.0656 | -4.68 | 2.94e-06 | -0.00977 | -0.0516 | -4.79 | 1.7e-06 |
b_non_work_mom_kid_car | b_log_density_kid_car | 0.00122 | 0.00619 | -4.73 | 2.28e-06 | -0.00954 | -0.0504 | -4.75 | 2.02e-06 |
b_non_work_mom_kid_car | b_log_density_par_act | 0.0256 | 0.0408 | -5.56 | 2.72e-08 | 0.0213 | 0.03 | -5.1 | 3.48e-07 |
b_non_work_mom_kid_car | b_log_distance_kid_act | 0.00259 | 0.0513 | -1.77 | 0.0762 | 0.000734 | 0.0145 | -1.81 | 0.0702 |
b_non_work_mom_kid_car | b_log_distance_kid_car | -0.00802 | -0.121 | -1.76 | 0.0779 | 0.000525 | 0.0104 | -1.84 | 0.0657 |
b_non_work_mom_kid_car | b_log_distance_par_act | -0.0108 | -0.0537 | -1.43 | 0.152 | -0.0108 | -0.048 | -1.44 | 0.151 |
b_non_work_mom_kid_car | b_log_income_k_kid_act | 0.0543 | 0.187 | -2.73 | 0.00638 | 0.047 | 0.167 | -2.76 | 0.0058 |
b_non_work_mom_kid_car | b_log_income_k_kid_car | 0.0538 | 0.186 | -2.73 | 0.0064 | 0.047 | 0.168 | -2.76 | 0.00576 |
b_non_work_mom_kid_car | b_log_income_k_par_act | 0.0162 | 0.0333 | -3.35 | 0.00081 | 0.0154 | 0.0319 | -3.37 | 0.000743 |
b_non_work_mom_kid_car | b_non_work_dad_kid_ace | -0.0237 | -0.0299 | -1.19 | 0.234 | -0.000162 | -0.000209 | -1.22 | 0.223 |
b_non_work_mom_kid_car | b_non_work_dad_kid_car | -0.0304 | -0.0382 | -1.2 | 0.232 | -0.000449 | -0.000581 | -1.23 | 0.22 |
b_non_work_mom_kid_car | b_non_work_dad_par_act | -0.0105 | -0.00782 | -2.32 | 0.0205 | 0.0095 | 0.00771 | -2.46 | 0.014 |
b_non_work_mom_kid_car | b_non_work_mom_kid_act | 0.513 | 0.969 | -0.287 | 0.774 | 0.512 | 0.999 | -1.49 | 0.136 |
b_non_work_mom_par_act | asc_kid_act | -0.0164 | -0.0337 | 5.15 | 2.59e-07 | -0.0136 | -0.0276 | 5.1 | 3.36e-07 |
b_non_work_mom_par_act | asc_kid_car | -0.0137 | -0.0282 | 5.14 | 2.8e-07 | -0.0138 | -0.028 | 5.08 | 3.77e-07 |
b_non_work_mom_par_act | asc_par_act | -0.624 | -0.396 | 3.86 | 0.000112 | -0.733 | -0.398 | 3.59 | 0.000336 |
b_non_work_mom_par_act | b_age_kid_act | -0.0126 | -0.0566 | 0.697 | 0.486 | -0.0186 | -0.0802 | 0.687 | 0.492 |
b_non_work_mom_par_act | b_age_kid_car | -0.0146 | -0.0617 | 0.712 | 0.476 | -0.0184 | -0.0793 | 0.703 | 0.482 |
b_non_work_mom_par_act | b_age_par_act | -0.226 | -0.304 | 3.35 | 0.00082 | -0.321 | -0.381 | 3.16 | 0.00156 |
b_non_work_mom_par_act | b_female_kid_act | -0.0145 | -0.016 | 3.96 | 7.58e-05 | -0.0172 | -0.0188 | 3.92 | 8.95e-05 |
b_non_work_mom_par_act | b_female_kid_car | -0.0114 | -0.0124 | 3.93 | 8.42e-05 | -0.0176 | -0.0192 | 3.89 | 9.89e-05 |
b_non_work_mom_par_act | b_female_par_act | -0.2 | -0.121 | 2.3 | 0.0216 | -0.138 | -0.0823 | 2.32 | 0.0203 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | -0.0146 | -0.0153 | -0.51 | 0.61 | -0.0272 | -0.0281 | -0.503 | 0.615 |
b_non_work_mom_par_act | b_has_big_sib_kid_car | -0.0139 | -0.0145 | -0.516 | 0.606 | -0.0273 | -0.0281 | -0.508 | 0.611 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -0.0166 | -0.00981 | 1.27 | 0.204 | -0.0351 | -0.0206 | 1.26 | 0.207 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | 0.0172 | 0.018 | 0.104 | 0.917 | 0.0262 | 0.0271 | 0.104 | 0.917 |
b_non_work_mom_par_act | b_has_lil_sib_kid_car | 0.0195 | 0.0203 | 0.0867 | 0.931 | 0.0259 | 0.0268 | 0.0863 | 0.931 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | 0.17 | 0.0893 | 0.142 | 0.887 | 0.368 | 0.179 | 0.144 | 0.885 |
b_non_work_mom_par_act | b_log_density_kid_act | 0.0197 | 0.0556 | 1.57 | 0.116 | 0.023 | 0.0632 | 1.56 | 0.12 |
b_non_work_mom_par_act | b_log_density_kid_car | 0.0172 | 0.0471 | 1.59 | 0.112 | 0.0232 | 0.0636 | 1.58 | 0.115 |
b_non_work_mom_par_act | b_log_density_par_act | 0.312 | 0.267 | -0.191 | 0.848 | 0.341 | 0.25 | -0.181 | 0.857 |
b_non_work_mom_par_act | b_log_distance_kid_act | -0.0176 | -0.188 | 3.32 | 0.000902 | -0.0202 | -0.208 | 3.28 | 0.00105 |
b_non_work_mom_par_act | b_log_distance_kid_car | -0.0156 | -0.127 | 3.3 | 0.000954 | -0.0204 | -0.209 | 3.26 | 0.00111 |
b_non_work_mom_par_act | b_log_distance_par_act | -0.145 | -0.389 | 3.17 | 0.00151 | -0.187 | -0.431 | 3.07 | 0.00214 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 0.0141 | 0.0262 | 2.69 | 0.00722 | 0.0209 | 0.0387 | 2.67 | 0.00764 |
b_non_work_mom_par_act | b_log_income_k_kid_car | 0.0142 | 0.0264 | 2.69 | 0.00723 | 0.0209 | 0.0386 | 2.67 | 0.00765 |
b_non_work_mom_par_act | b_log_income_k_par_act | 0.201 | 0.222 | 1.9 | 0.0577 | 0.169 | 0.183 | 1.84 | 0.0656 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -0.0175 | -0.0119 | 2.46 | 0.0141 | 0.00678 | 0.00456 | 2.46 | 0.014 |
b_non_work_mom_par_act | b_non_work_dad_kid_car | -0.0163 | -0.011 | 2.45 | 0.0144 | 0.00701 | 0.00471 | 2.45 | 0.0143 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -0.015 | -0.00604 | 0.572 | 0.567 | 0.0784 | 0.0331 | 0.602 | 0.547 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 0.19 | 0.193 | 4.12 | 3.82e-05 | 0.184 | 0.187 | 4.07 | 4.7e-05 |
b_non_work_mom_par_act | b_non_work_mom_kid_car | 0.185 | 0.185 | 4.13 | 3.67e-05 | 0.184 | 0.186 | 4.11 | 4.03e-05 |
b_veh_per_driver_kid_act | asc_kid_act | -0.429 | -0.167 | 0.247 | 0.805 | -0.384 | -0.152 | 0.251 | 0.801 |
b_veh_per_driver_kid_act | asc_kid_car | -0.498 | -0.194 | 0.243 | 0.808 | -0.389 | -0.154 | 0.247 | 0.805 |
b_veh_per_driver_kid_act | asc_par_act | 0.991 | 0.119 | 0.367 | 0.714 | 1.51 | 0.16 | 0.375 | 0.708 |
b_veh_per_driver_kid_act | b_age_kid_act | -0.000918 | -0.00078 | -0.633 | 0.527 | 0.0179 | 0.0151 | -0.644 | 0.52 |
b_veh_per_driver_kid_act | b_age_kid_car | 0.0496 | 0.0397 | -0.631 | 0.528 | 0.0231 | 0.0194 | -0.641 | 0.522 |
b_veh_per_driver_kid_act | b_age_par_act | 0.491 | 0.125 | -0.0167 | 0.987 | 0.742 | 0.172 | -0.0171 | 0.986 |
b_veh_per_driver_kid_act | b_female_kid_act | 0.112 | 0.0234 | 0.0723 | 0.942 | -0.0102 | -0.00216 | 0.0733 | 0.942 |
b_veh_per_driver_kid_act | b_female_kid_car | 0.0314 | 0.00648 | 0.0671 | 0.947 | -0.0244 | -0.00518 | 0.0681 | 0.946 |
b_veh_per_driver_kid_act | b_female_par_act | 0.364 | 0.0417 | -0.15 | 0.881 | 0.397 | 0.0462 | -0.152 | 0.879 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 0.17 | 0.0336 | -0.875 | 0.381 | 0.156 | 0.0313 | -0.89 | 0.374 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_car | 0.151 | 0.0299 | -0.876 | 0.381 | 0.153 | 0.0308 | -0.891 | 0.373 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | -0.00491 | -0.000549 | -0.433 | 0.665 | 0.143 | 0.0164 | -0.441 | 0.659 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | -0.0585 | -0.0116 | -0.741 | 0.459 | -0.123 | -0.0248 | -0.752 | 0.452 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_car | -0.117 | -0.0231 | -0.744 | 0.457 | -0.128 | -0.0259 | -0.756 | 0.45 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | -0.814 | -0.0809 | -0.706 | 0.48 | -1.25 | -0.119 | -0.71 | 0.478 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 0.0489 | 0.0262 | -0.468 | 0.64 | 0.0142 | 0.00757 | -0.475 | 0.635 |
b_veh_per_driver_kid_act | b_log_density_kid_car | 0.112 | 0.0581 | -0.464 | 0.643 | 0.0223 | 0.0119 | -0.471 | 0.638 |
b_veh_per_driver_kid_act | b_log_density_par_act | -0.767 | -0.125 | -0.787 | 0.431 | -1.06 | -0.151 | -0.794 | 0.427 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 0.0449 | 0.091 | -0.132 | 0.895 | 0.0585 | 0.117 | -0.134 | 0.893 |
b_veh_per_driver_kid_act | b_log_distance_kid_car | -0.00383 | -0.00588 | -0.135 | 0.893 | 0.0525 | 0.105 | -0.137 | 0.891 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 0.336 | 0.17 | -0.111 | 0.912 | 0.459 | 0.206 | -0.113 | 0.91 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -0.389 | -0.137 | -0.239 | 0.811 | -0.427 | -0.154 | -0.243 | 0.808 |
b_veh_per_driver_kid_act | b_log_income_k_kid_car | -0.391 | -0.138 | -0.239 | 0.811 | -0.43 | -0.155 | -0.243 | 0.808 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -0.162 | -0.034 | -0.401 | 0.688 | -0.207 | -0.0436 | -0.407 | 0.684 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 0.301 | 0.0387 | -0.169 | 0.865 | 0.119 | 0.0156 | -0.172 | 0.864 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_car | 0.27 | 0.0347 | -0.171 | 0.864 | 0.111 | 0.0145 | -0.173 | 0.862 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 0.013 | 0.00099 | -0.568 | 0.57 | -0.0421 | -0.00346 | -0.578 | 0.563 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | 0.0422 | 0.00814 | 0.0415 | 0.967 | 0.205 | 0.0404 | 0.0423 | 0.966 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_car | 0.159 | 0.0301 | 0.0488 | 0.961 | 0.219 | 0.0433 | 0.0497 | 0.96 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | -0.612 | -0.0625 | -0.745 | 0.456 | -0.787 | -0.0807 | -0.754 | 0.451 |
b_veh_per_driver_kid_car | asc_kid_act | -0.538 | -0.206 | 0.321 | 0.748 | -0.384 | -0.152 | 0.333 | 0.739 |
b_veh_per_driver_kid_car | asc_kid_car | -0.393 | -0.151 | 0.318 | 0.75 | -0.384 | -0.152 | 0.329 | 0.742 |
b_veh_per_driver_kid_car | asc_par_act | 0.919 | 0.109 | 0.44 | 0.66 | 1.51 | 0.16 | 0.459 | 0.646 |
b_veh_per_driver_kid_car | b_age_kid_act | 0.0347 | 0.0291 | -0.546 | 0.585 | 0.019 | 0.0161 | -0.565 | 0.572 |
b_veh_per_driver_kid_car | b_age_kid_car | -0.071 | -0.0561 | -0.542 | 0.588 | 0.0202 | 0.017 | -0.562 | 0.574 |
b_veh_per_driver_kid_car | b_age_par_act | 0.468 | 0.118 | 0.0627 | 0.95 | 0.74 | 0.172 | 0.0652 | 0.948 |
b_veh_per_driver_kid_car | b_female_kid_act | 0.0469 | 0.00964 | 0.15 | 0.881 | -0.0182 | -0.00387 | 0.155 | 0.877 |
b_veh_per_driver_kid_car | b_female_kid_car | 0.217 | 0.0442 | 0.145 | 0.885 | -0.0267 | -0.00569 | 0.149 | 0.881 |
b_veh_per_driver_kid_car | b_female_par_act | 0.339 | 0.0384 | -0.0697 | 0.944 | 0.387 | 0.0452 | -0.0721 | 0.942 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_act | 0.158 | 0.0308 | -0.785 | 0.432 | 0.16 | 0.0323 | -0.812 | 0.417 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_car | 0.196 | 0.0383 | -0.787 | 0.431 | 0.159 | 0.032 | -0.813 | 0.416 |
b_veh_per_driver_kid_car | b_has_big_sib_par_act | -0.00549 | -0.000606 | -0.35 | 0.726 | 0.138 | 0.0159 | -0.363 | 0.717 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_act | -0.094 | -0.0184 | -0.652 | 0.514 | -0.114 | -0.0232 | -0.674 | 0.5 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_car | 0.0297 | 0.00577 | -0.658 | 0.511 | -0.115 | -0.0233 | -0.678 | 0.498 |
b_veh_per_driver_kid_car | b_has_lil_sib_par_act | -0.773 | -0.0758 | -0.622 | 0.534 | -1.24 | -0.118 | -0.635 | 0.526 |
b_veh_per_driver_kid_car | b_log_density_kid_act | 0.102 | 0.0538 | -0.383 | 0.702 | 0.014 | 0.00753 | -0.395 | 0.693 |
b_veh_per_driver_kid_car | b_log_density_kid_car | -0.0304 | -0.0156 | -0.378 | 0.705 | 0.0168 | 0.00904 | -0.391 | 0.696 |
b_veh_per_driver_kid_car | b_log_density_par_act | -0.719 | -0.115 | -0.701 | 0.483 | -1.05 | -0.151 | -0.718 | 0.473 |
b_veh_per_driver_kid_car | b_log_distance_kid_act | 0.0152 | 0.0303 | -0.0515 | 0.959 | 0.0568 | 0.114 | -0.0533 | 0.958 |
b_veh_per_driver_kid_car | b_log_distance_kid_car | 0.117 | 0.178 | -0.0546 | 0.956 | 0.0546 | 0.11 | -0.0564 | 0.955 |
b_veh_per_driver_kid_car | b_log_distance_par_act | 0.313 | 0.156 | -0.0299 | 0.976 | 0.458 | 0.206 | -0.031 | 0.975 |
b_veh_per_driver_kid_car | b_log_income_k_kid_act | -0.382 | -0.133 | -0.158 | 0.874 | -0.427 | -0.154 | -0.163 | 0.87 |
b_veh_per_driver_kid_car | b_log_income_k_kid_car | -0.378 | -0.131 | -0.158 | 0.874 | -0.43 | -0.156 | -0.163 | 0.87 |
b_veh_per_driver_kid_car | b_log_income_k_par_act | -0.16 | -0.0331 | -0.318 | 0.751 | -0.217 | -0.0459 | -0.328 | 0.743 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_ace | 0.278 | 0.0353 | -0.0888 | 0.929 | 0.122 | 0.016 | -0.0915 | 0.927 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_car | 0.342 | 0.0434 | -0.0908 | 0.928 | 0.116 | 0.0152 | -0.0935 | 0.926 |
b_veh_per_driver_kid_car | b_non_work_dad_par_act | 0.0177 | 0.00133 | -0.485 | 0.628 | -0.0495 | -0.00408 | -0.501 | 0.616 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_act | 0.125 | 0.0238 | 0.12 | 0.905 | 0.208 | 0.0412 | 0.124 | 0.901 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_car | -0.12 | -0.0223 | 0.126 | 0.9 | 0.213 | 0.0422 | 0.131 | 0.896 |
b_veh_per_driver_kid_car | b_non_work_mom_par_act | -0.562 | -0.0566 | -0.66 | 0.509 | -0.788 | -0.0811 | -0.678 | 0.498 |
b_veh_per_driver_kid_car | b_veh_per_driver_kid_act | 50.5 | 0.962 | 0.287 | 0.774 | 49.8 | 0.999 | 1.57 | 0.117 |
b_veh_per_driver_par_act | asc_kid_act | -0.0278 | -0.00344 | -4.1 | 4.07e-05 | -0.046 | -0.00509 | -3.67 | 0.000238 |
b_veh_per_driver_par_act | asc_kid_car | -0.0988 | -0.0122 | -4.1 | 4.05e-05 | -0.0308 | -0.00341 | -3.68 | 0.000237 |
b_veh_per_driver_par_act | asc_par_act | 10.6 | 0.405 | -4.15 | 3.33e-05 | 10.6 | 0.315 | -3.7 | 0.000216 |
b_veh_per_driver_par_act | b_age_kid_act | 0.394 | 0.107 | -4.39 | 1.14e-05 | 0.55 | 0.13 | -3.93 | 8.48e-05 |
b_veh_per_driver_par_act | b_age_kid_car | 0.446 | 0.114 | -4.39 | 1.14e-05 | 0.539 | 0.127 | -3.93 | 8.52e-05 |
b_veh_per_driver_par_act | b_age_par_act | 6.41 | 0.521 | -4.24 | 2.22e-05 | 8.13 | 0.529 | -3.8 | 0.000145 |
b_veh_per_driver_par_act | b_female_kid_act | 0.421 | 0.0279 | -4.16 | 3.15e-05 | 0.224 | 0.0134 | -3.73 | 0.000195 |
b_veh_per_driver_par_act | b_female_kid_car | 0.338 | 0.0222 | -4.16 | 3.14e-05 | 0.246 | 0.0147 | -3.73 | 0.000194 |
b_veh_per_driver_par_act | b_female_par_act | 4.21 | 0.154 | -4.26 | 2.03e-05 | 4.61 | 0.151 | -3.81 | 0.000137 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | 0.249 | 0.0157 | -4.46 | 8.07e-06 | 1.06 | 0.0599 | -4 | 6.29e-05 |
b_veh_per_driver_par_act | b_has_big_sib_kid_car | 0.23 | 0.0145 | -4.46 | 8.07e-06 | 1.06 | 0.06 | -4 | 6.28e-05 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | -0.356 | -0.0127 | -4.31 | 1.6e-05 | 2 | 0.0644 | -3.88 | 0.000105 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | -0.806 | -0.0508 | -4.41 | 1.02e-05 | -0.718 | -0.0406 | -3.95 | 7.72e-05 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_car | -0.867 | -0.0543 | -4.41 | 1.02e-05 | -0.703 | -0.0397 | -3.95 | 7.68e-05 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -9.82 | -0.311 | -4.33 | 1.52e-05 | -11.4 | -0.304 | -3.88 | 0.000105 |
b_veh_per_driver_par_act | b_log_density_kid_act | -0.602 | -0.103 | -4.33 | 1.51e-05 | -0.648 | -0.0972 | -3.88 | 0.000106 |
b_veh_per_driver_par_act | b_log_density_kid_car | -0.538 | -0.0889 | -4.33 | 1.51e-05 | -0.662 | -0.0993 | -3.87 | 0.000107 |
b_veh_per_driver_par_act | b_log_density_par_act | -8.21 | -0.425 | -4.37 | 1.26e-05 | -8.61 | -0.344 | -3.92 | 8.85e-05 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 0.489 | 0.316 | -4.23 | 2.34e-05 | 0.481 | 0.271 | -3.79 | 0.000153 |
b_veh_per_driver_par_act | b_log_distance_kid_car | 0.439 | 0.215 | -4.23 | 2.33e-05 | 0.493 | 0.277 | -3.79 | 0.000152 |
b_veh_per_driver_par_act | b_log_distance_par_act | 3.73 | 0.602 | -4.25 | 2.14e-05 | 4.14 | 0.521 | -3.8 | 0.000143 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -0.0676 | -0.00758 | -4.26 | 2.05e-05 | -0.458 | -0.0463 | -3.81 | 0.000138 |
b_veh_per_driver_par_act | b_log_income_k_kid_car | -0.0698 | -0.00784 | -4.26 | 2.05e-05 | -0.456 | -0.0462 | -3.81 | 0.000138 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -3.82 | -0.255 | -4.28 | 1.88e-05 | -4.86 | -0.287 | -3.83 | 0.000128 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 0.197 | 0.00806 | -4.23 | 2.29e-05 | 0.118 | 0.00435 | -3.79 | 0.000149 |
b_veh_per_driver_par_act | b_non_work_dad_kid_car | 0.166 | 0.00678 | -4.24 | 2.28e-05 | 0.119 | 0.00436 | -3.79 | 0.000149 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 0.952 | 0.0231 | -4.36 | 1.27e-05 | -1.1 | -0.0253 | -3.9 | 9.71e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | -0.682 | -0.0418 | -4.16 | 3.14e-05 | -0.366 | -0.0203 | -3.73 | 0.000191 |
b_veh_per_driver_par_act | b_non_work_mom_kid_car | -0.562 | -0.0339 | -4.16 | 3.16e-05 | -0.388 | -0.0215 | -3.73 | 0.000192 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | -7.16 | -0.233 | -4.36 | 1.3e-05 | -7.45 | -0.214 | -3.91 | 9.08e-05 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 36.3 | 0.223 | -4.27 | 1.94e-05 | 34.6 | 0.194 | -3.8 | 0.000142 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_car | 35 | 0.212 | -4.28 | 1.87e-05 | 34.9 | 0.196 | -3.83 | 0.000128 |
b_y2017_kid_act | asc_kid_act | -0.0264 | -0.0925 | 1.76 | 0.0792 | -0.0306 | -0.104 | 1.71 | 0.0877 |
b_y2017_kid_act | asc_kid_car | -0.0254 | -0.089 | 1.72 | 0.0848 | -0.0304 | -0.103 | 1.68 | 0.0939 |
b_y2017_kid_act | asc_par_act | -0.388 | -0.42 | 1.46 | 0.146 | -0.508 | -0.462 | 1.29 | 0.196 |
b_y2017_kid_act | b_age_kid_act | -0.00994 | -0.0761 | -5.75 | 8.76e-09 | -0.00948 | -0.0686 | -5.6 | 2.17e-08 |
b_y2017_kid_act | b_age_kid_car | -0.0107 | -0.0769 | -5.71 | 1.16e-08 | -0.0096 | -0.0693 | -5.57 | 2.55e-08 |
b_y2017_kid_act | b_age_par_act | -0.163 | -0.374 | -0.29 | 0.772 | -0.234 | -0.467 | -0.265 | 0.791 |
b_y2017_kid_act | b_female_kid_act | 0.000231 | 0.000433 | 0.302 | 0.762 | -0.0106 | -0.0193 | 0.295 | 0.768 |
b_y2017_kid_act | b_female_kid_car | 0.0014 | 0.0026 | 0.267 | 0.79 | -0.0108 | -0.0198 | 0.26 | 0.795 |
b_y2017_kid_act | b_female_par_act | -0.103 | -0.106 | -0.849 | 0.396 | -0.128 | -0.128 | -0.833 | 0.405 |
b_y2017_kid_act | b_has_big_sib_kid_act | 0.0184 | 0.0327 | -6.22 | 4.85e-10 | 0.00766 | 0.0133 | -6.06 | 1.35e-09 |
b_y2017_kid_act | b_has_big_sib_kid_car | 0.0186 | 0.0332 | -6.23 | 4.62e-10 | 0.00772 | 0.0134 | -6.07 | 1.3e-09 |
b_y2017_kid_act | b_has_big_sib_par_act | 0.0239 | 0.024 | -2.3 | 0.0213 | -0.0141 | -0.0139 | -2.26 | 0.024 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 0.0777 | 0.138 | -5.63 | 1.77e-08 | 0.0707 | 0.123 | -5.5 | 3.9e-08 |
b_y2017_kid_act | b_has_lil_sib_kid_car | 0.0785 | 0.139 | -5.65 | 1.62e-08 | 0.0703 | 0.122 | -5.52 | 3.45e-08 |
b_y2017_kid_act | b_has_lil_sib_par_act | 0.284 | 0.254 | -3.83 | 0.000126 | 0.412 | 0.337 | -3.8 | 0.000145 |
b_y2017_kid_act | b_log_density_kid_act | 0.0118 | 0.0569 | -4.32 | 1.56e-05 | 0.0207 | 0.0954 | -4.25 | 2.14e-05 |
b_y2017_kid_act | b_log_density_kid_car | 0.0109 | 0.0508 | -4.27 | 1.99e-05 | 0.0208 | 0.0954 | -4.22 | 2.48e-05 |
b_y2017_kid_act | b_log_density_par_act | 0.255 | 0.373 | -6.46 | 1.03e-10 | 0.333 | 0.409 | -6.02 | 1.77e-09 |
b_y2017_kid_act | b_log_distance_kid_act | -0.0167 | -0.305 | -1.4 | 0.16 | -0.0196 | -0.338 | -1.36 | 0.174 |
b_y2017_kid_act | b_log_distance_kid_car | -0.016 | -0.221 | -1.43 | 0.153 | -0.0197 | -0.338 | -1.39 | 0.166 |
b_y2017_kid_act | b_log_distance_par_act | -0.11 | -0.503 | -1.03 | 0.302 | -0.143 | -0.552 | -0.967 | 0.333 |
b_y2017_kid_act | b_log_income_k_kid_act | 0.00154 | 0.00488 | -2.18 | 0.029 | 5.55e-05 | 0.000172 | -2.13 | 0.0331 |
b_y2017_kid_act | b_log_income_k_kid_car | 0.00157 | 0.00498 | -2.18 | 0.029 | -0.000248 | -0.00077 | -2.13 | 0.033 |
b_y2017_kid_act | b_log_income_k_par_act | 0.0162 | 0.0305 | -3.04 | 0.00234 | 0.0101 | 0.0182 | -2.96 | 0.0031 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 0.00343 | 0.00397 | -1.07 | 0.286 | 0.000751 | 0.000846 | -1.06 | 0.291 |
b_y2017_kid_act | b_non_work_dad_kid_car | 0.00387 | 0.00448 | -1.08 | 0.282 | 0.000613 | 0.00069 | -1.06 | 0.287 |
b_y2017_kid_act | b_non_work_dad_par_act | 0.0436 | 0.0299 | -2.24 | 0.0248 | -0.026 | -0.0184 | -2.3 | 0.0214 |
b_y2017_kid_act | b_non_work_mom_kid_act | 0.0336 | 0.0583 | 0.0894 | 0.929 | 0.0137 | 0.0233 | 0.0867 | 0.931 |
b_y2017_kid_act | b_non_work_mom_kid_car | 0.0319 | 0.0544 | 0.138 | 0.89 | 0.014 | 0.0238 | 0.135 | 0.892 |
b_y2017_kid_act | b_non_work_mom_par_act | 0.217 | 0.199 | -3.99 | 6.65e-05 | 0.274 | 0.242 | -4.02 | 5.8e-05 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -0.565 | -0.0983 | -0.0282 | 0.978 | -0.707 | -0.122 | -0.0286 | 0.977 |
b_y2017_kid_act | b_veh_per_driver_kid_car | -0.547 | -0.0938 | -0.105 | 0.916 | -0.707 | -0.122 | -0.108 | 0.914 |
b_y2017_kid_act | b_veh_per_driver_par_act | -5.93 | -0.328 | 4.12 | 3.71e-05 | -6.59 | -0.318 | 3.7 | 0.000217 |
b_y2017_kid_car | asc_kid_act | -0.0288 | -0.101 | 1.76 | 0.0782 | -0.0303 | -0.103 | 1.72 | 0.0851 |
b_y2017_kid_car | asc_kid_car | -0.0232 | -0.0809 | 1.74 | 0.082 | -0.0299 | -0.102 | 1.69 | 0.0912 |
b_y2017_kid_car | asc_par_act | -0.39 | -0.421 | 1.46 | 0.144 | -0.508 | -0.462 | 1.3 | 0.193 |
b_y2017_kid_car | b_age_kid_act | -0.00916 | -0.0699 | -5.73 | 9.9e-09 | -0.00966 | -0.0698 | -5.58 | 2.4e-08 |
b_y2017_kid_car | b_age_kid_car | -0.0133 | -0.0957 | -5.66 | 1.54e-08 | -0.00985 | -0.0711 | -5.55 | 2.83e-08 |
b_y2017_kid_car | b_age_par_act | -0.163 | -0.374 | -0.279 | 0.781 | -0.234 | -0.467 | -0.254 | 0.799 |
b_y2017_kid_car | b_female_kid_act | -0.0012 | -0.00226 | 0.314 | 0.754 | -0.0107 | -0.0196 | 0.306 | 0.759 |
b_y2017_kid_car | b_female_kid_car | 0.00546 | 0.0101 | 0.279 | 0.78 | -0.0109 | -0.0199 | 0.272 | 0.785 |
b_y2017_kid_car | b_female_par_act | -0.103 | -0.106 | -0.84 | 0.401 | -0.128 | -0.128 | -0.825 | 0.41 |
b_y2017_kid_car | b_has_big_sib_kid_act | 0.0181 | 0.0322 | -6.2 | 5.56e-10 | 0.00773 | 0.0134 | -6.05 | 1.46e-09 |
b_y2017_kid_car | b_has_big_sib_kid_car | 0.0196 | 0.0349 | -6.22 | 5.07e-10 | 0.00783 | 0.0135 | -6.05 | 1.4e-09 |
b_y2017_kid_car | b_has_big_sib_par_act | 0.0238 | 0.0239 | -2.29 | 0.0219 | -0.014 | -0.0138 | -2.25 | 0.0245 |
b_y2017_kid_car | b_has_lil_sib_kid_act | 0.0769 | 0.137 | -5.61 | 2.06e-08 | 0.0706 | 0.122 | -5.48 | 4.23e-08 |
b_y2017_kid_car | b_has_lil_sib_kid_car | 0.0818 | 0.145 | -5.65 | 1.64e-08 | 0.0702 | 0.122 | -5.5 | 3.74e-08 |
b_y2017_kid_car | b_has_lil_sib_par_act | 0.284 | 0.254 | -3.82 | 0.000132 | 0.413 | 0.337 | -3.79 | 0.00015 |
b_y2017_kid_car | b_log_density_kid_act | 0.0129 | 0.0623 | -4.3 | 1.69e-05 | 0.0207 | 0.0951 | -4.23 | 2.3e-05 |
b_y2017_kid_car | b_log_density_kid_car | 0.00776 | 0.0362 | -4.22 | 2.41e-05 | 0.0206 | 0.0947 | -4.2 | 2.68e-05 |
b_y2017_kid_car | b_log_density_par_act | 0.256 | 0.374 | -6.45 | 1.15e-10 | 0.333 | 0.409 | -6.01 | 1.91e-09 |
b_y2017_kid_car | b_log_distance_kid_act | -0.0174 | -0.316 | -1.38 | 0.166 | -0.0196 | -0.338 | -1.35 | 0.178 |
b_y2017_kid_car | b_log_distance_kid_car | -0.0134 | -0.184 | -1.42 | 0.157 | -0.0196 | -0.338 | -1.37 | 0.17 |
b_y2017_kid_car | b_log_distance_par_act | -0.111 | -0.504 | -1.02 | 0.31 | -0.143 | -0.552 | -0.955 | 0.34 |
b_y2017_kid_car | b_log_income_k_kid_act | 0.00168 | 0.00531 | -2.17 | 0.0304 | -0.000161 | -0.0005 | -2.12 | 0.0343 |
b_y2017_kid_car | b_log_income_k_kid_car | 0.00187 | 0.00592 | -2.17 | 0.0302 | -0.000461 | -0.00143 | -2.12 | 0.0343 |
b_y2017_kid_car | b_log_income_k_par_act | 0.0162 | 0.0305 | -3.03 | 0.00247 | 0.00989 | 0.0179 | -2.94 | 0.00323 |
b_y2017_kid_car | b_non_work_dad_kid_ace | 0.00294 | 0.0034 | -1.06 | 0.291 | 0.000757 | 0.000852 | -1.05 | 0.296 |
b_y2017_kid_car | b_non_work_dad_kid_car | 0.00543 | 0.00626 | -1.07 | 0.286 | 0.000642 | 0.000722 | -1.06 | 0.291 |
b_y2017_kid_car | b_non_work_dad_par_act | 0.0437 | 0.0299 | -2.24 | 0.0252 | -0.0257 | -0.0182 | -2.29 | 0.0218 |
b_y2017_kid_car | b_non_work_mom_kid_act | 0.0354 | 0.0613 | 0.101 | 0.919 | 0.0141 | 0.024 | 0.0984 | 0.922 |
b_y2017_kid_car | b_non_work_mom_kid_car | 0.0259 | 0.044 | 0.149 | 0.881 | 0.0143 | 0.0244 | 0.147 | 0.883 |
b_y2017_kid_car | b_non_work_mom_par_act | 0.218 | 0.2 | -3.98 | 6.92e-05 | 0.274 | 0.242 | -4.01 | 6.05e-05 |
b_y2017_kid_car | b_veh_per_driver_kid_act | -0.593 | -0.103 | -0.0265 | 0.979 | -0.709 | -0.122 | -0.0268 | 0.979 |
b_y2017_kid_car | b_veh_per_driver_kid_car | -0.488 | -0.0836 | -0.104 | 0.917 | -0.707 | -0.122 | -0.107 | 0.915 |
b_y2017_kid_car | b_veh_per_driver_par_act | -5.95 | -0.329 | 4.12 | 3.71e-05 | -6.59 | -0.318 | 3.7 | 0.000217 |
b_y2017_kid_car | b_y2017_kid_act | 0.639 | 0.998 | 0.267 | 0.789 | 0.677 | 1 | 0.664 | 0.507 |
b_y2017_par_act | asc_kid_act | -0.0535 | -0.0311 | 5.78 | 7.6e-09 | -0.027 | -0.0132 | 4.86 | 1.15e-06 |
b_y2017_par_act | asc_kid_car | -0.0365 | -0.0213 | 5.77 | 7.7e-09 | -0.0264 | -0.0129 | 4.86 | 1.18e-06 |
b_y2017_par_act | asc_par_act | -4.36 | -0.784 | 4.99 | 6.03e-07 | -6.23 | -0.815 | 4.19 | 2.77e-05 |
b_y2017_par_act | b_age_kid_act | -0.122 | -0.156 | 4.46 | 8.24e-06 | -0.2 | -0.208 | 3.74 | 0.000182 |
b_y2017_par_act | b_age_kid_car | -0.135 | -0.162 | 4.46 | 8.16e-06 | -0.201 | -0.208 | 3.75 | 0.000179 |
b_y2017_par_act | b_age_par_act | -1.96 | -0.747 | 4.97 | 6.56e-07 | -2.85 | -0.818 | 4.17 | 3.02e-05 |
b_y2017_par_act | b_female_kid_act | -0.109 | -0.0341 | 5.46 | 4.67e-08 | -0.105 | -0.0276 | 4.61 | 4.06e-06 |
b_y2017_par_act | b_female_kid_car | -0.0895 | -0.0277 | 5.46 | 4.77e-08 | -0.106 | -0.0279 | 4.6 | 4.18e-06 |
b_y2017_par_act | b_female_par_act | -1.05 | -0.181 | 4.85 | 1.26e-06 | -1.12 | -0.161 | 4.15 | 3.39e-05 |
b_y2017_par_act | b_has_big_sib_kid_act | -0.0592 | -0.0175 | 4.07 | 4.75e-05 | -0.299 | -0.0744 | 3.41 | 0.000661 |
b_y2017_par_act | b_has_big_sib_kid_car | -0.0547 | -0.0162 | 4.07 | 4.77e-05 | -0.299 | -0.0742 | 3.4 | 0.000665 |
b_y2017_par_act | b_has_big_sib_par_act | 0.173 | 0.0289 | 4.66 | 3.23e-06 | -0.336 | -0.0476 | 3.88 | 0.000103 |
b_y2017_par_act | b_has_lil_sib_kid_act | 0.267 | 0.0791 | 4.32 | 1.55e-05 | 0.299 | 0.0745 | 3.63 | 0.000281 |
b_y2017_par_act | b_has_lil_sib_kid_car | 0.282 | 0.083 | 4.32 | 1.57e-05 | 0.299 | 0.0744 | 3.63 | 0.000286 |
b_y2017_par_act | b_has_lil_sib_par_act | 3.09 | 0.459 | 4.8 | 1.59e-06 | 4.7 | 0.552 | 4.13 | 3.69e-05 |
b_y2017_par_act | b_log_density_kid_act | 0.185 | 0.148 | 4.76 | 1.89e-06 | 0.259 | 0.171 | 4 | 6.25e-05 |
b_y2017_par_act | b_log_density_kid_car | 0.17 | 0.132 | 4.77 | 1.87e-06 | 0.258 | 0.171 | 4.01 | 6.12e-05 |
b_y2017_par_act | b_log_density_par_act | 2.91 | 0.706 | 4.79 | 1.69e-06 | 3.93 | 0.692 | 4 | 6.45e-05 |
b_y2017_par_act | b_log_distance_kid_act | -0.151 | -0.457 | 5.2 | 1.98e-07 | -0.192 | -0.475 | 4.37 | 1.23e-05 |
b_y2017_par_act | b_log_distance_kid_car | -0.139 | -0.319 | 5.2 | 2.01e-07 | -0.192 | -0.474 | 4.37 | 1.26e-05 |
b_y2017_par_act | b_log_distance_par_act | -1.19 | -0.906 | 5.01 | 5.5e-07 | -1.69 | -0.937 | 4.21 | 2.58e-05 |
b_y2017_par_act | b_log_income_k_kid_act | -0.00107 | -0.000562 | 5.05 | 4.31e-07 | 0.0552 | 0.0246 | 4.26 | 2.07e-05 |
b_y2017_par_act | b_log_income_k_kid_car | -0.000517 | -0.000272 | 5.05 | 4.32e-07 | 0.0546 | 0.0243 | 4.26 | 2.07e-05 |
b_y2017_par_act | b_log_income_k_par_act | 0.173 | 0.0543 | 4.82 | 1.45e-06 | 0.455 | 0.118 | 4.08 | 4.43e-05 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.0159 | -0.00306 | 5.05 | 4.45e-07 | -0.074 | -0.012 | 4.26 | 2e-05 |
b_y2017_par_act | b_non_work_dad_kid_car | -0.00846 | -0.00163 | 5.05 | 4.48e-07 | -0.0719 | -0.0116 | 4.26 | 2.02e-05 |
b_y2017_par_act | b_non_work_dad_par_act | 0.621 | 0.0709 | 4.36 | 1.28e-05 | 0.262 | 0.0266 | 3.69 | 0.000222 |
b_y2017_par_act | b_non_work_mom_kid_act | 0.223 | 0.0644 | 5.49 | 4.1e-08 | 0.201 | 0.0491 | 4.61 | 4.07e-06 |
b_y2017_par_act | b_non_work_mom_kid_car | 0.195 | 0.0552 | 5.49 | 4.06e-08 | 0.199 | 0.0485 | 4.62 | 3.9e-06 |
b_y2017_par_act | b_non_work_mom_par_act | 2.57 | 0.392 | 4.63 | 3.74e-06 | 3.63 | 0.46 | 3.94 | 8.32e-05 |
b_y2017_par_act | b_veh_per_driver_kid_act | -5.57 | -0.161 | 2.82 | 0.00486 | -8.09 | -0.2 | 2.62 | 0.00867 |
b_y2017_par_act | b_veh_per_driver_kid_car | -5.25 | -0.15 | 2.74 | 0.0061 | -8.07 | -0.2 | 2.57 | 0.0101 |
b_y2017_par_act | b_veh_per_driver_par_act | -66.2 | -0.61 | 4.68 | 2.94e-06 | -77.3 | -0.536 | 4.2 | 2.64e-05 |
b_y2017_par_act | b_y2017_kid_act | 2 | 0.522 | 5.92 | 3.12e-09 | 2.71 | 0.575 | 4.97 | 6.6e-07 |
b_y2017_par_act | b_y2017_kid_car | 2.01 | 0.522 | 5.92 | 3.15e-09 | 2.71 | 0.575 | 4.97 | 6.68e-07 |
mu_kid | asc_kid_act | 14.2 | 0.154 | 0.305 | 0.761 | 0.381 | 0.0267 | 1.98 | 0.0482 |
mu_kid | asc_kid_car | -13.5 | -0.147 | 0.304 | 0.761 | -0.305 | -0.0214 | 1.97 | 0.0484 |
mu_kid | asc_par_act | 9.38 | 0.0314 | 0.308 | 0.758 | 0.622 | 0.0117 | 2 | 0.046 |
mu_kid | b_age_kid_act | -4.61 | -0.109 | 0.28 | 0.779 | -0.262 | -0.0392 | 1.81 | 0.0695 |
mu_kid | b_age_kid_car | 15.6 | 0.349 | 0.28 | 0.779 | 0.212 | 0.0317 | 1.82 | 0.0694 |
mu_kid | b_age_par_act | 2.94 | 0.0209 | 0.297 | 0.766 | 0.0807 | 0.00333 | 1.93 | 0.054 |
mu_kid | b_female_kid_act | 8.49 | 0.0493 | 0.3 | 0.764 | 0.588 | 0.0222 | 1.94 | 0.052 |
mu_kid | b_female_kid_car | -24 | -0.138 | 0.299 | 0.765 | -0.0682 | -0.00258 | 1.94 | 0.0522 |
mu_kid | b_female_par_act | 3.16 | 0.0101 | 0.293 | 0.769 | 1.21 | 0.0251 | 1.9 | 0.057 |
mu_kid | b_has_big_sib_kid_act | 1.55 | 0.00854 | 0.273 | 0.785 | -0.539 | -0.0193 | 1.77 | 0.0767 |
mu_kid | b_has_big_sib_kid_car | -5.85 | -0.0323 | 0.273 | 0.785 | -0.687 | -0.0246 | 1.77 | 0.0767 |
mu_kid | b_has_big_sib_par_act | 0.075 | 0.000234 | 0.285 | 0.775 | 0.613 | 0.0125 | 1.85 | 0.0643 |
mu_kid | b_has_lil_sib_kid_act | 4.61 | 0.0254 | 0.277 | 0.782 | -0.874 | -0.0314 | 1.79 | 0.0729 |
mu_kid | b_has_lil_sib_kid_car | -19.1 | -0.105 | 0.277 | 0.782 | -1.47 | -0.0525 | 1.79 | 0.0731 |
mu_kid | b_has_lil_sib_par_act | -5.23 | -0.0145 | 0.277 | 0.782 | -1.48 | -0.0251 | 1.79 | 0.0727 |
mu_kid | b_log_density_kid_act | -6.85 | -0.102 | 0.285 | 0.776 | 0.0435 | 0.00414 | 1.85 | 0.065 |
mu_kid | b_log_density_kid_car | 18.4 | 0.267 | 0.285 | 0.776 | 0.696 | 0.0661 | 1.85 | 0.0648 |
mu_kid | b_log_density_par_act | -6.28 | -0.0285 | 0.275 | 0.783 | -0.886 | -0.0225 | 1.78 | 0.0746 |
mu_kid | b_log_distance_kid_act | 3.85 | 0.218 | 0.294 | 0.769 | 0.217 | 0.0773 | 1.91 | 0.0566 |
mu_kid | b_log_distance_kid_car | -15.7 | -0.672 | 0.294 | 0.769 | -0.237 | -0.0844 | 1.91 | 0.0568 |
mu_kid | b_log_distance_par_act | 2.96 | 0.0418 | 0.295 | 0.768 | 0.1 | 0.00799 | 1.91 | 0.0561 |
mu_kid | b_log_income_k_kid_act | -0.83 | -0.00815 | 0.291 | 0.771 | -0.293 | -0.0188 | 1.89 | 0.0593 |
mu_kid | b_log_income_k_kid_car | -1.74 | -0.017 | 0.291 | 0.771 | -0.315 | -0.0202 | 1.89 | 0.0593 |
mu_kid | b_log_income_k_par_act | -0.276 | -0.00161 | 0.286 | 0.775 | 1.18 | 0.0442 | 1.86 | 0.0632 |
mu_kid | b_non_work_dad_kid_ace | 2.92 | 0.0105 | 0.293 | 0.77 | -0.617 | -0.0144 | 1.9 | 0.0578 |
mu_kid | b_non_work_dad_kid_car | -9.27 | -0.0332 | 0.293 | 0.77 | -0.888 | -0.0207 | 1.9 | 0.0579 |
mu_kid | b_non_work_dad_par_act | -0.607 | -0.00129 | 0.281 | 0.778 | 0.771 | 0.0113 | 1.82 | 0.0683 |
mu_kid | b_non_work_mom_kid_act | -10.7 | -0.0576 | 0.299 | 0.765 | -0.52 | -0.0183 | 1.94 | 0.0528 |
mu_kid | b_non_work_mom_kid_car | 36.1 | 0.191 | 0.299 | 0.765 | 0.617 | 0.0217 | 1.94 | 0.0525 |
mu_kid | b_non_work_mom_par_act | -6.49 | -0.0185 | 0.276 | 0.782 | 0.466 | 0.0085 | 1.79 | 0.0734 |
mu_kid | b_veh_per_driver_kid_act | 166 | 0.0894 | 0.298 | 0.765 | 20.8 | 0.074 | 1.92 | 0.0543 |
mu_kid | b_veh_per_driver_kid_car | -348 | -0.185 | 0.294 | 0.769 | 7.62 | 0.0272 | 1.89 | 0.0581 |
mu_kid | b_veh_per_driver_par_act | 170 | 0.0292 | 0.663 | 0.507 | -38.6 | -0.0385 | 3.57 | 0.000352 |
mu_kid | b_y2017_kid_act | -2.4 | -0.0116 | 0.298 | 0.765 | 0.233 | 0.00712 | 1.93 | 0.053 |
mu_kid | b_y2017_kid_car | -13.6 | -0.0659 | 0.298 | 0.765 | 0.0222 | 0.000679 | 1.93 | 0.0531 |
mu_kid | b_y2017_par_act | -40.6 | -0.0327 | 0.196 | 0.844 | -0.569 | -0.0025 | 1.26 | 0.208 |
mu_parent | asc_kid_act | 0.00235 | 0.0282 | 12.4 | 0 | 0.00148 | 0.0148 | 11.6 | 0 |
mu_parent | asc_kid_car | 0.00148 | 0.0178 | 12.3 | 0 | 0.00145 | 0.0145 | 11.6 | 0 |
mu_parent | asc_par_act | 0.21 | 0.779 | 6.15 | 7.71e-10 | 0.299 | 0.799 | 5.39 | 7.21e-08 |
mu_parent | b_age_kid_act | 0.0065 | 0.171 | -4.26 | 2.01e-05 | 0.0103 | 0.22 | -3.8 | 0.000145 |
mu_parent | b_age_kid_car | 0.00713 | 0.177 | -4.11 | 3.89e-05 | 0.0103 | 0.22 | -3.72 | 0.0002 |
mu_parent | b_age_par_act | 0.0992 | 0.782 | 8.5 | 0 | 0.145 | 0.854 | 8.35 | 0 |
mu_parent | b_female_kid_act | 0.0057 | 0.0367 | 5.68 | 1.36e-08 | 0.0043 | 0.0231 | 5.54 | 3.02e-08 |
mu_parent | b_female_kid_car | 0.00469 | 0.03 | 5.57 | 2.53e-08 | 0.00434 | 0.0234 | 5.49 | 4e-08 |
mu_parent | b_female_par_act | 0.0542 | 0.192 | 1.98 | 0.0474 | 0.0665 | 0.196 | 1.98 | 0.0477 |
mu_parent | b_has_big_sib_kid_act | 0.00334 | 0.0204 | -3.89 | 9.93e-05 | 0.016 | 0.0816 | -3.9 | 9.73e-05 |
mu_parent | b_has_big_sib_kid_car | 0.00311 | 0.019 | -3.9 | 9.64e-05 | 0.016 | 0.0814 | -3.9 | 9.43e-05 |
mu_parent | b_has_big_sib_par_act | -0.0017 | -0.00586 | 0.223 | 0.823 | 0.0188 | 0.0545 | 0.226 | 0.821 |
mu_parent | b_has_lil_sib_kid_act | -0.0131 | -0.0801 | -2.53 | 0.0114 | -0.0146 | -0.0745 | -2.48 | 0.0132 |
mu_parent | b_has_lil_sib_kid_car | -0.0138 | -0.0841 | -2.55 | 0.0108 | -0.0146 | -0.0743 | -2.51 | 0.0121 |
mu_parent | b_has_lil_sib_par_act | -0.148 | -0.454 | -1.19 | 0.234 | -0.229 | -0.551 | -1.09 | 0.275 |
mu_parent | b_log_density_kid_act | -0.0099 | -0.164 | 0.221 | 0.825 | -0.0133 | -0.18 | 0.199 | 0.843 |
mu_parent | b_log_density_kid_car | -0.00911 | -0.146 | 0.293 | 0.77 | -0.0132 | -0.179 | 0.266 | 0.79 |
mu_parent | b_log_density_par_act | -0.147 | -0.737 | -2.25 | 0.0242 | -0.202 | -0.73 | -1.94 | 0.0529 |
mu_parent | b_log_distance_kid_act | 0.00771 | 0.482 | 12 | 0 | 0.0097 | 0.493 | 9.9 | 0 |
mu_parent | b_log_distance_kid_car | 0.0071 | 0.337 | 11.3 | 0 | 0.00971 | 0.492 | 9.81 | 0 |
mu_parent | b_log_distance_par_act | 0.0596 | 0.933 | 26.1 | 0 | 0.0833 | 0.946 | 25.6 | 0 |
mu_parent | b_log_income_k_kid_act | 8.61e-05 | 0.000937 | 3.73 | 0.00019 | -0.00403 | -0.0368 | 3.49 | 0.000482 |
mu_parent | b_log_income_k_kid_car | 5.8e-05 | 0.000631 | 3.73 | 0.000192 | -0.004 | -0.0365 | 3.49 | 0.000482 |
mu_parent | b_log_income_k_par_act | -0.0103 | -0.0666 | 0.75 | 0.454 | -0.0135 | -0.0719 | 0.721 | 0.471 |
mu_parent | b_non_work_dad_kid_ace | 0.000524 | 0.00208 | 2.01 | 0.0446 | 0.00137 | 0.00455 | 1.99 | 0.0463 |
mu_parent | b_non_work_dad_kid_car | 0.000143 | 0.00057 | 1.99 | 0.0461 | 0.00128 | 0.00424 | 1.98 | 0.0478 |
mu_parent | b_non_work_dad_par_act | -0.0266 | -0.0626 | -0.415 | 0.678 | -0.00691 | -0.0144 | -0.44 | 0.66 |
mu_parent | b_non_work_mom_kid_act | -0.0116 | -0.0689 | 4.84 | 1.28e-06 | -0.0108 | -0.0542 | 4.79 | 1.69e-06 |
mu_parent | b_non_work_mom_kid_car | -0.0101 | -0.0592 | 4.85 | 1.24e-06 | -0.0107 | -0.0537 | 4.85 | 1.22e-06 |
mu_parent | b_non_work_mom_par_act | -0.128 | -0.403 | -1.41 | 0.159 | -0.173 | -0.448 | -1.36 | 0.173 |
mu_parent | b_veh_per_driver_kid_act | 0.287 | 0.172 | 0.481 | 0.63 | 0.411 | 0.208 | 0.49 | 0.624 |
mu_parent | b_veh_per_driver_kid_car | 0.271 | 0.16 | 0.396 | 0.692 | 0.41 | 0.208 | 0.41 | 0.682 |
mu_parent | b_veh_per_driver_par_act | 3.38 | 0.643 | 4.37 | 1.27e-05 | 4.06 | 0.577 | 3.91 | 9.31e-05 |
mu_parent | b_y2017_kid_act | -0.0939 | -0.505 | 3.89 | 9.99e-05 | -0.129 | -0.561 | 3.63 | 0.000285 |
mu_parent | b_y2017_kid_car | -0.0942 | -0.505 | 3.87 | 0.000109 | -0.129 | -0.561 | 3.62 | 0.0003 |
mu_parent | b_y2017_par_act | -1.05 | -0.935 | -4.51 | 6.44e-06 | -1.53 | -0.955 | -3.78 | 0.000154 |
mu_parent | mu_kid | 2.08 | 0.0346 | -0.284 | 0.776 | 0.0173 | 0.00156 | -1.84 | 0.0653 |
Smallest eigenvalue: 1.50303e-05
+Largest eigenvalue: 8.36252e+06
+Condition number: 5.56376e+11
+ \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/ind-nest/ind_nests.pickle b/models/IATBR plan/4 alternatives/ind-nest/ind_nests.pickle new file mode 100644 index 0000000..5b0ce16 Binary files /dev/null and b/models/IATBR plan/4 alternatives/ind-nest/ind_nests.pickle differ diff --git a/models/IATBR plan/4 alternatives/ind-nest/model-ind-nest.py b/models/IATBR plan/4 alternatives/ind-nest/model-ind-nest.py new file mode 100644 index 0000000..ab436c7 --- /dev/null +++ b/models/IATBR plan/4 alternatives/ind-nest/model-ind-nest.py @@ -0,0 +1,220 @@ +# Model predicts the choice among four alternatives: +# * Car with a parent +# * Car without a parent (presumably a carpool) +# * Active with a parent +# * Active without a parent + +# In this model, the alternatives are nested by parental escort + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable +from biogeme.nests import OneNestForNestedLogit, NestsForNestedLogit + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips_sc2.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +y2017 = Variable('sc2_y2017') +veh_per_driver = Variable('sc2_veh_per_driver') +non_work_mom = Variable('sc2_non_work_mom') +non_work_dad = Variable('sc2_non_work_dad') +age = Variable('sc2_age') +female = Variable('sc2_female') +has_lil_sib = Variable('sc2_has_lil_sib') +has_big_sib = Variable('sc2_has_big_sib') +log_inc_k = Variable('sc2_log_inc_k') +log_distance = Variable('log_distance') +log_density = Variable('sc2_log_density') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_car = Variable('av_kid_car') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car with parent is reference case) +asc_par_car = Beta('asc_par_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_car = Beta('asc_kid_car', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_par_car = Beta('b_log_income_k_par_car', 0, None, None, 1) +b_veh_per_driver_par_car = Beta('b_veh_per_driver_par_car', 0, None, None, 1) +b_non_work_mom_par_car = Beta('b_non_work_mom_par_car', 0, None, None, 1) +b_non_work_dad_par_car = Beta('b_non_work_dad_par_car', 0, None, None, 1) + +b_age_par_car = Beta('b_age_par_car', 0, None, None, 1) +b_female_par_car = Beta('b_female_par_car', 0, None, None, 1) +b_has_lil_sib_par_car = Beta('b_has_lil_sib_par_car', 0, None, None, 1) +b_has_big_sib_par_car = Beta('b_has_big_sib_par_car', 0, None, None, 1) + +b_log_distance_par_car = Beta('b_log_distance_par_car', 0, None, None, 1) +b_log_density_par_car = Beta('b_log_density_par_car', 0, None, None, 1) + +b_y2017_par_car = Beta('b_y2017_par_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) + +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for with kid car +b_log_income_k_kid_car = Beta('b_log_income_k_kid_car', 0, None, None, 0) +b_veh_per_driver_kid_car = Beta('b_veh_per_driver_kid_car', 0, None, None, 0) +b_non_work_mom_kid_car = Beta('b_non_work_mom_kid_car', 0, None, None, 0) +b_non_work_dad_kid_car = Beta('b_non_work_dad_kid_car', 0, None, None, 0) + +b_age_kid_car = Beta('b_age_kid_car', 0, None, None, 0) +b_female_kid_car = Beta('b_female_kid_car', 0, None, None, 0) +b_has_lil_sib_kid_car = Beta('b_has_lil_sib_kid_car', 0, None, None, 0) +b_has_big_sib_kid_car = Beta('b_has_big_sib_kid_car', 0, None, None, 0) + +b_log_distance_kid_car = Beta('b_log_distance_kid_car', 0, None, None, 0) +b_log_density_kid_car = Beta('b_log_density_kid_car', 0, None, None, 0) + +b_y2017_kid_car = Beta('b_y2017_kid_car', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) + +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# Definition of utility functions +V_par_car = ( + asc_par_car + + b_log_income_k_par_car * log_inc_k + + b_veh_per_driver_par_car * veh_per_driver + + b_non_work_mom_par_car * non_work_mom + + b_non_work_dad_par_car * non_work_dad + + b_age_par_car * age + + b_female_par_car * female + + b_has_lil_sib_par_car * has_lil_sib + + b_has_big_sib_par_car * has_big_sib + + b_log_distance_par_car * log_distance + + b_log_density_par_car * log_density + + b_y2017_par_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_inc_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_car = ( + asc_kid_car + + b_log_income_k_kid_car * log_inc_k + + b_veh_per_driver_kid_car * veh_per_driver + + b_non_work_mom_kid_car * non_work_mom + + b_non_work_dad_kid_car * non_work_dad + + b_age_kid_car * age + + b_female_kid_car * female + + b_has_lil_sib_kid_car * has_lil_sib + + b_has_big_sib_kid_car * has_big_sib + + b_log_distance_kid_car * log_distance + + b_log_density_kid_car * log_density + + b_y2017_kid_car * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_inc_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {17: V_par_car, + 18: V_par_act, + 27: V_kid_car, + 28: V_kid_act} + +# associate availability conditions with alternatives: + +av = {17: av_par_car, + 18: av_par_act, + 27: av_kid_car, + 28: av_kid_act} + +# Define nests based on independence +mu_parent = Beta('mu_parent', 1, 1.0, None, 0) +mu_kid = Beta('mu_kid', 1, 1.0, None, 0) + +parent_nest = OneNestForNestedLogit( + nest_param=mu_parent, + list_of_alternatives=[17,18], + name='parent_nest' +) + +kid_nest = OneNestForNestedLogit( + nest_param=mu_kid, + list_of_alternatives=[27,28], + name='kid_nest' +) + +ind_nests = NestsForNestedLogit( + choice_set=list(V), + tuple_of_nests=(parent_nest, + kid_nest) +) + +# Define model +my_model = models.lognested(V, av, ind_nests, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, my_model) +the_biogeme.modelName = 'ind_nests' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/mode-nest/__mode_nests.iter b/models/IATBR plan/4 alternatives/mode-nest/__mode_nests.iter new file mode 100644 index 0000000..c345982 --- /dev/null +++ b/models/IATBR plan/4 alternatives/mode-nest/__mode_nests.iter @@ -0,0 +1,38 @@ +asc_kid_act = -4.824930319861582 +asc_kid_car = -0.062062831153487624 +asc_par_act = -4.684878148281417 +b_age_kid_act = 19.009946190425847 +b_age_kid_car = 0.22412257364135685 +b_age_par_act = 6.042036772060424 +b_female_kid_act = -28.89265780707269 +b_female_kid_car = -0.30098782074839675 +b_female_par_act = -23.64202674843987 +b_has_big_sib_kid_act = 29.36193711552293 +b_has_big_sib_kid_car = 0.8692703854687394 +b_has_big_sib_par_act = 19.270102376148582 +b_has_lil_sib_kid_act = 22.204290705388953 +b_has_lil_sib_kid_car = 0.9476545804689875 +b_has_lil_sib_par_act = 25.672732469335532 +b_log_density_kid_act = 19.46229273759618 +b_log_density_kid_car = -0.12977019358822622 +b_log_density_par_act = 24.61532233038194 +b_log_distance_kid_act = -162.8470693672447 +b_log_distance_kid_car = -0.2927683208761161 +b_log_distance_par_act = -162.0234624659681 +b_log_income_k_kid_act = -2.7023602906539725 +b_log_income_k_kid_car = -0.0643417577792421 +b_log_income_k_par_act = -2.4330124772645956 +b_non_work_dad_kid_ace = -4.81163884405732 +b_non_work_dad_kid_car = -0.18411306239195432 +b_non_work_dad_par_act = -2.7078856801200892 +b_non_work_mom_kid_act = -4.698952849960157 +b_non_work_mom_kid_car = -1.0859347216643553 +b_non_work_mom_par_act = 8.083401918140957 +b_veh_per_driver_kid_act = -29.591229348370653 +b_veh_per_driver_kid_car = 0.5675333686255037 +b_veh_per_driver_par_act = -45.46852299079348 +b_y2017_kid_act = 11.65477992964463 +b_y2017_kid_car = -0.3114510929118261 +b_y2017_par_act = 81.3499006480763 +mu_active = 4.591250190265388 +mu_car = 49.974315575853666 diff --git a/models/IATBR plan/4 alternatives/mode-nest/biogeme.toml b/models/IATBR plan/4 alternatives/mode-nest/biogeme.toml new file mode 100644 index 0000000..0b5d61b --- /dev/null +++ b/models/IATBR plan/4 alternatives/mode-nest/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on March 27, 2024. 10:29:40 + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 1000 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + diff --git a/models/IATBR plan/4 alternatives/mode-nest/mode_nests.html b/models/IATBR plan/4 alternatives/mode-nest/mode_nests.html new file mode 100644 index 0000000..11456dc --- /dev/null +++ b/models/IATBR plan/4 alternatives/mode-nest/mode_nests.html @@ -0,0 +1,810 @@ + + + + +biogeme 3.2.13 [2024-04-03]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-03 16:08:50.814194
+Report file: | mode_nests~00.html |
Database name: | est |
Number of estimated parameters: | 38 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -11160.09 |
Final log likelihood: | -4211.127 |
Likelihood ratio test for the init. model: | 13897.93 |
Rho-square for the init. model: | 0.623 |
Rho-square-bar for the init. model: | 0.619 |
Akaike Information Criterion: | 8498.254 |
Bayesian Information Criterion: | 8745.218 |
Final gradient norm: | 6.8081E-02 |
Nbr of threads: | 12 |
Relative gradient: | 6.046767451069312e-06 |
Cause of termination: | Relative gradient = 6e-06 <= 6.1e-06 |
Number of function evaluations: | 300 |
Number of gradient evaluations: | 279 |
Number of hessian evaluations: | 278 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 299 |
Proportion of Hessian calculation: | 278/278 = 100.0% |
Optimization time: | 0:22:29.173510 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
asc_kid_act | -4.82 | 0.404 | -11.9 | 0 |
asc_kid_car | -0.0621 | 0.0215 | -2.89 | 0.00388 |
asc_par_act | -4.68 | 0.43 | -10.9 | 0 |
b_age_kid_act | 19 | 2.39 | 7.94 | 2e-15 |
b_age_kid_car | 0.224 | 0.0845 | 2.65 | 0.00798 |
b_age_par_act | 6.04 | 9.44 | 0.64 | 0.522 |
b_female_kid_act | -28.9 | 6.85 | -4.22 | 2.47e-05 |
b_female_kid_car | -0.301 | 0.229 | -1.31 | 0.189 |
b_female_par_act | -23.6 | 8.13 | -2.91 | 0.00366 |
b_has_big_sib_kid_act | 29.4 | 7.3 | 4.02 | 5.79e-05 |
b_has_big_sib_kid_car | 0.869 | 0.366 | 2.37 | 0.0176 |
b_has_big_sib_par_act | 19.3 | 9.76 | 1.97 | 0.0484 |
b_has_lil_sib_kid_act | 22.2 | 7.16 | 3.1 | 0.00191 |
b_has_lil_sib_kid_car | 0.948 | 0.373 | 2.54 | 0.0111 |
b_has_lil_sib_par_act | 25.7 | 7.82 | 3.28 | 0.00103 |
b_log_density_kid_act | 19.5 | 2.92 | 6.67 | 2.54e-11 |
b_log_density_kid_car | -0.13 | 0.0835 | -1.55 | 0.12 |
b_log_density_par_act | 24.6 | 5.23 | 4.71 | 2.52e-06 |
b_log_distance_kid_act | -163 | 6.23 | -26.1 | 0 |
b_log_distance_kid_car | -0.293 | 0.263 | -1.11 | 0.266 |
b_log_distance_par_act | -162 | 6.7 | -24.2 | 0 |
b_log_income_k_kid_act | -2.7 | 3.95 | -0.685 | 0.494 |
b_log_income_k_kid_car | -0.0643 | 0.152 | -0.423 | 0.672 |
b_log_income_k_par_act | -2.43 | 4.21 | -0.578 | 0.563 |
b_non_work_dad_kid_ace | -4.81 | 10.7 | -0.451 | 0.652 |
b_non_work_dad_kid_car | -0.184 | 0.396 | -0.465 | 0.642 |
b_non_work_dad_par_act | -2.71 | 11.8 | -0.229 | 0.819 |
b_non_work_mom_kid_act | -4.7 | 7.56 | -0.622 | 0.534 |
b_non_work_mom_kid_car | -1.09 | 0.406 | -2.67 | 0.00753 |
b_non_work_mom_par_act | 8.08 | 12.2 | 0.661 | 0.509 |
b_veh_per_driver_kid_act | -29.6 | 8.85 | -3.35 | 0.000822 |
b_veh_per_driver_kid_car | 0.568 | 0.2 | 2.84 | 0.00447 |
b_veh_per_driver_par_act | -45.5 | 17 | -2.67 | 0.0076 |
b_y2017_kid_act | 11.7 | 11.9 | 0.982 | 0.326 |
b_y2017_kid_car | -0.311 | 0.265 | -1.17 | 0.24 |
b_y2017_par_act | 81.3 | 51.1 | 1.59 | 0.112 |
mu_active | 4.59 | 4.03 | 1.14 | 0.255 |
mu_car | 50 | 15.2 | 3.3 | 0.000973 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_kid_car | asc_kid_act | 0.000229 | 0.00217 | 10.1 | 0 | 0.000377 | 0.0434 | 11.8 | 0 |
asc_par_act | asc_kid_act | 0.138 | 0.87 | 0.686 | 0.493 | 0.153 | 0.883 | 0.689 | 0.491 |
asc_par_act | asc_kid_car | -6.91e-05 | -0.000619 | -9.4 | 0 | 0.000329 | 0.0357 | -10.8 | 0 |
b_age_kid_act | asc_kid_act | -0.48 | -0.584 | 10.1 | 0 | -0.568 | -0.588 | 8.99 | 0 |
b_age_kid_act | asc_kid_car | -0.0386 | -0.0666 | 8.83 | 0 | -0.00481 | -0.0936 | 7.96 | 1.78e-15 |
b_age_kid_act | asc_par_act | -0.388 | -0.448 | 10.1 | 0 | -0.479 | -0.466 | 9.04 | 0 |
b_age_kid_car | asc_kid_act | -0.000807 | -0.00211 | 4.76 | 1.9e-06 | -0.000986 | -0.0289 | 12.2 | 0 |
b_age_kid_car | asc_kid_car | -0.269 | -0.999 | 0.227 | 0.82 | -0.00147 | -0.811 | 2.79 | 0.00532 |
b_age_kid_car | asc_par_act | 0.000272 | 0.000675 | 4.6 | 4.19e-06 | -0.000779 | -0.0214 | 11.2 | 0 |
b_age_kid_car | b_age_kid_act | 0.14 | 0.0667 | -8.24 | 2.22e-16 | 0.0157 | 0.0779 | -7.87 | 3.55e-15 |
b_age_par_act | asc_kid_act | 0.551 | 0.186 | 1.43 | 0.153 | 0.97 | 0.254 | 1.16 | 0.245 |
b_age_par_act | asc_kid_car | 0.00634 | 0.00303 | 0.797 | 0.426 | 0.0218 | 0.108 | 0.647 | 0.518 |
b_age_par_act | asc_par_act | 0.0751 | 0.024 | 1.4 | 0.161 | 0.493 | 0.122 | 1.14 | 0.254 |
b_age_par_act | b_age_kid_act | -7.66 | -0.471 | -1.46 | 0.143 | -13.7 | -0.608 | -1.17 | 0.241 |
b_age_par_act | b_age_kid_car | -0.023 | -0.00304 | 0.753 | 0.451 | -0.0848 | -0.106 | 0.616 | 0.538 |
b_female_kid_act | asc_kid_act | -0.066 | -0.025 | -3.51 | 0.00044 | 0.00712 | 0.00257 | -3.51 | 0.000451 |
b_female_kid_act | asc_kid_car | 0.0446 | 0.0239 | -4.22 | 2.41e-05 | 0.00536 | 0.0364 | -4.21 | 2.56e-05 |
b_female_kid_act | asc_par_act | -0.104 | -0.0374 | -3.53 | 0.000413 | -0.0139 | -0.00471 | -3.53 | 0.000422 |
b_female_kid_act | b_age_kid_act | -0.968 | -0.0668 | -6.58 | 4.82e-11 | -1.94 | -0.119 | -6.37 | 1.88e-10 |
b_female_kid_act | b_age_kid_car | -0.161 | -0.0239 | -4.21 | 2.59e-05 | -0.0219 | -0.0378 | -4.25 | 2.15e-05 |
b_female_kid_act | b_age_par_act | 5.75 | 0.11 | -3.61 | 0.000309 | 9.19 | 0.142 | -3.22 | 0.00128 |
b_female_kid_car | asc_kid_act | 0.000999 | 0.00193 | 3.24 | 0.00118 | 0.00112 | 0.0121 | 9.79 | 0 |
b_female_kid_car | asc_kid_car | 0.36 | 0.983 | -0.223 | 0.824 | 0.000536 | 0.109 | -1.05 | 0.294 |
b_female_kid_car | asc_par_act | -0.000446 | -0.000814 | 3.13 | 0.00176 | 0.000752 | 0.00763 | 9.03 | 0 |
b_female_kid_car | b_age_kid_act | -0.187 | -0.0656 | -7.47 | 7.88e-14 | -0.0259 | -0.0472 | -8 | 1.33e-15 |
b_female_kid_car | b_age_kid_car | -1.3 | -0.983 | -0.227 | 0.821 | -0.00156 | -0.0805 | -2.1 | 0.0361 |
b_female_kid_car | b_age_par_act | 0.0311 | 0.00303 | -0.816 | 0.414 | 0.117 | 0.054 | -0.673 | 0.501 |
b_female_kid_car | b_female_kid_act | 0.222 | 0.0243 | 4.13 | 3.65e-05 | 0.0359 | 0.0228 | 4.17 | 2.98e-05 |
b_female_par_act | asc_kid_act | -0.471 | -0.155 | -2.38 | 0.0172 | -0.593 | -0.18 | -2.29 | 0.022 |
b_female_par_act | asc_kid_car | 0.0261 | 0.0122 | -3.01 | 0.00259 | -0.00535 | -0.0306 | -2.9 | 0.00375 |
b_female_par_act | asc_par_act | -0.343 | -0.107 | -2.41 | 0.0162 | -0.46 | -0.132 | -2.31 | 0.0208 |
b_female_par_act | b_age_kid_act | 3.9 | 0.235 | -5.6 | 2.12e-08 | 6.06 | 0.311 | -5.52 | 3.46e-08 |
b_female_par_act | b_age_kid_car | -0.0943 | -0.0122 | -3.02 | 0.00252 | 0.0187 | 0.0272 | -2.93 | 0.00334 |
b_female_par_act | b_age_par_act | -20.6 | -0.344 | -2.34 | 0.0194 | -32.7 | -0.426 | -2 | 0.0457 |
b_female_par_act | b_female_kid_act | 41.7 | 0.78 | 1.06 | 0.289 | 40.1 | 0.72 | 0.917 | 0.359 |
b_female_par_act | b_female_kid_car | 0.133 | 0.0127 | -2.95 | 0.00322 | -0.0213 | -0.0114 | -2.87 | 0.00414 |
b_has_big_sib_kid_act | asc_kid_act | -0.721 | -0.257 | 4.64 | 3.48e-06 | -0.766 | -0.26 | 4.61 | 4.04e-06 |
b_has_big_sib_kid_act | asc_kid_car | -0.127 | -0.0643 | 4.04 | 5.32e-05 | -0.00249 | -0.0159 | 4.03 | 5.59e-05 |
b_has_big_sib_kid_act | asc_par_act | -0.61 | -0.206 | 4.63 | 3.66e-06 | -0.652 | -0.208 | 4.6 | 4.24e-06 |
b_has_big_sib_kid_act | b_age_kid_act | 3.81 | 0.247 | 1.47 | 0.141 | 4.54 | 0.26 | 1.46 | 0.143 |
b_has_big_sib_kid_act | b_age_kid_car | 0.46 | 0.0642 | 4.01 | 6.01e-05 | -0.00241 | -0.00391 | 3.99 | 6.6e-05 |
b_has_big_sib_kid_act | b_age_par_act | -8.88 | -0.16 | 2.05 | 0.0401 | -14.3 | -0.207 | 1.78 | 0.0745 |
b_has_big_sib_kid_act | b_female_kid_act | -2.48 | -0.05 | 5.71 | 1.16e-08 | -2.8 | -0.056 | 5.66 | 1.49e-08 |
b_has_big_sib_kid_act | b_female_kid_car | -0.616 | -0.0633 | 3.97 | 7.07e-05 | -0.024 | -0.0143 | 4.06 | 4.93e-05 |
b_has_big_sib_kid_act | b_female_par_act | 2.62 | 0.0462 | 5.08 | 3.69e-07 | 4.6 | 0.0774 | 5.05 | 4.48e-07 |
b_has_big_sib_kid_car | asc_kid_act | -0.00303 | -0.00205 | 1.48 | 0.139 | -0.0031 | -0.0209 | 10.3 | 0 |
b_has_big_sib_kid_car | asc_kid_car | -1.04 | -0.998 | 0.227 | 0.82 | -0.00553 | -0.702 | 2.44 | 0.0147 |
b_has_big_sib_kid_car | asc_par_act | 0.00115 | 0.000733 | 1.44 | 0.149 | -0.00241 | -0.0153 | 9.76 | 0 |
b_has_big_sib_kid_car | b_age_kid_act | 0.541 | 0.0665 | -4.27 | 1.98e-05 | 0.0517 | 0.059 | -7.56 | 4e-14 |
b_has_big_sib_kid_car | b_age_kid_car | 3.76 | 0.997 | 0.227 | 0.821 | 0.0202 | 0.653 | 2.03 | 0.0422 |
b_has_big_sib_kid_car | b_age_par_act | -0.0894 | -0.00305 | -0.603 | 0.546 | -0.317 | -0.0916 | -0.546 | 0.585 |
b_has_big_sib_kid_car | b_female_kid_act | -0.625 | -0.0239 | 3.76 | 0.000167 | -0.085 | -0.0339 | 4.33 | 1.49e-05 |
b_has_big_sib_kid_car | b_female_kid_car | -5.04 | -0.983 | 0.227 | 0.82 | -0.0117 | -0.139 | 2.55 | 0.0107 |
b_has_big_sib_kid_car | b_female_par_act | -0.367 | -0.0122 | 2.8 | 0.00511 | 0.0636 | 0.0213 | 3.01 | 0.00259 |
b_has_big_sib_kid_car | b_has_big_sib_kid_act | 1.79 | 0.0644 | -3.57 | 0.000359 | 0.0338 | 0.0127 | -3.9 | 9.62e-05 |
b_has_big_sib_par_act | asc_kid_act | 0.0442 | 0.0125 | 2.64 | 0.00834 | 0.346 | 0.0878 | 2.48 | 0.0133 |
b_has_big_sib_par_act | asc_kid_car | -0.0935 | -0.0375 | 2.11 | 0.0345 | 0.0153 | 0.0731 | 1.98 | 0.0476 |
b_has_big_sib_par_act | asc_par_act | -0.359 | -0.0963 | 2.61 | 0.00906 | -0.0327 | -0.0078 | 2.45 | 0.0142 |
b_has_big_sib_par_act | b_age_kid_act | -5.06 | -0.261 | 0.0263 | 0.979 | -9.2 | -0.394 | 0.0238 | 0.981 |
b_has_big_sib_par_act | b_age_kid_car | 0.337 | 0.0375 | 2.08 | 0.0373 | -0.0698 | -0.0846 | 1.95 | 0.0512 |
b_has_big_sib_par_act | b_age_par_act | 39 | 0.558 | 1.65 | 0.0982 | 58.3 | 0.632 | 1.61 | 0.108 |
b_has_big_sib_par_act | b_female_kid_act | 2.42 | 0.0388 | 4.31 | 1.67e-05 | 4.72 | 0.0705 | 4.18 | 2.92e-05 |
b_has_big_sib_par_act | b_female_kid_car | -0.452 | -0.037 | 2.11 | 0.0349 | 0.0726 | 0.0324 | 2.01 | 0.0448 |
b_has_big_sib_par_act | b_female_par_act | -15.2 | -0.213 | 3.24 | 0.00118 | -23.5 | -0.296 | 2.97 | 0.00295 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 41.2 | 0.621 | -1.38 | 0.169 | 37.6 | 0.528 | -1.18 | 0.239 |
b_has_big_sib_par_act | b_has_big_sib_kid_car | 1.32 | 0.0376 | 1.88 | 0.0596 | -0.212 | -0.0594 | 1.88 | 0.0601 |
b_has_lil_sib_kid_act | asc_kid_act | -0.407 | -0.147 | 3.75 | 0.000176 | -0.333 | -0.115 | 3.75 | 0.000179 |
b_has_lil_sib_kid_act | asc_kid_car | -0.128 | -0.0657 | 3.11 | 0.00188 | 0.00383 | 0.0249 | 3.11 | 0.00186 |
b_has_lil_sib_kid_act | asc_par_act | -0.412 | -0.141 | 3.73 | 0.000191 | -0.356 | -0.116 | 3.73 | 0.000195 |
b_has_lil_sib_kid_act | b_age_kid_act | -0.351 | -0.0232 | 0.426 | 0.67 | -1.38 | -0.0804 | 0.414 | 0.679 |
b_has_lil_sib_kid_act | b_age_kid_car | 0.462 | 0.0656 | 3.08 | 0.00209 | -0.00941 | -0.0156 | 3.07 | 0.00213 |
b_has_lil_sib_kid_act | b_age_par_act | 3.69 | 0.0675 | 1.6 | 0.11 | 7.72 | 0.114 | 1.45 | 0.148 |
b_has_lil_sib_kid_act | b_female_kid_act | -0.124 | -0.00254 | 5.17 | 2.39e-07 | -0.248 | -0.00506 | 5.15 | 2.67e-07 |
b_has_lil_sib_kid_act | b_female_kid_car | -0.619 | -0.0647 | 3.06 | 0.0022 | 0.00725 | 0.00442 | 3.14 | 0.00167 |
b_has_lil_sib_kid_act | b_female_par_act | -1.81 | -0.0324 | 4.26 | 2.05e-05 | -4.11 | -0.0706 | 4.09 | 4.29e-05 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 12.8 | 0.248 | -0.811 | 0.418 | 12.2 | 0.234 | -0.8 | 0.424 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_car | 1.79 | 0.0656 | 2.71 | 0.00675 | -0.0503 | -0.0192 | 2.97 | 0.00293 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 15.2 | 0.233 | 0.288 | 0.774 | 18 | 0.258 | 0.279 | 0.78 |
b_has_lil_sib_kid_car | asc_kid_act | -0.00329 | -0.00204 | 1.38 | 0.168 | -0.00491 | -0.0325 | 10.3 | 0 |
b_has_lil_sib_kid_car | asc_kid_car | -1.14 | -0.998 | 0.227 | 0.82 | -0.0056 | -0.698 | 2.6 | 0.00936 |
b_has_lil_sib_kid_car | asc_par_act | 0.00126 | 0.000739 | 1.34 | 0.179 | -0.00399 | -0.0249 | 9.77 | 0 |
b_has_lil_sib_kid_car | b_age_kid_act | 0.589 | 0.0665 | -3.97 | 7.24e-05 | 0.0838 | 0.0939 | -7.57 | 3.82e-14 |
b_has_lil_sib_kid_car | b_age_kid_car | 4.1 | 0.997 | 0.227 | 0.82 | 0.0166 | 0.526 | 2.15 | 0.0316 |
b_has_lil_sib_kid_car | b_age_par_act | -0.0971 | -0.00304 | -0.583 | 0.56 | -0.344 | -0.0975 | -0.537 | 0.591 |
b_has_lil_sib_kid_car | b_female_kid_act | -0.681 | -0.0239 | 3.69 | 0.000223 | -0.103 | -0.0403 | 4.34 | 1.42e-05 |
b_has_lil_sib_kid_car | b_female_kid_car | -5.5 | -0.983 | 0.227 | 0.82 | -0.0102 | -0.119 | 2.71 | 0.00672 |
b_has_lil_sib_kid_car | b_female_par_act | -0.399 | -0.0122 | 2.76 | 0.0058 | 0.0696 | 0.0229 | 3.02 | 0.0025 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_act | 1.94 | 0.0642 | -3.49 | 0.000478 | 0.0659 | 0.0242 | -3.89 | 9.97e-05 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_car | 15.9 | 0.997 | 0.173 | 0.863 | 0.0916 | 0.67 | 0.261 | 0.794 |
b_has_lil_sib_kid_car | b_has_big_sib_par_act | 1.43 | 0.0375 | -1.85 | 0.0641 | -0.222 | -0.0608 | -1.87 | 0.0613 |
b_has_lil_sib_kid_car | b_has_lil_sib_kid_act | 1.96 | 0.0658 | -2.65 | 0.0081 | -0.0495 | -0.0185 | -2.96 | 0.00304 |
b_has_lil_sib_par_act | asc_kid_act | -0.627 | -0.206 | 3.84 | 0.000123 | -0.67 | -0.212 | 3.85 | 0.000118 |
b_has_lil_sib_par_act | asc_kid_car | -0.137 | -0.0639 | 3.27 | 0.00108 | -0.00184 | -0.0109 | 3.29 | 0.001 |
b_has_lil_sib_par_act | asc_par_act | -0.63 | -0.196 | 3.82 | 0.000132 | -0.722 | -0.215 | 3.83 | 0.000128 |
b_has_lil_sib_par_act | b_age_kid_act | 2.5 | 0.15 | 0.852 | 0.394 | 3.02 | 0.161 | 0.854 | 0.393 |
b_has_lil_sib_par_act | b_age_kid_car | 0.494 | 0.0638 | 3.24 | 0.00119 | 0.0116 | 0.0176 | 3.25 | 0.00114 |
b_has_lil_sib_par_act | b_age_par_act | -11.9 | -0.197 | 1.64 | 0.102 | -15.1 | -0.204 | 1.46 | 0.144 |
b_has_lil_sib_par_act | b_female_kid_act | -1.77 | -0.033 | 5.16 | 2.47e-07 | -2.89 | -0.054 | 5.11 | 3.18e-07 |
b_has_lil_sib_par_act | b_female_kid_car | -0.663 | -0.063 | 3.23 | 0.00125 | -0.0225 | -0.0125 | 3.32 | 0.000909 |
b_has_lil_sib_par_act | b_female_par_act | 4.19 | 0.0682 | 4.61 | 4.07e-06 | 5.49 | 0.0862 | 4.57 | 4.86e-06 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 15.2 | 0.267 | -0.403 | 0.687 | 15.7 | 0.275 | -0.405 | 0.686 |
b_has_lil_sib_par_act | b_has_big_sib_kid_car | 1.92 | 0.0639 | 2.91 | 0.00357 | 0.0279 | 0.00972 | 3.17 | 0.00153 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 7.51 | 0.105 | 0.562 | 0.574 | 4.94 | 0.0647 | 0.529 | 0.597 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 47.6 | 0.849 | 0.83 | 0.407 | 46.6 | 0.833 | 0.792 | 0.428 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_car | 2.1 | 0.064 | 2.86 | 0.00427 | 0.042 | 0.0144 | 3.16 | 0.00158 |
b_log_density_kid_act | asc_kid_act | -0.592 | -0.558 | 8.16 | 2.22e-16 | -0.641 | -0.543 | 7.7 | 1.4e-14 |
b_log_density_kid_act | asc_kid_car | 0.0227 | 0.0303 | 7.11 | 1.17e-12 | 0.0016 | 0.0256 | 6.69 | 2.18e-11 |
b_log_density_kid_act | asc_par_act | -0.593 | -0.529 | 8.11 | 4.44e-16 | -0.672 | -0.536 | 7.62 | 2.53e-14 |
b_log_density_kid_act | b_age_kid_act | -0.507 | -0.087 | 0.125 | 0.9 | -0.972 | -0.139 | 0.112 | 0.91 |
b_log_density_kid_act | b_age_kid_car | -0.0822 | -0.0304 | 6.54 | 6.12e-11 | -0.00709 | -0.0288 | 6.59 | 4.53e-11 |
b_log_density_kid_act | b_age_par_act | 3.78 | 0.18 | 1.75 | 0.0796 | 6.15 | 0.223 | 1.45 | 0.146 |
b_log_density_kid_act | b_female_kid_act | -0.197 | -0.0105 | 6.55 | 5.8e-11 | 0.179 | 0.00897 | 6.52 | 7.23e-11 |
b_log_density_kid_act | b_female_kid_car | 0.11 | 0.03 | 6.55 | 5.58e-11 | 0.0113 | 0.0169 | 6.76 | 1.36e-11 |
b_log_density_kid_act | b_female_par_act | -1.88 | -0.0878 | 5.06 | 4.17e-07 | -2.84 | -0.12 | 4.81 | 1.52e-06 |
b_log_density_kid_act | b_has_big_sib_kid_act | -0.489 | -0.0246 | -1.27 | 0.206 | -0.93 | -0.0437 | -1.24 | 0.215 |
b_log_density_kid_act | b_has_big_sib_kid_car | -0.319 | -0.0304 | 3.89 | 9.87e-05 | -0.0206 | -0.0193 | 6.31 | 2.82e-10 |
b_log_density_kid_act | b_has_big_sib_par_act | 2.61 | 0.104 | 0.0208 | 0.983 | 4.02 | 0.141 | 0.0196 | 0.984 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 0.473 | 0.0242 | -0.361 | 0.718 | 1.06 | 0.0508 | -0.361 | 0.718 |
b_log_density_kid_act | b_has_lil_sib_kid_car | -0.348 | -0.0304 | 3.66 | 0.000253 | -0.0456 | -0.0418 | 6.26 | 3.81e-10 |
b_log_density_kid_act | b_has_lil_sib_par_act | -0.557 | -0.0259 | -0.741 | 0.459 | -0.62 | -0.0272 | -0.737 | 0.461 |
b_log_density_kid_car | asc_kid_act | 0.000362 | 0.00163 | 6.78 | 1.23e-11 | 0.000114 | 0.00338 | 11.4 | 0 |
b_log_density_kid_car | asc_kid_car | 0.154 | 0.984 | -0.218 | 0.827 | -0.000121 | -0.0673 | -0.773 | 0.439 |
b_log_density_kid_car | asc_par_act | -0.00026 | -0.00111 | 6.45 | 1.09e-10 | -6.04e-05 | -0.00168 | 10.4 | 0 |
b_log_density_kid_car | b_age_kid_act | -0.0805 | -0.0659 | -8.56 | 0 | -0.0102 | -0.0508 | -7.98 | 1.55e-15 |
b_log_density_kid_car | b_age_kid_car | -0.56 | -0.987 | -0.227 | 0.82 | -0.00111 | -0.158 | -2.77 | 0.00561 |
b_log_density_kid_car | b_age_par_act | 0.0135 | 0.00307 | -0.804 | 0.422 | 0.0544 | 0.0691 | -0.654 | 0.513 |
b_log_density_kid_car | b_female_kid_act | 0.093 | 0.0237 | 4.21 | 2.59e-05 | 0.0108 | 0.0189 | 4.2 | 2.67e-05 |
b_log_density_kid_car | b_female_kid_car | 0.75 | 0.973 | 0.216 | 0.829 | -0.000985 | -0.0515 | 0.691 | 0.49 |
b_log_density_kid_car | b_female_par_act | 0.0544 | 0.0121 | 3 | 0.00271 | -0.0147 | -0.0217 | 2.89 | 0.00386 |
b_log_density_kid_car | b_has_big_sib_kid_act | -0.265 | -0.0636 | -4.03 | 5.57e-05 | 0.000991 | 0.00163 | -4.04 | 5.37e-05 |
b_log_density_kid_car | b_has_big_sib_kid_car | -2.17 | -0.987 | -0.227 | 0.82 | -0.00811 | -0.265 | -2.52 | 0.0118 |
b_log_density_kid_car | b_has_big_sib_par_act | -0.195 | -0.0371 | -2.12 | 0.0344 | 0.0446 | 0.0547 | -1.99 | 0.0468 |
b_log_density_kid_car | b_has_lil_sib_kid_act | -0.267 | -0.065 | -3.1 | 0.00192 | 0.00106 | 0.00177 | -3.12 | 0.0018 |
b_log_density_kid_car | b_has_lil_sib_kid_car | -2.37 | -0.987 | -0.227 | 0.82 | -0.00576 | -0.185 | -2.71 | 0.00668 |
b_log_density_kid_car | b_has_lil_sib_par_act | -0.285 | -0.0632 | -3.26 | 0.00111 | -0.0125 | -0.0191 | -3.3 | 0.000977 |
b_log_density_kid_car | b_log_density_kid_act | 0.0485 | 0.0308 | -7.04 | 1.95e-12 | 0.00851 | 0.035 | -6.72 | 1.83e-11 |
b_log_density_par_act | asc_kid_act | -0.988 | -0.581 | 6.37 | 1.9e-10 | -1.29 | -0.612 | 5.37 | 8.07e-08 |
b_log_density_par_act | asc_kid_car | 0.0039 | 0.00325 | 5.62 | 1.95e-08 | -0.00986 | -0.0878 | 4.72 | 2.4e-06 |
b_log_density_par_act | asc_par_act | -1 | -0.56 | 6.33 | 2.42e-10 | -1.34 | -0.598 | 5.33 | 9.87e-08 |
b_log_density_par_act | b_age_kid_act | 4.49 | 0.483 | 1.46 | 0.145 | 7.33 | 0.586 | 1.31 | 0.192 |
b_log_density_par_act | b_age_kid_car | -0.0142 | -0.00329 | 5.42 | 5.91e-08 | 0.0361 | 0.0818 | 4.67 | 3.03e-06 |
b_log_density_par_act | b_age_par_act | -23.6 | -0.702 | 1.66 | 0.0967 | -37.3 | -0.755 | 1.34 | 0.179 |
b_log_density_par_act | b_female_kid_act | -2.94 | -0.098 | 6.32 | 2.65e-10 | -4.62 | -0.129 | 5.86 | 4.76e-09 |
b_log_density_par_act | b_female_kid_car | 0.0191 | 0.00325 | 5.44 | 5.41e-08 | -0.0491 | -0.041 | 4.75 | 2.03e-06 |
b_log_density_par_act | b_female_par_act | 8.14 | 0.237 | 6.02 | 1.72e-09 | 13 | 0.305 | 5.87 | 4.37e-09 |
b_log_density_par_act | b_has_big_sib_kid_act | 4.71 | 0.148 | -0.6 | 0.548 | 6.93 | 0.181 | -0.581 | 0.561 |
b_log_density_par_act | b_has_big_sib_kid_car | -0.0556 | -0.00331 | 4.07 | 4.65e-05 | 0.138 | 0.0719 | 4.55 | 5.32e-06 |
b_log_density_par_act | b_has_big_sib_par_act | -15.4 | -0.385 | 0.463 | 0.644 | -24.1 | -0.472 | 0.409 | 0.683 |
b_log_density_par_act | b_has_lil_sib_kid_act | -1.22 | -0.0391 | 0.283 | 0.777 | -2.9 | -0.0776 | 0.263 | 0.793 |
b_log_density_par_act | b_has_lil_sib_kid_car | -0.0608 | -0.00332 | 3.9 | 9.46e-05 | 0.138 | 0.0706 | 4.54 | 5.72e-06 |
b_log_density_par_act | b_has_lil_sib_par_act | 5.6 | 0.163 | -0.127 | 0.899 | 7.02 | 0.172 | -0.122 | 0.903 |
b_log_density_par_act | b_log_density_kid_act | 5.43 | 0.452 | 1.29 | 0.196 | 5.52 | 0.362 | 1.03 | 0.301 |
b_log_density_par_act | b_log_density_kid_car | 0.00917 | 0.00364 | 5.6 | 2.19e-08 | -0.019 | -0.0436 | 4.73 | 2.28e-06 |
b_log_distance_kid_act | asc_kid_act | 0.607 | 0.259 | -26.5 | 0 | 0.533 | 0.212 | -25.7 | 0 |
b_log_distance_kid_act | asc_kid_car | 0.0435 | 0.0264 | -26.9 | 0 | 0.00355 | 0.0265 | -26.1 | 0 |
b_log_distance_kid_act | asc_par_act | 0.568 | 0.23 | -26.5 | 0 | 0.553 | 0.207 | -25.7 | 0 |
b_log_distance_kid_act | b_age_kid_act | -2.44 | -0.19 | -26.8 | 0 | -2.34 | -0.157 | -25.9 | 0 |
b_log_distance_kid_act | b_age_kid_car | -0.157 | -0.0263 | -26.5 | 0 | -0.0196 | -0.0372 | -26.2 | 0 |
b_log_distance_kid_act | b_age_par_act | -0.249 | -0.00539 | -17.3 | 0 | -0.565 | -0.0096 | -14.9 | 0 |
b_log_distance_kid_act | b_female_kid_act | 2.59 | 0.0629 | -15.2 | 0 | 3.31 | 0.0776 | -15.1 | 0 |
b_log_distance_kid_act | b_female_kid_car | 0.21 | 0.026 | -26.4 | 0 | 0.036 | 0.0252 | -26.1 | 0 |
b_log_distance_kid_act | b_female_par_act | 1.6 | 0.0339 | -14.3 | 0 | 3.04 | 0.06 | -14 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -1.29 | -0.0295 | -20.1 | 0 | -1.21 | -0.0267 | -19.8 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_car | -0.608 | -0.0263 | -22.6 | 0 | -0.012 | -0.00528 | -26.2 | 0 |
b_log_distance_kid_act | b_has_big_sib_par_act | 0.27 | 0.00488 | -16.7 | 0 | 0.435 | 0.00715 | -15.8 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -1.63 | -0.0377 | -19.4 | 0 | -3.29 | -0.0738 | -18.8 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_car | -0.663 | -0.0263 | -22 | 0 | -0.0389 | -0.0167 | -26.2 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -2.06 | -0.0434 | -18.6 | 0 | -3.46 | -0.071 | -18.2 | 0 |
b_log_distance_kid_act | b_log_density_kid_act | -0.557 | -0.0336 | -27.1 | 0 | -0.236 | -0.013 | -26.4 | 0 |
b_log_distance_kid_act | b_log_density_kid_car | 0.0906 | 0.0261 | -26.9 | 0 | 0.00745 | 0.0143 | -26.1 | 0 |
b_log_distance_kid_act | b_log_density_par_act | -1.4 | -0.0527 | -24.5 | 0 | -1.54 | -0.0473 | -22.5 | 0 |
b_log_distance_kid_car | asc_kid_act | 0.00107 | 0.00211 | 3.32 | 0.000895 | 0.00214 | 0.0201 | 9.48 | 0 |
b_log_distance_kid_car | asc_kid_car | 0.352 | 0.986 | -0.222 | 0.825 | 0.00321 | 0.568 | -0.916 | 0.36 |
b_log_distance_kid_car | asc_par_act | -0.000342 | -0.00064 | 3.2 | 0.00137 | 0.00189 | 0.0167 | 8.78 | 0 |
b_log_distance_kid_car | b_age_kid_act | -0.183 | -0.0658 | -7.52 | 5.46e-14 | -0.0381 | -0.0605 | -7.97 | 1.55e-15 |
b_log_distance_kid_car | b_age_kid_car | -1.27 | -0.985 | -0.226 | 0.821 | -0.0101 | -0.454 | -1.66 | 0.0965 |
b_log_distance_kid_car | b_age_par_act | 0.0301 | 0.003 | -0.816 | 0.415 | 0.0937 | 0.0377 | -0.672 | 0.502 |
b_log_distance_kid_car | b_female_kid_act | 0.211 | 0.0236 | 4.13 | 3.59e-05 | 0.0615 | 0.0341 | 4.18 | 2.95e-05 |
b_log_distance_kid_car | b_female_kid_car | 1.7 | 0.97 | 0.0253 | 0.98 | 0.00697 | 0.115 | 0.025 | 0.98 |
b_log_distance_kid_car | b_female_par_act | 0.124 | 0.0121 | 2.95 | 0.0032 | 0.00878 | 0.0041 | 2.87 | 0.00411 |
b_log_distance_kid_car | b_has_big_sib_kid_act | -0.602 | -0.0634 | -3.98 | 6.98e-05 | 0.0158 | 0.00821 | -4.06 | 4.91e-05 |
b_log_distance_kid_car | b_has_big_sib_kid_car | -4.92 | -0.983 | -0.227 | 0.82 | -0.0416 | -0.431 | -2.17 | 0.03 |
b_log_distance_kid_car | b_has_big_sib_par_act | -0.442 | -0.037 | -2.11 | 0.0349 | 0.103 | 0.0399 | -2.01 | 0.0449 |
b_log_distance_kid_car | b_has_lil_sib_kid_act | -0.605 | -0.0648 | -3.06 | 0.00218 | 0.0329 | 0.0175 | -3.14 | 0.00167 |
b_log_distance_kid_car | b_has_lil_sib_kid_car | -5.37 | -0.983 | -0.227 | 0.82 | -0.0432 | -0.44 | -2.28 | 0.0224 |
b_log_distance_kid_car | b_has_lil_sib_par_act | -0.648 | -0.063 | -3.23 | 0.00124 | 0.00294 | 0.00143 | -3.32 | 0.00091 |
b_log_distance_kid_car | b_log_density_kid_act | 0.108 | 0.0301 | -6.58 | 4.7e-11 | 0.0139 | 0.0181 | -6.75 | 1.43e-11 |
b_log_distance_kid_car | b_log_density_kid_car | 0.733 | 0.974 | -0.214 | 0.83 | 0.00409 | 0.186 | -0.624 | 0.532 |
b_log_distance_kid_car | b_log_density_par_act | 0.0189 | 0.00329 | -5.45 | 5.15e-08 | -0.0431 | -0.0313 | -4.75 | 2.05e-06 |
b_log_distance_kid_car | b_log_distance_kid_act | 0.212 | 0.0268 | 26.4 | 0 | 0.064 | 0.039 | 26.1 | 0 |
b_log_distance_par_act | asc_kid_act | 0.585 | 0.235 | -24.8 | 0 | 0.606 | 0.224 | -23.7 | 0 |
b_log_distance_par_act | asc_kid_car | 0.0432 | 0.0246 | -25.2 | 0 | 0.00592 | 0.0411 | -24.2 | 0 |
b_log_distance_par_act | asc_par_act | 0.666 | 0.254 | -24.8 | 0 | 0.752 | 0.261 | -23.8 | 0 |
b_log_distance_par_act | b_age_kid_act | -2.36 | -0.173 | -25.5 | 0 | -3.18 | -0.199 | -24 | 0 |
b_log_distance_par_act | b_age_kid_car | -0.156 | -0.0246 | -24.9 | 0 | -0.0281 | -0.0496 | -24.2 | 0 |
b_log_distance_par_act | b_age_par_act | 0.0995 | 0.00202 | -16.8 | 0 | 3.68 | 0.0582 | -14.9 | 0 |
b_log_distance_par_act | b_female_kid_act | 2.47 | 0.0563 | -14.6 | 0 | 4.07 | 0.0886 | -14.5 | 0 |
b_log_distance_par_act | b_female_kid_car | 0.209 | 0.0243 | -24.8 | 0 | 0.048 | 0.0312 | -24.1 | 0 |
b_log_distance_par_act | b_female_par_act | 1.85 | 0.0369 | -13.9 | 0 | 1.39 | 0.0254 | -13.3 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_act | -1.24 | -0.0265 | -19.5 | 0 | -1.68 | -0.0343 | -19 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_car | -0.604 | -0.0246 | -21.6 | 0 | -0.0463 | -0.0189 | -24.2 | 0 |
b_log_distance_par_act | b_has_big_sib_par_act | 0.27 | 0.0046 | -16.3 | 0 | 3.44 | 0.0526 | -15.7 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -1.55 | -0.0337 | -18.9 | 0 | -2.7 | -0.0563 | -18.3 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_car | -0.659 | -0.0246 | -21 | 0 | -0.076 | -0.0304 | -24.2 | 0 |
b_log_distance_par_act | b_has_lil_sib_par_act | -2.62 | -0.052 | -18 | 0 | -5.5 | -0.105 | -17.3 | 0 |
b_log_distance_par_act | b_log_density_kid_act | -0.535 | -0.0304 | -25.7 | 0 | -0.236 | -0.0121 | -24.7 | 0 |
b_log_distance_par_act | b_log_density_kid_car | 0.09 | 0.0244 | -25.2 | 0 | 0.0123 | 0.022 | -24.2 | 0 |
b_log_distance_par_act | b_log_density_par_act | -1.61 | -0.0572 | -23.4 | 0 | -3.42 | -0.0974 | -21 | 0 |
b_log_distance_par_act | b_log_distance_kid_act | 35.5 | 0.913 | 0.314 | 0.754 | 37.8 | 0.904 | 0.287 | 0.774 |
b_log_distance_par_act | b_log_distance_kid_car | 0.21 | 0.025 | -24.8 | 0 | 0.076 | 0.043 | -24.1 | 0 |
b_log_income_k_kid_act | asc_kid_act | -0.714 | -0.465 | 0.511 | 0.609 | -0.691 | -0.433 | 0.513 | 0.608 |
b_log_income_k_kid_act | asc_kid_car | 0.0125 | 0.0116 | -0.666 | 0.506 | 0.00279 | 0.0329 | -0.669 | 0.503 |
b_log_income_k_kid_act | asc_par_act | -0.692 | -0.428 | 0.478 | 0.633 | -0.651 | -0.384 | 0.48 | 0.631 |
b_log_income_k_kid_act | b_age_kid_act | 0.141 | 0.0168 | -4.87 | 1.13e-06 | -0.2 | -0.0212 | -4.66 | 3.15e-06 |
b_log_income_k_kid_act | b_age_kid_car | -0.0456 | -0.0117 | -0.715 | 0.474 | -0.0123 | -0.0369 | -0.741 | 0.459 |
b_log_income_k_kid_act | b_age_par_act | 1.8 | 0.0595 | -1.04 | 0.298 | 3.85 | 0.103 | -0.888 | 0.374 |
b_log_income_k_kid_act | b_female_kid_act | -0.0637 | -0.00236 | 3.32 | 0.000916 | 0.494 | 0.0183 | 3.34 | 0.000839 |
b_log_income_k_kid_act | b_female_kid_car | 0.0612 | 0.0115 | -0.577 | 0.564 | 0.0241 | 0.0267 | -0.608 | 0.543 |
b_log_income_k_kid_act | b_female_par_act | -0.723 | -0.0233 | 2.37 | 0.018 | -1.52 | -0.0472 | 2.27 | 0.0229 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 0.252 | 0.00876 | -3.89 | 9.92e-05 | 0.0919 | 0.00319 | -3.87 | 0.00011 |
b_log_income_k_kid_act | b_has_big_sib_kid_car | -0.177 | -0.0117 | -0.645 | 0.519 | -0.0508 | -0.0352 | -0.898 | 0.369 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 1.5 | 0.0416 | -2.24 | 0.025 | 2.79 | 0.0724 | -2.14 | 0.0322 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 1.36 | 0.0481 | -3.12 | 0.00184 | 1.3 | 0.0461 | -3.11 | 0.00188 |
b_log_income_k_kid_act | b_has_lil_sib_kid_car | -0.193 | -0.0117 | -0.631 | 0.528 | -0.0513 | -0.0348 | -0.918 | 0.359 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 0.921 | 0.0296 | -3.27 | 0.00109 | 0.566 | 0.0183 | -3.26 | 0.00111 |
b_log_income_k_kid_act | b_log_density_kid_act | 0.637 | 0.0587 | -4.73 | 2.2e-06 | 1.09 | 0.0945 | -4.74 | 2.19e-06 |
b_log_income_k_kid_act | b_log_density_kid_car | 0.0264 | 0.0116 | -0.644 | 0.52 | 0.0112 | 0.0341 | -0.652 | 0.514 |
b_log_income_k_kid_act | b_log_density_par_act | -0.0831 | -0.00479 | -4.61 | 3.99e-06 | -0.802 | -0.0389 | -4.09 | 4.25e-05 |
b_log_income_k_kid_act | b_log_distance_kid_act | -1.63 | -0.068 | 21.5 | 0 | -0.842 | -0.0342 | 21.4 | 0 |
b_log_income_k_kid_act | b_log_distance_kid_car | 0.0594 | 0.0115 | -0.58 | 0.562 | 0.0153 | 0.0148 | -0.61 | 0.542 |
b_log_income_k_kid_act | b_log_distance_par_act | -1.52 | -0.0598 | 20.6 | 0 | -0.471 | -0.0178 | 20.3 | 0 |
b_log_income_k_kid_car | asc_kid_act | 0.000108 | 0.00087 | 9.48 | 0 | -0.000381 | -0.0062 | 11 | 0 |
b_log_income_k_kid_car | asc_kid_car | 0.0762 | 0.871 | -0.0145 | 0.988 | -0.000537 | -0.164 | -0.0145 | 0.988 |
b_log_income_k_kid_car | asc_par_act | -0.000202 | -0.00154 | 8.89 | 0 | -0.000551 | -0.00842 | 10.1 | 0 |
b_log_income_k_kid_car | b_age_kid_act | -0.0401 | -0.0589 | -8.81 | 0 | -0.00615 | -0.0169 | -7.95 | 2e-15 |
b_log_income_k_kid_car | b_age_kid_car | -0.278 | -0.882 | -0.226 | 0.821 | -0.00135 | -0.105 | -1.59 | 0.112 |
b_log_income_k_kid_car | b_age_par_act | 0.00678 | 0.00276 | -0.797 | 0.426 | 0.0311 | 0.0216 | -0.647 | 0.518 |
b_log_income_k_kid_car | b_female_kid_act | 0.0463 | 0.0212 | 4.22 | 2.42e-05 | 0.02 | 0.0192 | 4.21 | 2.56e-05 |
b_log_income_k_kid_car | b_female_kid_car | 0.374 | 0.871 | 0.221 | 0.825 | -0.000307 | -0.00881 | 0.857 | 0.392 |
b_log_income_k_kid_car | b_female_par_act | 0.0271 | 0.0108 | 3.01 | 0.0026 | 0.0038 | 0.00307 | 2.9 | 0.00375 |
b_log_income_k_kid_car | b_has_big_sib_kid_act | -0.132 | -0.0569 | -4.04 | 5.34e-05 | -0.00773 | -0.00696 | -4.03 | 5.61e-05 |
b_log_income_k_kid_car | b_has_big_sib_kid_car | -1.08 | -0.882 | -0.227 | 0.82 | -0.00549 | -0.0986 | -2.28 | 0.0229 |
b_log_income_k_kid_car | b_has_big_sib_par_act | -0.097 | -0.0332 | -2.11 | 0.0345 | 0.0185 | 0.0125 | -1.98 | 0.0476 |
b_log_income_k_kid_car | b_has_lil_sib_kid_act | -0.133 | -0.058 | -3.11 | 0.00188 | 0.00688 | 0.00632 | -3.11 | 0.00186 |
b_log_income_k_kid_car | b_has_lil_sib_kid_car | -1.18 | -0.881 | -0.227 | 0.82 | -0.00329 | -0.058 | -2.46 | 0.0138 |
b_log_income_k_kid_car | b_has_lil_sib_par_act | -0.142 | -0.0565 | -3.27 | 0.00109 | -0.000729 | -0.000612 | -3.29 | 0.00101 |
b_log_income_k_kid_car | b_log_density_kid_act | 0.0237 | 0.027 | -7.1 | 1.28e-12 | 0.00812 | 0.0183 | -6.69 | 2.23e-11 |
b_log_income_k_kid_car | b_log_density_kid_car | 0.161 | 0.875 | 0.196 | 0.844 | 6.34e-05 | 0.00499 | 0.378 | 0.706 |
b_log_income_k_kid_car | b_log_density_par_act | 0.0041 | 0.00292 | -5.61 | 1.99e-08 | -0.00761 | -0.00956 | -4.72 | 2.41e-06 |
b_log_income_k_kid_car | b_log_distance_kid_act | 0.0447 | 0.0231 | 26.9 | 0 | 0.00629 | 0.00663 | 26.1 | 0 |
b_log_income_k_kid_car | b_log_distance_kid_car | 0.362 | 0.863 | 0.218 | 0.827 | -0.000246 | -0.00614 | 0.749 | 0.454 |
b_log_income_k_kid_car | b_log_distance_par_act | 0.0444 | 0.0216 | 25.2 | 0 | 0.00936 | 0.00917 | 24.2 | 0 |
b_log_income_k_kid_car | b_log_income_k_kid_act | 0.0156 | 0.0123 | 0.665 | 0.506 | 0.00506 | 0.00842 | 0.668 | 0.504 |
b_log_income_k_par_act | asc_kid_act | -0.763 | -0.466 | 0.541 | 0.589 | -0.83 | -0.488 | 0.541 | 0.589 |
b_log_income_k_par_act | asc_kid_car | 0.00864 | 0.00749 | -0.56 | 0.576 | -0.00228 | -0.0252 | -0.563 | 0.573 |
b_log_income_k_par_act | asc_par_act | -0.856 | -0.495 | 0.507 | 0.612 | -0.858 | -0.474 | 0.508 | 0.611 |
b_log_income_k_par_act | b_age_kid_act | 1.09 | 0.122 | -4.77 | 1.84e-06 | 2.12 | 0.211 | -4.89 | 1e-06 |
b_log_income_k_par_act | b_age_kid_car | -0.0316 | -0.00757 | -0.611 | 0.541 | 0.00627 | 0.0176 | -0.631 | 0.528 |
b_log_income_k_par_act | b_age_par_act | -3.39 | -0.105 | -0.929 | 0.353 | -9.02 | -0.227 | -0.759 | 0.448 |
b_log_income_k_par_act | b_female_kid_act | -0.592 | -0.0205 | 3.27 | 0.00109 | -1.13 | -0.0393 | 3.23 | 0.00122 |
b_log_income_k_par_act | b_female_kid_car | 0.0424 | 0.00748 | -0.482 | 0.63 | -0.00222 | -0.0023 | -0.505 | 0.613 |
b_log_income_k_par_act | b_female_par_act | 1.1 | 0.0333 | 2.42 | 0.0156 | 3.01 | 0.0879 | 2.4 | 0.0162 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 1.28 | 0.0416 | -3.86 | 0.000116 | 2.31 | 0.0752 | -3.9 | 9.57e-05 |
b_log_income_k_par_act | b_has_big_sib_kid_car | -0.123 | -0.00758 | -0.577 | 0.564 | 0.0198 | 0.0129 | -0.782 | 0.434 |
b_log_income_k_par_act | b_has_big_sib_par_act | -1.7 | -0.044 | -2.12 | 0.0339 | -5.92 | -0.144 | -1.94 | 0.0521 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 0.994 | 0.0329 | -3.01 | 0.00259 | 0.397 | 0.0132 | -2.98 | 0.00284 |
b_log_income_k_par_act | b_has_lil_sib_kid_car | -0.134 | -0.00757 | -0.567 | 0.571 | 0.0275 | 0.0175 | -0.801 | 0.423 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 2.09 | 0.063 | -3.24 | 0.00121 | 3.33 | 0.101 | -3.31 | 0.000948 |
b_log_income_k_par_act | b_log_density_kid_act | 0.269 | 0.0232 | -4.39 | 1.12e-05 | 0.111 | 0.00906 | -4.29 | 1.77e-05 |
b_log_income_k_par_act | b_log_density_kid_car | 0.0183 | 0.00752 | -0.54 | 0.589 | -5.91e-05 | -0.000168 | -0.547 | 0.585 |
b_log_income_k_par_act | b_log_density_par_act | 2.28 | 0.123 | -4.74 | 2.14e-06 | 4.58 | 0.208 | -4.51 | 6.41e-06 |
b_log_income_k_par_act | b_log_distance_kid_act | -1.69 | -0.0661 | 21.1 | 0 | -0.937 | -0.0357 | 21 | 0 |
b_log_income_k_par_act | b_log_distance_kid_car | 0.0411 | 0.00742 | -0.485 | 0.628 | -0.0078 | -0.00703 | -0.507 | 0.612 |
b_log_income_k_par_act | b_log_distance_par_act | -1.98 | -0.073 | 20.1 | 0 | -1.92 | -0.0679 | 19.6 | 0 |
b_log_income_k_par_act | b_log_income_k_kid_act | 14.8 | 0.886 | 0.137 | 0.891 | 14.2 | 0.854 | 0.121 | 0.903 |
b_log_income_k_par_act | b_log_income_k_kid_car | 0.0115 | 0.00851 | -0.559 | 0.576 | 9.83e-05 | 0.000153 | -0.562 | 0.574 |
b_non_work_dad_kid_ace | asc_kid_act | -0.306 | -0.0728 | 0.00122 | 0.999 | -0.371 | -0.0861 | 0.00124 | 0.999 |
b_non_work_dad_kid_ace | asc_kid_car | 0.023 | 0.00777 | -0.437 | 0.662 | -0.0012 | -0.00521 | -0.445 | 0.656 |
b_non_work_dad_kid_ace | asc_par_act | -0.335 | -0.0755 | -0.0116 | 0.991 | -0.378 | -0.0825 | -0.0118 | 0.991 |
b_non_work_dad_kid_ace | b_age_kid_act | -1.96 | -0.0851 | -2.12 | 0.034 | -2.49 | -0.0977 | -2.13 | 0.0328 |
b_non_work_dad_kid_ace | b_age_kid_car | -0.0835 | -0.0078 | -0.462 | 0.644 | 0.00672 | 0.00746 | -0.472 | 0.637 |
b_non_work_dad_kid_ace | b_age_par_act | 4.39 | 0.0528 | -0.838 | 0.402 | 8.61 | 0.0855 | -0.797 | 0.426 |
b_non_work_dad_kid_ace | b_female_kid_act | 1.8 | 0.0242 | 1.9 | 0.0576 | 1.62 | 0.0222 | 1.92 | 0.055 |
b_non_work_dad_kid_ace | b_female_kid_car | 0.112 | 0.00769 | -0.413 | 0.68 | -5.49e-05 | -2.25e-05 | -0.423 | 0.672 |
b_non_work_dad_kid_ace | b_female_par_act | -0.791 | -0.00931 | 1.4 | 0.161 | -2.83 | -0.0326 | 1.38 | 0.167 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | -0.485 | -0.00615 | -2.61 | 0.00907 | 0.0573 | 0.000735 | -2.64 | 0.00818 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_car | -0.323 | -0.00777 | -0.492 | 0.623 | -0.00254 | -0.000649 | -0.532 | 0.595 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 4.18 | 0.0422 | -1.73 | 0.0829 | 8.41 | 0.0807 | -1.74 | 0.0824 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 5.07 | 0.0654 | -2.14 | 0.032 | 5.98 | 0.0783 | -2.18 | 0.029 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_car | -0.351 | -0.00776 | -0.494 | 0.621 | -0.0498 | -0.0125 | -0.539 | 0.59 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 3.42 | 0.0401 | -2.32 | 0.0204 | 3.29 | 0.0395 | -2.35 | 0.0188 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 0.44 | 0.0148 | -2.18 | 0.0296 | 1.9 | 0.061 | -2.23 | 0.0258 |
b_non_work_dad_kid_ace | b_log_density_kid_car | 0.0482 | 0.00773 | -0.431 | 0.667 | 0.0311 | 0.0349 | -0.439 | 0.661 |
b_non_work_dad_kid_ace | b_log_density_par_act | -2.14 | -0.0448 | -2.47 | 0.0133 | -2.82 | -0.0506 | -2.43 | 0.0151 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | -0.123 | -0.00187 | 12.7 | 0 | -0.0452 | -0.00068 | 12.8 | 0 |
b_non_work_dad_kid_ace | b_log_distance_kid_car | 0.109 | 0.00766 | -0.414 | 0.679 | 0.0556 | 0.0198 | -0.424 | 0.672 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -0.074 | -0.00106 | 12.5 | 0 | 1.13 | 0.0158 | 12.6 | 0 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 6.68 | 0.155 | -0.192 | 0.847 | 6.95 | 0.165 | -0.196 | 0.844 |
b_non_work_dad_kid_ace | b_log_income_k_kid_car | 0.0249 | 0.00717 | -0.437 | 0.662 | -0.00506 | -0.00312 | -0.445 | 0.656 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 5.95 | 0.13 | -0.214 | 0.831 | 5.53 | 0.123 | -0.217 | 0.828 |
b_non_work_dad_kid_car | asc_kid_act | 0.000557 | 0.00161 | 4.75 | 1.99e-06 | -0.00422 | -0.0264 | 8.1 | 4.44e-16 |
b_non_work_dad_kid_car | asc_kid_car | 0.219 | 0.896 | -0.184 | 0.854 | -0.000197 | -0.0232 | -0.308 | 0.758 |
b_non_work_dad_kid_car | asc_par_act | -0.000324 | -0.000885 | 4.57 | 4.96e-06 | -0.00378 | -0.0222 | 7.62 | 2.53e-14 |
b_non_work_dad_kid_car | b_age_kid_act | -0.114 | -0.06 | -8.15 | 4.44e-16 | 0.0113 | 0.0119 | -7.93 | 2.22e-15 |
b_non_work_dad_kid_car | b_age_kid_car | -0.794 | -0.899 | -0.223 | 0.824 | -0.00281 | -0.084 | -0.992 | 0.321 |
b_non_work_dad_kid_car | b_age_par_act | 0.0189 | 0.00276 | -0.808 | 0.419 | 0.0202 | 0.00542 | -0.659 | 0.51 |
b_non_work_dad_kid_car | b_female_kid_act | 0.132 | 0.0216 | 4.18 | 2.9e-05 | 7.64e-05 | 2.82e-05 | 4.18 | 2.86e-05 |
b_non_work_dad_kid_car | b_female_kid_car | 1.07 | 0.886 | 0.17 | 0.865 | 0.00258 | 0.0284 | 0.259 | 0.796 |
b_non_work_dad_kid_car | b_female_par_act | 0.0774 | 0.011 | 2.98 | 0.00287 | -0.00311 | -0.000968 | 2.88 | 0.00397 |
b_non_work_dad_kid_car | b_has_big_sib_kid_act | -0.376 | -0.0577 | -4.01 | 6.03e-05 | 0.0267 | 0.00924 | -4.04 | 5.28e-05 |
b_non_work_dad_kid_car | b_has_big_sib_kid_car | -3.08 | -0.897 | -0.227 | 0.821 | -0.00119 | -0.00818 | -1.95 | 0.0517 |
b_non_work_dad_kid_car | b_has_big_sib_par_act | -0.276 | -0.0337 | -2.11 | 0.0346 | 0.0279 | 0.00724 | -1.99 | 0.0464 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_act | -0.377 | -0.0589 | -3.09 | 0.00201 | -0.0154 | -0.00545 | -3.12 | 0.00179 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_car | -3.35 | -0.895 | -0.227 | 0.821 | 0.0109 | 0.0738 | -2.16 | 0.0306 |
b_non_work_dad_kid_car | b_has_lil_sib_par_act | -0.404 | -0.0573 | -3.25 | 0.00115 | -0.0136 | -0.00439 | -3.3 | 0.000967 |
b_non_work_dad_kid_car | b_log_density_kid_act | 0.0674 | 0.0274 | -6.87 | 6.54e-12 | 0.0375 | 0.0324 | -6.7 | 2.06e-11 |
b_non_work_dad_kid_car | b_log_density_kid_car | 0.459 | 0.89 | -0.117 | 0.907 | -0.00333 | -0.101 | -0.132 | 0.895 |
b_non_work_dad_kid_car | b_log_density_par_act | 0.0118 | 0.003 | -5.54 | 2.98e-08 | 0.0308 | 0.0149 | -4.73 | 2.21e-06 |
b_non_work_dad_kid_car | b_log_distance_kid_act | 0.128 | 0.0236 | 26.7 | 0 | 0.0399 | 0.0162 | 26.1 | 0 |
b_non_work_dad_kid_car | b_log_distance_kid_car | 1.04 | 0.885 | 0.164 | 0.87 | 0.000975 | 0.00936 | 0.23 | 0.818 |
b_non_work_dad_kid_car | b_log_distance_par_act | 0.127 | 0.0221 | 25 | 0 | 0.0458 | 0.0173 | 24.1 | 0 |
b_non_work_dad_kid_car | b_log_income_k_kid_act | 0.0383 | 0.0108 | 0.622 | 0.534 | 0.00729 | 0.00467 | 0.635 | 0.525 |
b_non_work_dad_kid_car | b_log_income_k_kid_car | 0.237 | 0.826 | -0.182 | 0.855 | 0.011 | 0.183 | -0.302 | 0.763 |
b_non_work_dad_kid_car | b_log_income_k_par_act | 0.0268 | 0.00707 | 0.521 | 0.602 | -0.00184 | -0.0011 | 0.532 | 0.595 |
b_non_work_dad_kid_car | b_non_work_dad_kid_ace | 0.0848 | 0.00871 | 0.425 | 0.671 | 0.00795 | 0.00188 | 0.434 | 0.665 |
b_non_work_dad_par_act | asc_kid_act | -0.601 | -0.132 | 0.179 | 0.858 | -0.9 | -0.188 | 0.177 | 0.859 |
b_non_work_dad_par_act | asc_kid_car | 0.00942 | 0.00292 | -0.224 | 0.823 | -0.0123 | -0.0483 | -0.223 | 0.823 |
b_non_work_dad_par_act | asc_par_act | -0.528 | -0.11 | 0.167 | 0.868 | -0.694 | -0.136 | 0.166 | 0.868 |
b_non_work_dad_par_act | b_age_kid_act | 1.71 | 0.0682 | -1.83 | 0.0668 | 4.74 | 0.167 | -1.86 | 0.0632 |
b_non_work_dad_par_act | b_age_kid_car | -0.0343 | -0.00295 | -0.248 | 0.804 | 0.0482 | 0.0481 | -0.248 | 0.805 |
b_non_work_dad_par_act | b_age_par_act | -15.4 | -0.171 | -0.578 | 0.563 | -30.1 | -0.269 | -0.514 | 0.607 |
b_non_work_dad_par_act | b_female_kid_act | -0.26 | -0.00323 | 1.92 | 0.0551 | -2.36 | -0.029 | 1.89 | 0.0588 |
b_non_work_dad_par_act | b_female_kid_car | 0.0461 | 0.00291 | -0.203 | 0.839 | -0.0581 | -0.0214 | -0.203 | 0.839 |
b_non_work_dad_par_act | b_female_par_act | 7.27 | 0.0787 | 1.54 | 0.125 | 13.1 | 0.136 | 1.56 | 0.119 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 3.36 | 0.0392 | -2.36 | 0.0184 | 7.69 | 0.0889 | -2.4 | 0.0163 |
b_non_work_dad_par_act | b_has_big_sib_kid_car | -0.133 | -0.00293 | -0.288 | 0.773 | 0.152 | 0.0351 | -0.302 | 0.763 |
b_non_work_dad_par_act | b_has_big_sib_par_act | -9.5 | -0.0882 | -1.41 | 0.157 | -17.8 | -0.154 | -1.33 | 0.182 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 3.71 | 0.044 | -1.84 | 0.0654 | 2.63 | 0.031 | -1.82 | 0.068 |
b_non_work_dad_par_act | b_has_lil_sib_kid_car | -0.144 | -0.00293 | -0.292 | 0.77 | 0.129 | 0.0293 | -0.309 | 0.758 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 7.84 | 0.0846 | -2.09 | 0.037 | 11.8 | 0.128 | -2.13 | 0.0334 |
b_non_work_dad_par_act | b_log_density_kid_act | -0.819 | -0.0253 | -1.82 | 0.0688 | -0.739 | -0.0214 | -1.81 | 0.0706 |
b_non_work_dad_par_act | b_log_density_kid_car | 0.0198 | 0.00292 | -0.218 | 0.827 | 0.00361 | 0.00365 | -0.218 | 0.828 |
b_non_work_dad_par_act | b_log_density_par_act | 5.83 | 0.113 | -2.25 | 0.0241 | 12.8 | 0.206 | -2.29 | 0.022 |
b_non_work_dad_par_act | b_log_distance_kid_act | -0.787 | -0.011 | 12 | 0 | -0.0174 | -0.000236 | 12 | 0 |
b_non_work_dad_par_act | b_log_distance_kid_car | 0.0446 | 0.00289 | -0.203 | 0.839 | -0.0016 | -0.000513 | -0.204 | 0.839 |
b_non_work_dad_par_act | b_log_distance_par_act | -1.44 | -0.019 | 11.8 | 0 | -0.692 | -0.0087 | 11.7 | 0 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 5.97 | 0.128 | -0.000462 | 1 | 5.16 | 0.11 | -0.000458 | 1 |
b_non_work_dad_par_act | b_log_income_k_kid_car | 0.0108 | 0.00285 | -0.224 | 0.823 | -0.0196 | -0.0109 | -0.223 | 0.824 |
b_non_work_dad_par_act | b_log_income_k_par_act | 7.9 | 0.158 | -0.0231 | 0.982 | 10.3 | 0.206 | -0.0234 | 0.981 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 111 | 0.863 | 0.351 | 0.726 | 104 | 0.825 | 0.312 | 0.755 |
b_non_work_dad_par_act | b_non_work_dad_kid_car | 0.0443 | 0.00419 | -0.213 | 0.831 | -0.00459 | -0.000979 | -0.213 | 0.831 |
b_non_work_mom_kid_act | asc_kid_act | -0.187 | -0.0646 | 0.0168 | 0.987 | -0.00117 | -0.000383 | 0.0166 | 0.987 |
b_non_work_mom_kid_act | asc_kid_car | 0.15 | 0.0734 | -0.621 | 0.534 | 0.00357 | 0.022 | -0.613 | 0.54 |
b_non_work_mom_kid_act | asc_par_act | -0.267 | -0.0874 | -0.00187 | 0.999 | -0.0657 | -0.0202 | -0.00186 | 0.999 |
b_non_work_mom_kid_act | b_age_kid_act | -1.75 | -0.11 | -2.97 | 0.00303 | -3.47 | -0.192 | -2.84 | 0.00455 |
b_non_work_mom_kid_act | b_age_kid_car | -0.541 | -0.0734 | -0.647 | 0.518 | -0.013 | -0.0203 | -0.651 | 0.515 |
b_non_work_mom_kid_act | b_age_par_act | 14.5 | 0.253 | -1.16 | 0.246 | 22.6 | 0.316 | -1.07 | 0.285 |
b_non_work_mom_kid_act | b_female_kid_act | 0.413 | 0.00808 | 2.4 | 0.0164 | -0.31 | -0.00599 | 2.36 | 0.0181 |
b_non_work_mom_kid_act | b_female_kid_car | 0.726 | 0.0724 | -0.586 | 0.558 | 0.0123 | 0.0071 | -0.582 | 0.561 |
b_non_work_mom_kid_act | b_female_par_act | -6.13 | -0.105 | 1.67 | 0.0959 | -10.3 | -0.168 | 1.58 | 0.114 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -3.18 | -0.0585 | -3.18 | 0.00149 | -3.49 | -0.0633 | -3.14 | 0.00167 |
b_non_work_mom_kid_act | b_has_big_sib_kid_car | -2.1 | -0.0733 | -0.644 | 0.52 | -0.0559 | -0.0202 | -0.735 | 0.462 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | 8.54 | 0.125 | -2.17 | 0.0301 | 15.4 | 0.209 | -2.17 | 0.0297 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -3.03 | -0.0568 | -2.53 | 0.0114 | -1.01 | -0.0187 | -2.56 | 0.0104 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_car | -2.29 | -0.0734 | -0.64 | 0.522 | -0.0456 | -0.0162 | -0.745 | 0.456 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | -6.74 | -0.115 | -2.65 | 0.00798 | -6.58 | -0.111 | -2.65 | 0.00809 |
b_non_work_mom_kid_act | b_log_density_kid_act | -0.2 | -0.00975 | -3.02 | 0.00249 | 0.149 | 0.00678 | -2.99 | 0.00281 |
b_non_work_mom_kid_act | b_log_density_kid_car | 0.312 | 0.0726 | -0.613 | 0.54 | 0.00846 | 0.0134 | -0.604 | 0.546 |
b_non_work_mom_kid_act | b_log_density_par_act | -6.9 | -0.21 | -3.11 | 0.00188 | -11.2 | -0.283 | -2.83 | 0.00459 |
b_non_work_mom_kid_act | b_log_distance_kid_act | 1.41 | 0.0311 | 16.7 | 0 | 1.93 | 0.0409 | 16.5 | 0 |
b_non_work_mom_kid_act | b_log_distance_kid_car | 0.71 | 0.0725 | -0.588 | 0.557 | 0.015 | 0.00753 | -0.583 | 0.56 |
b_non_work_mom_kid_act | b_log_distance_par_act | 1.44 | 0.03 | 16.2 | 0 | 3.13 | 0.0617 | 16.1 | 0 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 5.86 | 0.198 | -0.258 | 0.796 | 5.19 | 0.174 | -0.253 | 0.8 |
b_non_work_mom_kid_act | b_log_income_k_kid_car | 0.156 | 0.0653 | -0.621 | 0.535 | 0.0152 | 0.0132 | -0.613 | 0.54 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 4.2 | 0.133 | -0.28 | 0.779 | 1.63 | 0.0513 | -0.268 | 0.789 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -1.62 | -0.0199 | 0.00847 | 0.993 | 2.59 | 0.0321 | 0.00875 | 0.993 |
b_non_work_mom_kid_act | b_non_work_dad_kid_car | 0.442 | 0.066 | -0.604 | 0.546 | 0.0268 | 0.00895 | -0.597 | 0.551 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -6.4 | -0.0726 | -0.138 | 0.89 | -6.03 | -0.0673 | -0.138 | 0.891 |
b_non_work_mom_kid_car | asc_kid_act | 0.00366 | 0.00198 | 0.78 | 0.435 | 0.0052 | 0.0317 | 6.63 | 3.34e-11 |
b_non_work_mom_kid_car | asc_kid_car | 1.3 | 0.997 | -0.227 | 0.82 | 0.00512 | 0.587 | -2.6 | 0.00938 |
b_non_work_mom_kid_car | asc_par_act | -0.00156 | -0.000801 | 0.751 | 0.453 | 0.00418 | 0.0239 | 6.16 | 7.33e-10 |
b_non_work_mom_kid_car | b_age_kid_act | -0.675 | -0.0665 | -3.75 | 0.000175 | -0.0868 | -0.0892 | -8.16 | 4.44e-16 |
b_non_work_mom_kid_car | b_age_kid_car | -4.69 | -0.997 | -0.227 | 0.82 | -0.0185 | -0.539 | -2.86 | 0.00418 |
b_non_work_mom_kid_car | b_age_par_act | 0.112 | 0.00306 | -0.791 | 0.429 | 0.407 | 0.106 | -0.758 | 0.448 |
b_non_work_mom_kid_car | b_female_kid_act | 0.78 | 0.0239 | 3.38 | 0.000737 | 0.0927 | 0.0333 | 4.06 | 4.9e-05 |
b_non_work_mom_kid_car | b_female_kid_car | 6.3 | 0.983 | -0.226 | 0.821 | 0.011 | 0.118 | -1.77 | 0.076 |
b_non_work_mom_kid_car | b_female_par_act | 0.457 | 0.0122 | 2.47 | 0.0134 | -0.106 | -0.032 | 2.77 | 0.00569 |
b_non_work_mom_kid_car | b_has_big_sib_kid_act | -2.23 | -0.0642 | -3.41 | 0.000661 | -0.066 | -0.0223 | -4.16 | 3.2e-05 |
b_non_work_mom_kid_car | b_has_big_sib_kid_car | -18.2 | -0.997 | -0.227 | 0.82 | -0.0832 | -0.559 | -2.87 | 0.00417 |
b_non_work_mom_kid_car | b_has_big_sib_par_act | -1.63 | -0.0375 | -1.95 | 0.0517 | 0.264 | 0.0667 | -2.09 | 0.0367 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_act | -2.24 | -0.0656 | -2.63 | 0.00847 | 0.0919 | 0.0316 | -3.26 | 0.00113 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_car | -19.9 | -0.997 | -0.227 | 0.82 | -0.0929 | -0.613 | -2.9 | 0.00368 |
b_non_work_mom_kid_car | b_has_lil_sib_par_act | -2.39 | -0.0638 | -2.83 | 0.00462 | -0.0153 | -0.00483 | -3.41 | 0.000639 |
b_non_work_mom_kid_car | b_log_density_kid_act | 0.398 | 0.0304 | -3.78 | 0.000156 | 0.0386 | 0.0326 | -7.01 | 2.44e-12 |
b_non_work_mom_kid_car | b_log_density_kid_car | 2.71 | 0.987 | -0.227 | 0.82 | 0.00535 | 0.158 | -2.38 | 0.0173 |
b_non_work_mom_kid_car | b_log_density_par_act | 0.0693 | 0.00331 | -3.97 | 7.19e-05 | -0.174 | -0.0817 | -4.87 | 1.12e-06 |
b_non_work_mom_kid_car | b_log_distance_kid_act | 0.76 | 0.0263 | 21.3 | 0 | 0.0519 | 0.0205 | 25.9 | 0 |
b_non_work_mom_kid_car | b_log_distance_kid_car | 6.15 | 0.984 | -0.227 | 0.821 | 0.0478 | 0.447 | -2.13 | 0.0333 |
b_non_work_mom_kid_car | b_log_distance_par_act | 0.755 | 0.0246 | 20.3 | 0 | 0.0962 | 0.0353 | 24 | 0 |
b_non_work_mom_kid_car | b_log_income_k_kid_act | 0.222 | 0.0117 | 0.262 | 0.793 | 0.0728 | 0.0454 | 0.409 | 0.682 |
b_non_work_mom_kid_car | b_log_income_k_kid_car | 1.36 | 0.887 | -0.227 | 0.82 | 0.0124 | 0.2 | -2.53 | 0.0115 |
b_non_work_mom_kid_car | b_log_income_k_par_act | 0.154 | 0.00762 | 0.212 | 0.832 | -0.0177 | -0.0103 | 0.318 | 0.75 |
b_non_work_mom_kid_car | b_non_work_dad_kid_ace | 0.403 | 0.00777 | 0.315 | 0.753 | 0.0645 | 0.0149 | 0.349 | 0.727 |
b_non_work_mom_kid_car | b_non_work_dad_kid_car | 3.84 | 0.896 | -0.226 | 0.821 | -0.0048 | -0.0299 | -1.57 | 0.117 |
b_non_work_mom_kid_car | b_non_work_dad_par_act | 0.165 | 0.00293 | 0.128 | 0.899 | -0.14 | -0.029 | 0.137 | 0.891 |
b_non_work_mom_kid_car | b_non_work_mom_kid_act | 2.63 | 0.0736 | 0.421 | 0.673 | 0.0842 | 0.0274 | 0.478 | 0.633 |
b_non_work_mom_par_act | asc_kid_act | -1.22 | -0.295 | 1.19 | 0.233 | -1.6 | -0.324 | 1.04 | 0.297 |
b_non_work_mom_par_act | asc_kid_car | 0.102 | 0.0349 | 0.762 | 0.446 | -0.0269 | -0.102 | 0.666 | 0.506 |
b_non_work_mom_par_act | asc_par_act | -0.928 | -0.212 | 1.18 | 0.237 | -1.24 | -0.236 | 1.03 | 0.301 |
b_non_work_mom_par_act | b_age_kid_act | 10.7 | 0.473 | -1.11 | 0.268 | 17.2 | 0.588 | -0.994 | 0.32 |
b_non_work_mom_par_act | b_age_kid_car | -0.367 | -0.0348 | 0.73 | 0.466 | 0.102 | 0.0987 | 0.643 | 0.52 |
b_non_work_mom_par_act | b_age_par_act | -53.5 | -0.654 | 0.122 | 0.903 | -87 | -0.754 | 0.1 | 0.92 |
b_non_work_mom_par_act | b_female_kid_act | -6.52 | -0.0894 | 2.8 | 0.00506 | -11.6 | -0.138 | 2.49 | 0.0126 |
b_non_work_mom_par_act | b_female_kid_car | 0.492 | 0.0344 | 0.781 | 0.435 | -0.15 | -0.0534 | 0.685 | 0.494 |
b_non_work_mom_par_act | b_female_par_act | 18.9 | 0.226 | 2.7 | 0.00687 | 32.8 | 0.33 | 2.59 | 0.00962 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | 9.79 | 0.126 | -1.75 | 0.0797 | 17.1 | 0.192 | -1.64 | 0.101 |
b_non_work_mom_par_act | b_has_big_sib_kid_car | -1.43 | -0.0348 | 0.628 | 0.53 | 0.365 | 0.0815 | 0.591 | 0.555 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -36.7 | -0.375 | -0.68 | 0.497 | -56.4 | -0.472 | -0.592 | 0.554 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -7.08 | -0.0928 | -1.05 | 0.292 | -10.3 | -0.118 | -0.949 | 0.343 |
b_non_work_mom_par_act | b_has_lil_sib_kid_car | -1.55 | -0.0349 | 0.615 | 0.539 | 0.44 | 0.0964 | 0.585 | 0.559 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | 6.89 | 0.082 | -1.38 | 0.167 | 12.4 | 0.129 | -1.29 | 0.197 |
b_non_work_mom_par_act | b_log_density_kid_act | -4.59 | -0.157 | -0.994 | 0.32 | -7.65 | -0.214 | -0.864 | 0.388 |
b_non_work_mom_par_act | b_log_density_kid_car | 0.212 | 0.0345 | 0.768 | 0.442 | -0.0649 | -0.0635 | 0.671 | 0.502 |
b_non_work_mom_par_act | b_log_density_par_act | 21.9 | 0.467 | -1.74 | 0.081 | 35.6 | 0.556 | -1.61 | 0.108 |
b_non_work_mom_par_act | b_log_distance_kid_act | -0.802 | -0.0124 | 13.8 | 0 | 0.0228 | 0.000299 | 12.5 | 0 |
b_non_work_mom_par_act | b_log_distance_kid_car | 0.482 | 0.0344 | 0.781 | 0.435 | -0.131 | -0.0408 | 0.684 | 0.494 |
b_non_work_mom_par_act | b_log_distance_par_act | -1.76 | -0.0257 | 13.5 | 0 | -5.42 | -0.0661 | 11.9 | 0 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 3.76 | 0.0889 | 0.975 | 0.33 | 0.452 | 0.00937 | 0.842 | 0.4 |
b_non_work_mom_par_act | b_log_income_k_kid_car | 0.106 | 0.031 | 0.762 | 0.446 | -0.026 | -0.014 | 0.666 | 0.505 |
b_non_work_mom_par_act | b_log_income_k_par_act | 10.5 | 0.231 | 0.997 | 0.319 | 14.7 | 0.285 | 0.895 | 0.371 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -8.08 | -0.0696 | 0.818 | 0.413 | -8.3 | -0.0636 | 0.771 | 0.441 |
b_non_work_mom_par_act | b_non_work_dad_kid_car | 0.3 | 0.0313 | 0.773 | 0.44 | 0.00954 | 0.00197 | 0.676 | 0.499 |
b_non_work_mom_par_act | b_non_work_dad_par_act | 10.6 | 0.0839 | 0.708 | 0.479 | 31.5 | 0.218 | 0.716 | 0.474 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 36.3 | 0.454 | 1.29 | 0.196 | 26.6 | 0.288 | 1.03 | 0.302 |
b_non_work_mom_par_act | b_non_work_mom_kid_car | 1.79 | 0.035 | 0.793 | 0.428 | -0.48 | -0.0966 | 0.747 | 0.455 |
b_veh_per_driver_kid_act | asc_kid_act | -0.757 | -0.239 | -3 | 0.00274 | -0.969 | -0.271 | -2.76 | 0.00573 |
b_veh_per_driver_kid_act | asc_kid_car | -0.0977 | -0.0438 | -3.61 | 0.000308 | -0.0145 | -0.0764 | -3.34 | 0.000845 |
b_veh_per_driver_kid_act | asc_par_act | -0.629 | -0.188 | -3.02 | 0.00255 | -0.855 | -0.225 | -2.78 | 0.0054 |
b_veh_per_driver_kid_act | b_age_kid_act | 2.21 | 0.128 | -5.95 | 2.71e-09 | 4.35 | 0.205 | -5.6 | 2.12e-08 |
b_veh_per_driver_kid_act | b_age_kid_car | 0.353 | 0.0438 | -3.64 | 0.000269 | 0.0549 | 0.0734 | -3.37 | 0.000744 |
b_veh_per_driver_kid_act | b_age_par_act | -15.5 | -0.248 | -2.85 | 0.00438 | -24.6 | -0.294 | -2.42 | 0.0154 |
b_veh_per_driver_kid_act | b_female_kid_act | -0.501 | -0.00899 | -0.0653 | 0.948 | -2.08 | -0.0343 | -0.0614 | 0.951 |
b_veh_per_driver_kid_act | b_female_kid_car | -0.473 | -0.0432 | -3.52 | 0.000439 | -0.0401 | -0.0198 | -3.31 | 0.000938 |
b_veh_per_driver_kid_act | b_female_par_act | 6.66 | 0.104 | -0.556 | 0.578 | 9.85 | 0.137 | -0.533 | 0.594 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 3.8 | 0.0642 | -5.58 | 2.45e-08 | 4.13 | 0.064 | -5.31 | 1.1e-07 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_car | 1.37 | 0.0438 | -3.44 | 0.000591 | 0.215 | 0.0663 | -3.45 | 0.00056 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | -9.07 | -0.122 | -3.77 | 0.000165 | -15.7 | -0.182 | -3.41 | 0.000643 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | -1.41 | -0.0243 | -4.72 | 2.37e-06 | -4.02 | -0.0636 | -4.42 | 9.99e-06 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_car | 1.49 | 0.0438 | -3.39 | 0.000696 | 0.225 | 0.0682 | -3.46 | 0.000542 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | 2.84 | 0.0443 | -4.99 | 6.05e-07 | 3.26 | 0.0471 | -4.79 | 1.64e-06 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 0.436 | 0.0195 | -5.73 | 1.01e-08 | -0.374 | -0.0145 | -5.24 | 1.57e-07 |
b_veh_per_driver_kid_act | b_log_density_kid_car | -0.204 | -0.0433 | -3.59 | 0.000333 | -0.0318 | -0.043 | -3.33 | 0.000871 |
b_veh_per_driver_kid_act | b_log_density_par_act | 7.73 | 0.216 | -6.46 | 1.06e-10 | 12 | 0.258 | -6 | 2e-09 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 0.647 | 0.0131 | 13.2 | 0 | 0.816 | 0.0148 | 12.4 | 0 |
b_veh_per_driver_kid_act | b_log_distance_kid_car | -0.462 | -0.0433 | -3.52 | 0.000433 | -0.022 | -0.00942 | -3.31 | 0.000934 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 0.57 | 0.0109 | 12.8 | 0 | -0.601 | -0.0101 | 11.9 | 0 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -5.55 | -0.172 | -2.78 | 0.00541 | -6.7 | -0.192 | -2.6 | 0.00941 |
b_veh_per_driver_kid_act | b_log_income_k_kid_car | -0.102 | -0.0389 | -3.61 | 0.000309 | 0.000136 | 0.000101 | -3.34 | 0.000845 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -3.82 | -0.111 | -2.83 | 0.00468 | -2.84 | -0.0761 | -2.69 | 0.00707 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 2.86 | 0.0322 | -1.85 | 0.0639 | 0.322 | 0.00342 | -1.79 | 0.0733 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_car | -0.288 | -0.0393 | -3.56 | 0.000365 | -0.0148 | -0.00422 | -3.32 | 0.000898 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 7.97 | 0.0827 | -1.95 | 0.0511 | 8.74 | 0.0834 | -1.9 | 0.058 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | -2.22 | -0.0364 | -2.21 | 0.0272 | -2.66 | -0.0398 | -2.1 | 0.0359 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_car | -1.71 | -0.0438 | -2.96 | 0.0031 | -0.282 | -0.0786 | -3.21 | 0.00134 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | 16.2 | 0.186 | -3.09 | 0.002 | 28.3 | 0.261 | -2.88 | 0.00399 |
b_veh_per_driver_kid_car | asc_kid_act | -0.00201 | -0.00208 | 2.14 | 0.0327 | -0.00251 | -0.0311 | 11.8 | 0 |
b_veh_per_driver_kid_car | asc_kid_car | -0.678 | -0.996 | 0.228 | 0.82 | -0.000664 | -0.155 | 3.09 | 0.00204 |
b_veh_per_driver_kid_car | asc_par_act | 0.000716 | 0.000702 | 2.08 | 0.0377 | -0.00205 | -0.0239 | 11 | 0 |
b_veh_per_driver_kid_car | b_age_kid_act | 0.352 | 0.0664 | -5.82 | 5.77e-09 | 0.0447 | 0.0936 | -7.74 | 9.77e-15 |
b_veh_per_driver_kid_car | b_age_kid_car | 2.45 | 0.995 | 0.226 | 0.821 | -0.00124 | -0.0736 | 1.54 | 0.123 |
b_veh_per_driver_kid_car | b_age_par_act | -0.0587 | -0.00307 | -0.679 | 0.497 | -0.197 | -0.105 | -0.579 | 0.563 |
b_veh_per_driver_kid_car | b_female_kid_act | -0.407 | -0.0239 | 4.02 | 5.77e-05 | -0.0304 | -0.0222 | 4.3 | 1.74e-05 |
b_veh_per_driver_kid_car | b_female_kid_car | -3.28 | -0.981 | 0.227 | 0.82 | 0.00245 | 0.0536 | 2.94 | 0.00332 |
b_veh_per_driver_kid_car | b_female_par_act | -0.238 | -0.0122 | 2.94 | 0.00332 | 0.0666 | 0.041 | 2.98 | 0.0029 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_act | 1.16 | 0.0641 | -3.83 | 0.000129 | 0.0331 | 0.0227 | -3.94 | 7.99e-05 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_car | 9.5 | 0.995 | -0.22 | 0.826 | 0.00516 | 0.0706 | -0.746 | 0.456 |
b_veh_per_driver_kid_car | b_has_big_sib_par_act | 0.852 | 0.0374 | -1.99 | 0.0461 | -0.129 | -0.0664 | -1.91 | 0.0557 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_act | 1.17 | 0.0655 | -2.92 | 0.00349 | -0.0444 | -0.0311 | -3.02 | 0.00253 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_car | 10.3 | 0.995 | -0.223 | 0.824 | 0.00341 | 0.0457 | -0.916 | 0.36 |
b_veh_per_driver_kid_car | b_has_lil_sib_par_act | 1.25 | 0.0637 | -3.1 | 0.00191 | 0.00678 | 0.00434 | -3.21 | 0.00134 |
b_veh_per_driver_kid_car | b_log_density_kid_act | -0.208 | -0.0303 | -5.02 | 5.11e-07 | -0.0203 | -0.0348 | -6.45 | 1.15e-10 |
b_veh_per_driver_kid_car | b_log_density_kid_car | -1.41 | -0.985 | 0.228 | 0.82 | 0.00288 | 0.173 | 3.44 | 0.00058 |
b_veh_per_driver_kid_car | b_log_density_par_act | -0.0359 | -0.00328 | -4.76 | 1.95e-06 | 0.0838 | 0.0802 | -4.61 | 4.06e-06 |
b_veh_per_driver_kid_car | b_log_distance_kid_act | -0.396 | -0.0263 | 24.8 | 0 | -0.00857 | -0.00689 | 26.2 | 0 |
b_veh_per_driver_kid_car | b_log_distance_kid_car | -3.21 | -0.982 | 0.227 | 0.82 | -0.0136 | -0.259 | 2.33 | 0.0199 |
b_veh_per_driver_kid_car | b_log_distance_par_act | -0.394 | -0.0246 | 23.4 | 0 | -0.0312 | -0.0233 | 24.2 | 0 |
b_veh_per_driver_kid_car | b_log_income_k_kid_act | -0.115 | -0.0117 | 0.695 | 0.487 | -0.015 | -0.0191 | 0.827 | 0.408 |
b_veh_per_driver_kid_car | b_log_income_k_kid_car | -0.705 | -0.882 | 0.227 | 0.82 | -0.00375 | -0.124 | 2.38 | 0.0173 |
b_veh_per_driver_kid_car | b_log_income_k_par_act | -0.08 | -0.00759 | 0.609 | 0.542 | 0.0305 | 0.0362 | 0.713 | 0.476 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_ace | -0.21 | -0.00775 | 0.482 | 0.63 | -0.0164 | -0.0077 | 0.504 | 0.614 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_car | -2 | -0.894 | 0.226 | 0.821 | 0.00735 | 0.0931 | 1.76 | 0.0779 |
b_veh_per_driver_kid_car | b_non_work_dad_par_act | -0.0859 | -0.00292 | 0.271 | 0.786 | 0.0857 | 0.0362 | 0.277 | 0.782 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_act | -1.37 | -0.0732 | 0.654 | 0.513 | -0.0354 | -0.0234 | 0.696 | 0.486 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_car | -11.9 | -0.995 | 0.228 | 0.82 | 0.00707 | 0.0872 | 3.79 | 0.000154 |
b_veh_per_driver_kid_car | b_non_work_mom_par_act | -0.927 | -0.0347 | -0.679 | 0.497 | 0.242 | 0.0993 | -0.615 | 0.538 |
b_veh_per_driver_kid_car | b_veh_per_driver_kid_act | 0.897 | 0.044 | 3.58 | 0.000349 | 0.0372 | 0.0211 | 3.41 | 0.000649 |
b_veh_per_driver_par_act | asc_kid_act | 0.675 | 0.129 | -3.02 | 0.00255 | 1.36 | 0.198 | -2.4 | 0.0165 |
b_veh_per_driver_par_act | asc_kid_car | -0.0344 | -0.00933 | -3.36 | 0.000783 | 0.0329 | 0.0898 | -2.67 | 0.00767 |
b_veh_per_driver_par_act | asc_par_act | 0.0164 | 0.00298 | -3.02 | 0.00256 | 0.544 | 0.0743 | -2.4 | 0.0165 |
b_veh_per_driver_par_act | b_age_kid_act | -14.6 | -0.509 | -4.38 | 1.17e-05 | -25.2 | -0.617 | -3.47 | 0.000529 |
b_veh_per_driver_par_act | b_age_kid_car | 0.123 | 0.00927 | -3.37 | 0.00074 | -0.122 | -0.0849 | -2.68 | 0.00733 |
b_veh_per_driver_par_act | b_age_par_act | 76.4 | 0.738 | -5.48 | 4.36e-08 | 133 | 0.825 | -4.82 | 1.4e-06 |
b_veh_per_driver_par_act | b_female_kid_act | 8.88 | 0.0963 | -1.14 | 0.254 | 15 | 0.129 | -0.946 | 0.344 |
b_veh_per_driver_par_act | b_female_kid_car | -0.166 | -0.00915 | -3.32 | 0.000891 | 0.209 | 0.0536 | -2.65 | 0.00797 |
b_veh_per_driver_par_act | b_female_par_act | -27.4 | -0.259 | -1.26 | 0.207 | -49.9 | -0.36 | -1.02 | 0.307 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | -13.7 | -0.14 | -4.62 | 3.91e-06 | -24 | -0.193 | -3.78 | 0.000155 |
b_veh_per_driver_par_act | b_has_big_sib_kid_car | 0.481 | 0.00929 | -3.31 | 0.000943 | -0.443 | -0.0711 | -2.72 | 0.00661 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | 51.5 | 0.417 | -5.07 | 3.97e-07 | 87.6 | 0.527 | -4.47 | 7.99e-06 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | 4.31 | 0.0447 | -4.51 | 6.43e-06 | 10.2 | 0.0834 | -3.78 | 0.000159 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_car | 0.524 | 0.00931 | -3.29 | 0.001 | -0.527 | -0.0829 | -2.72 | 0.00654 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -17.9 | -0.168 | -4.25 | 2.12e-05 | -25.4 | -0.191 | -3.55 | 0.000389 |
b_veh_per_driver_par_act | b_log_density_kid_act | 6.36 | 0.172 | -4.87 | 1.09e-06 | 10.4 | 0.21 | -3.9 | 9.78e-05 |
b_veh_per_driver_par_act | b_log_density_kid_car | -0.0712 | -0.00916 | -3.35 | 0.000806 | 0.0796 | 0.056 | -2.66 | 0.00776 |
b_veh_per_driver_par_act | b_log_density_par_act | -30.9 | -0.522 | -4.32 | 1.59e-05 | -55.5 | -0.623 | -3.39 | 0.000709 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 3.49 | 0.0427 | 8.06 | 6.66e-16 | 3.39 | 0.0319 | 6.54 | 6.17e-11 |
b_veh_per_driver_par_act | b_log_distance_kid_car | -0.163 | -0.0092 | -3.32 | 0.000886 | 0.207 | 0.0462 | -2.65 | 0.00796 |
b_veh_per_driver_par_act | b_log_distance_par_act | 4.52 | 0.0521 | 7.95 | 1.78e-15 | 10.5 | 0.0922 | 6.58 | 4.78e-11 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -2.83 | -0.0528 | -2.99 | 0.00275 | -0.00469 | -6.98e-05 | -2.45 | 0.0144 |
b_veh_per_driver_par_act | b_log_income_k_kid_car | -0.0357 | -0.00824 | -3.36 | 0.000785 | 0.0615 | 0.0237 | -2.67 | 0.00767 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -12.5 | -0.218 | -2.87 | 0.00415 | -21.7 | -0.303 | -2.3 | 0.0217 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 11.4 | 0.0777 | -2.44 | 0.0147 | 14.6 | 0.0805 | -2.1 | 0.0357 |
b_veh_per_driver_par_act | b_non_work_dad_kid_car | -0.101 | -0.00831 | -3.34 | 0.000833 | 0.0277 | 0.00411 | -2.66 | 0.00786 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | -13.7 | -0.0859 | -2.29 | 0.0221 | -43.9 | -0.218 | -1.88 | 0.0604 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | 20.6 | 0.204 | -2.9 | 0.00371 | 37.1 | 0.288 | -2.47 | 0.0136 |
b_veh_per_driver_par_act | b_non_work_mom_kid_car | -0.599 | -0.00928 | -3.09 | 0.00202 | 0.587 | 0.0847 | -2.61 | 0.00905 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | -73.8 | -0.511 | -2.54 | 0.0111 | -132 | -0.633 | -2.02 | 0.0435 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 39.6 | 0.359 | -1.22 | 0.223 | 31.7 | 0.211 | -0.909 | 0.363 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_car | 0.319 | 0.00946 | -3.36 | 0.000792 | -0.392 | -0.115 | -2.7 | 0.00696 |
b_y2017_kid_act | asc_kid_act | 0.524 | 0.132 | 1.62 | 0.106 | 0.933 | 0.195 | 1.4 | 0.162 |
b_y2017_kid_act | asc_kid_car | 0.0799 | 0.0286 | 1.14 | 0.252 | 0.0232 | 0.091 | 0.988 | 0.323 |
b_y2017_kid_act | asc_par_act | 0.0993 | 0.0237 | 1.6 | 0.111 | 0.539 | 0.106 | 1.38 | 0.167 |
b_y2017_kid_act | b_age_kid_act | -9.39 | -0.432 | -0.65 | 0.516 | -15.4 | -0.543 | -0.552 | 0.581 |
b_y2017_kid_act | b_age_kid_car | -0.289 | -0.0286 | 1.11 | 0.268 | -0.0971 | -0.0969 | 0.963 | 0.336 |
b_y2017_kid_act | b_age_par_act | 57.1 | 0.728 | 0.799 | 0.424 | 90.9 | 0.812 | 0.811 | 0.417 |
b_y2017_kid_act | b_female_kid_act | 6.13 | 0.0876 | 3.44 | 0.00059 | 9.08 | 0.112 | 3.11 | 0.00184 |
b_y2017_kid_act | b_female_kid_car | 0.387 | 0.0282 | 1.16 | 0.245 | 0.144 | 0.0529 | 1.01 | 0.313 |
b_y2017_kid_act | b_female_par_act | -20.8 | -0.259 | 2.45 | 0.0143 | -34.6 | -0.358 | 2.12 | 0.0336 |
b_y2017_kid_act | b_has_big_sib_kid_act | -7.32 | -0.0984 | -1.35 | 0.177 | -11.8 | -0.137 | -1.2 | 0.23 |
b_y2017_kid_act | b_has_big_sib_kid_car | -1.12 | -0.0286 | 0.977 | 0.328 | -0.347 | -0.0799 | 0.907 | 0.365 |
b_y2017_kid_act | b_has_big_sib_par_act | 40.8 | 0.436 | -0.737 | 0.461 | 62.7 | 0.542 | -0.724 | 0.469 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 9.44 | 0.129 | -0.901 | 0.367 | 13.6 | 0.16 | -0.822 | 0.411 |
b_y2017_kid_act | b_has_lil_sib_kid_car | -1.22 | -0.0285 | 0.959 | 0.338 | -0.329 | -0.0742 | 0.9 | 0.368 |
b_y2017_kid_act | b_has_lil_sib_par_act | -6.59 | -0.082 | -1.05 | 0.296 | -10.7 | -0.116 | -0.938 | 0.348 |
b_y2017_kid_act | b_log_density_kid_act | 3.16 | 0.113 | -0.758 | 0.448 | 5.79 | 0.167 | -0.665 | 0.506 |
b_y2017_kid_act | b_log_density_kid_car | 0.167 | 0.0283 | 1.15 | 0.25 | 0.066 | 0.0667 | 0.994 | 0.32 |
b_y2017_kid_act | b_log_density_par_act | -24.4 | -0.544 | -0.985 | 0.324 | -39.9 | -0.642 | -0.823 | 0.41 |
b_y2017_kid_act | b_log_distance_kid_act | -3.95 | -0.0637 | 14.3 | 0 | -3.36 | -0.0455 | 12.8 | 0 |
b_y2017_kid_act | b_log_distance_kid_car | 0.378 | 0.0282 | 1.16 | 0.246 | 0.0884 | 0.0283 | 1.01 | 0.314 |
b_y2017_kid_act | b_log_distance_par_act | -3.86 | -0.0587 | 14 | 0 | 1.71 | 0.0215 | 12.9 | 0 |
b_y2017_kid_act | b_log_income_k_kid_act | 1.21 | 0.0298 | 1.32 | 0.187 | 3.28 | 0.0701 | 1.17 | 0.241 |
b_y2017_kid_act | b_log_income_k_kid_car | 0.0833 | 0.0254 | 1.14 | 0.252 | 0.0415 | 0.023 | 0.988 | 0.323 |
b_y2017_kid_act | b_log_income_k_par_act | -4.18 | -0.0966 | 1.23 | 0.219 | -9.59 | -0.192 | 1.06 | 0.291 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 5.26 | 0.0473 | 1.13 | 0.258 | 9.17 | 0.0724 | 1.07 | 0.284 |
b_y2017_kid_act | b_non_work_dad_kid_car | 0.236 | 0.0257 | 1.15 | 0.248 | -5.84e-05 | -1.24e-05 | 0.997 | 0.319 |
b_y2017_kid_act | b_non_work_dad_par_act | -14.7 | -0.122 | 0.868 | 0.385 | -31.1 | -0.221 | 0.775 | 0.438 |
b_y2017_kid_act | b_non_work_mom_kid_act | 14.5 | 0.189 | 1.42 | 0.154 | 23.1 | 0.257 | 1.33 | 0.184 |
b_y2017_kid_act | b_non_work_mom_kid_car | 1.4 | 0.0286 | 1.14 | 0.254 | 0.396 | 0.0821 | 1.08 | 0.282 |
b_y2017_kid_act | b_non_work_mom_par_act | -54.7 | -0.5 | 0.197 | 0.844 | -90.7 | -0.625 | 0.164 | 0.869 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -14.9 | -0.178 | 2.91 | 0.00365 | -25 | -0.239 | 2.51 | 0.0119 |
b_y2017_kid_act | b_veh_per_driver_kid_car | -0.729 | -0.0285 | 1.04 | 0.296 | -0.222 | -0.0939 | 0.933 | 0.351 |
b_y2017_kid_act | b_veh_per_driver_par_act | 78 | 0.564 | 4.98 | 6.33e-07 | 139 | 0.687 | 4.62 | 3.93e-06 |
b_y2017_kid_car | asc_kid_act | 0.00105 | 0.00194 | 3.13 | 0.00176 | 0.00151 | 0.0141 | 9.4 | 0 |
b_y2017_kid_car | asc_kid_car | 0.373 | 0.983 | -0.222 | 0.824 | 0.00188 | 0.33 | -0.963 | 0.335 |
b_y2017_kid_car | asc_par_act | -0.000466 | -0.00082 | 3.02 | 0.00255 | 0.000914 | 0.00802 | 8.69 | 0 |
b_y2017_kid_car | b_age_kid_act | -0.194 | -0.0657 | -7.39 | 1.43e-13 | -0.0406 | -0.0641 | -7.97 | 1.55e-15 |
b_y2017_kid_car | b_age_kid_car | -1.35 | -0.983 | -0.226 | 0.821 | -0.00581 | -0.26 | -1.79 | 0.0727 |
b_y2017_kid_car | b_age_par_act | 0.0339 | 0.00319 | -0.817 | 0.414 | 0.14 | 0.0561 | -0.674 | 0.5 |
b_y2017_kid_car | b_female_kid_act | 0.224 | 0.0236 | 4.12 | 3.77e-05 | 0.0528 | 0.0291 | 4.17 | 2.99e-05 |
b_y2017_kid_car | b_female_kid_car | 1.81 | 0.971 | -0.0313 | 0.975 | 0.0043 | 0.0708 | -0.031 | 0.975 |
b_y2017_kid_car | b_female_par_act | 0.131 | 0.012 | 2.94 | 0.00327 | -0.0213 | -0.00987 | 2.87 | 0.00416 |
b_y2017_kid_car | b_has_big_sib_kid_act | -0.639 | -0.0633 | -3.97 | 7.22e-05 | -0.0444 | -0.023 | -4.06 | 4.95e-05 |
b_y2017_kid_car | b_has_big_sib_kid_car | -5.23 | -0.982 | -0.227 | 0.82 | -0.0275 | -0.283 | -2.32 | 0.0205 |
b_y2017_kid_car | b_has_big_sib_par_act | -0.468 | -0.0368 | -2.11 | 0.035 | 0.0804 | 0.0311 | -2.01 | 0.0447 |
b_y2017_kid_car | b_has_lil_sib_kid_act | -0.641 | -0.0646 | -3.06 | 0.00222 | 0.0766 | 0.0404 | -3.15 | 0.00164 |
b_y2017_kid_car | b_has_lil_sib_kid_car | -5.69 | -0.982 | -0.227 | 0.82 | -0.0338 | -0.342 | -2.39 | 0.0168 |
b_y2017_kid_car | b_has_lil_sib_par_act | -0.687 | -0.0629 | -3.22 | 0.00127 | 0.0371 | 0.0179 | -3.32 | 0.000896 |
b_y2017_kid_car | b_log_density_kid_act | 0.114 | 0.03 | -6.51 | 7.41e-11 | 0.0266 | 0.0344 | -6.77 | 1.28e-11 |
b_y2017_kid_car | b_log_density_kid_car | 0.778 | 0.973 | -0.216 | 0.829 | 0.00205 | 0.0928 | -0.672 | 0.502 |
b_y2017_kid_car | b_log_density_par_act | 0.0191 | 0.00313 | -5.42 | 5.89e-08 | -0.0506 | -0.0365 | -4.75 | 2.02e-06 |
b_y2017_kid_car | b_log_distance_kid_act | 0.218 | 0.0259 | 26.4 | 0 | -0.0031 | -0.00188 | 26.1 | 0 |
b_y2017_kid_car | b_log_distance_kid_car | 1.76 | 0.968 | -0.0533 | 0.957 | 0.0132 | 0.189 | -0.0555 | 0.956 |
b_y2017_kid_car | b_log_distance_par_act | 0.216 | 0.0242 | 24.7 | 0 | 0.00904 | 0.00509 | 24.1 | 0 |
b_y2017_kid_car | b_log_income_k_kid_act | 0.0636 | 0.0116 | 0.572 | 0.567 | 0.0247 | 0.0236 | 0.605 | 0.545 |
b_y2017_kid_car | b_log_income_k_kid_car | 0.389 | 0.873 | -0.22 | 0.826 | 0.00103 | 0.0256 | -0.817 | 0.414 |
b_y2017_kid_car | b_log_income_k_par_act | 0.044 | 0.00748 | 0.478 | 0.633 | -0.0041 | -0.00367 | 0.503 | 0.615 |
b_y2017_kid_car | b_non_work_dad_kid_ace | 0.116 | 0.00769 | 0.412 | 0.681 | 0.000783 | 0.000277 | 0.422 | 0.673 |
b_y2017_kid_car | b_non_work_dad_kid_car | 1.1 | 0.886 | -0.175 | 0.861 | 0.00397 | 0.0378 | -0.272 | 0.786 |
b_y2017_kid_car | b_non_work_dad_par_act | 0.0473 | 0.00288 | 0.202 | 0.84 | -0.0682 | -0.0217 | 0.202 | 0.84 |
b_y2017_kid_car | b_non_work_mom_kid_act | 0.753 | 0.0724 | 0.584 | 0.559 | -0.0106 | -0.00527 | 0.58 | 0.562 |
b_y2017_kid_car | b_non_work_mom_kid_car | 6.53 | 0.983 | 0.227 | 0.821 | 0.0373 | 0.346 | 1.93 | 0.0535 |
b_y2017_kid_car | b_non_work_mom_par_act | 0.509 | 0.0343 | -0.782 | 0.434 | -0.213 | -0.0658 | -0.685 | 0.493 |
b_y2017_kid_car | b_veh_per_driver_kid_act | -0.491 | -0.0432 | 3.51 | 0.000449 | -0.0976 | -0.0416 | 3.3 | 0.000951 |
b_y2017_kid_car | b_veh_per_driver_kid_car | -3.4 | -0.982 | -0.227 | 0.82 | -0.00397 | -0.0749 | -2.56 | 0.0105 |
b_y2017_kid_car | b_veh_per_driver_par_act | -0.17 | -0.00904 | 3.32 | 0.000897 | 0.205 | 0.0454 | 2.65 | 0.00798 |
b_y2017_kid_car | b_y2017_kid_act | 0.41 | 0.0288 | -1.16 | 0.245 | 0.172 | 0.0547 | -1.01 | 0.313 |
b_y2017_par_act | asc_kid_act | -5 | -0.313 | 2.09 | 0.037 | -7.37 | -0.357 | 1.68 | 0.0929 |
b_y2017_par_act | asc_kid_car | -0.164 | -0.0145 | 1.98 | 0.0481 | -0.123 | -0.112 | 1.59 | 0.111 |
b_y2017_par_act | asc_par_act | -2.97 | -0.176 | 2.08 | 0.0371 | -5.33 | -0.242 | 1.68 | 0.0932 |
b_y2017_par_act | b_age_kid_act | 56.2 | 0.643 | 1.56 | 0.118 | 89.9 | 0.735 | 1.26 | 0.207 |
b_y2017_par_act | b_age_kid_car | 0.592 | 0.0146 | 1.97 | 0.0489 | 0.456 | 0.105 | 1.59 | 0.113 |
b_y2017_par_act | b_age_par_act | -300 | -0.952 | 1.55 | 0.121 | -468 | -0.969 | 1.25 | 0.212 |
b_y2017_par_act | b_female_kid_act | -30.5 | -0.108 | 2.6 | 0.00945 | -51.4 | -0.147 | 2.1 | 0.0361 |
b_y2017_par_act | b_female_kid_car | -0.792 | -0.0144 | 1.98 | 0.0477 | -0.64 | -0.0546 | 1.6 | 0.11 |
b_y2017_par_act | b_female_par_act | 113 | 0.35 | 2.68 | 0.00731 | 182 | 0.437 | 2.18 | 0.0292 |
b_y2017_par_act | b_has_big_sib_kid_act | 60.9 | 0.204 | 1.29 | 0.198 | 89.8 | 0.241 | 1.04 | 0.297 |
b_y2017_par_act | b_has_big_sib_kid_car | 2.29 | 0.0145 | 1.95 | 0.0514 | 1.68 | 0.0896 | 1.57 | 0.115 |
b_y2017_par_act | b_has_big_sib_par_act | -196 | -0.521 | 1.33 | 0.183 | -304 | -0.609 | 1.08 | 0.281 |
b_y2017_par_act | b_has_lil_sib_kid_act | -12.9 | -0.0439 | 1.4 | 0.16 | -36.3 | -0.0992 | 1.13 | 0.259 |
b_y2017_par_act | b_has_lil_sib_kid_car | 2.49 | 0.0145 | 1.94 | 0.0518 | 2.02 | 0.106 | 1.57 | 0.116 |
b_y2017_par_act | b_has_lil_sib_par_act | 73.3 | 0.227 | 1.39 | 0.166 | 92.1 | 0.23 | 1.12 | 0.265 |
b_y2017_par_act | b_log_density_kid_act | -20.2 | -0.179 | 1.48 | 0.138 | -33 | -0.221 | 1.19 | 0.233 |
b_y2017_par_act | b_log_density_kid_car | -0.342 | -0.0144 | 1.98 | 0.048 | -0.288 | -0.0675 | 1.59 | 0.111 |
b_y2017_par_act | b_log_density_par_act | 128 | 0.711 | 1.49 | 0.137 | 203 | 0.759 | 1.2 | 0.23 |
b_y2017_par_act | b_log_distance_kid_act | -15.2 | -0.0612 | 5.81 | 6.08e-09 | -12.7 | -0.0398 | 4.72 | 2.4e-06 |
b_y2017_par_act | b_log_distance_kid_car | -0.774 | -0.0144 | 1.98 | 0.0477 | -0.636 | -0.0472 | 1.6 | 0.111 |
b_y2017_par_act | b_log_distance_par_act | -20.3 | -0.0766 | 5.77 | 7.9e-09 | -42.2 | -0.123 | 4.64 | 3.41e-06 |
b_y2017_par_act | b_log_income_k_kid_act | -7.97 | -0.0489 | 2.02 | 0.0432 | -18.9 | -0.0938 | 1.63 | 0.104 |
b_y2017_par_act | b_log_income_k_kid_car | -0.17 | -0.0129 | 1.98 | 0.0481 | -0.161 | -0.0207 | 1.59 | 0.111 |
b_y2017_par_act | b_log_income_k_par_act | 20.9 | 0.12 | 2.05 | 0.0405 | 53 | 0.246 | 1.67 | 0.0956 |
b_y2017_par_act | b_non_work_dad_kid_ace | -29.2 | -0.0652 | 1.99 | 0.0465 | -51.9 | -0.0951 | 1.62 | 0.106 |
b_y2017_par_act | b_non_work_dad_kid_car | -0.484 | -0.0131 | 1.98 | 0.0479 | -0.0534 | -0.00264 | 1.59 | 0.111 |
b_y2017_par_act | b_non_work_dad_par_act | 78.5 | 0.161 | 2.05 | 0.0402 | 157 | 0.26 | 1.7 | 0.0889 |
b_y2017_par_act | b_non_work_mom_kid_act | -74.5 | -0.242 | 1.97 | 0.0485 | -119 | -0.307 | 1.59 | 0.111 |
b_y2017_par_act | b_non_work_mom_kid_car | -2.86 | -0.0145 | 1.98 | 0.0472 | -2.32 | -0.112 | 1.61 | 0.107 |
b_y2017_par_act | b_non_work_mom_par_act | 297 | 0.675 | 2.1 | 0.0357 | 483 | 0.772 | 1.73 | 0.0841 |
b_y2017_par_act | b_veh_per_driver_kid_act | 81.7 | 0.243 | 2.77 | 0.00555 | 134 | 0.296 | 2.25 | 0.0243 |
b_y2017_par_act | b_veh_per_driver_kid_car | 1.49 | 0.0145 | 1.96 | 0.0501 | 1.11 | 0.109 | 1.58 | 0.114 |
b_y2017_par_act | b_veh_per_driver_par_act | -418 | -0.751 | 2.43 | 0.0149 | -721 | -0.828 | 1.92 | 0.0545 |
b_y2017_par_act | b_y2017_kid_act | -258 | -0.612 | 1.45 | 0.148 | -443 | -0.73 | 1.15 | 0.248 |
b_y2017_par_act | b_y2017_kid_car | -0.824 | -0.0144 | 1.98 | 0.0477 | -0.818 | -0.0603 | 1.6 | 0.11 |
mu_active | asc_kid_act | 0.368 | 0.297 | 3.03 | 0.00243 | 0.556 | 0.341 | 2.41 | 0.0161 |
mu_active | asc_kid_car | 0.0162 | 0.0185 | 1.45 | 0.147 | 0.00986 | 0.114 | 1.15 | 0.248 |
mu_active | asc_par_act | 0.197 | 0.151 | 2.93 | 0.00336 | 0.385 | 0.222 | 2.34 | 0.0192 |
mu_active | b_age_kid_act | -4.37 | -0.643 | -2.98 | 0.00292 | -7.06 | -0.731 | -2.4 | 0.0164 |
mu_active | b_age_kid_car | -0.0585 | -0.0186 | 1.3 | 0.194 | -0.0372 | -0.109 | 1.08 | 0.28 |
mu_active | b_age_par_act | 23.8 | 0.971 | -0.314 | 0.753 | 37.3 | 0.981 | -0.262 | 0.793 |
mu_active | b_female_kid_act | 2.43 | 0.111 | 4.64 | 3.42e-06 | 4.09 | 0.148 | 4.52 | 6.33e-06 |
mu_active | b_female_kid_car | 0.0784 | 0.0183 | 1.42 | 0.156 | 0.0526 | 0.057 | 1.22 | 0.224 |
mu_active | b_female_par_act | -8.88 | -0.355 | 2.99 | 0.0028 | -14.3 | -0.435 | 2.68 | 0.00736 |
mu_active | b_has_big_sib_kid_act | -4.55 | -0.196 | -2.92 | 0.00351 | -6.87 | -0.233 | -2.71 | 0.00665 |
mu_active | b_has_big_sib_kid_car | -0.227 | -0.0185 | 0.739 | 0.46 | -0.136 | -0.0923 | 0.912 | 0.362 |
mu_active | b_has_big_sib_par_act | 15.8 | 0.541 | -1.86 | 0.0623 | 24.4 | 0.621 | -1.85 | 0.0637 |
mu_active | b_has_lil_sib_kid_act | 1.46 | 0.064 | -2.31 | 0.021 | 3.31 | 0.115 | -2.26 | 0.0239 |
mu_active | b_has_lil_sib_kid_car | -0.247 | -0.0185 | 0.687 | 0.492 | -0.158 | -0.105 | 0.891 | 0.373 |
mu_active | b_has_lil_sib_par_act | -5.21 | -0.208 | -2.32 | 0.0202 | -6.82 | -0.216 | -2.21 | 0.0272 |
mu_active | b_log_density_kid_act | 1.55 | 0.177 | -3.89 | 0.000102 | 2.57 | 0.218 | -3.36 | 0.000793 |
mu_active | b_log_density_kid_car | 0.0338 | 0.0184 | 1.46 | 0.145 | 0.0238 | 0.0707 | 1.17 | 0.241 |
mu_active | b_log_density_par_act | -10.2 | -0.725 | -2.84 | 0.00455 | -16.3 | -0.774 | -2.29 | 0.0219 |
mu_active | b_log_distance_kid_act | 0.76 | 0.0393 | 24.9 | 0 | 0.675 | 0.0269 | 22.8 | 0 |
mu_active | b_log_distance_kid_car | 0.0766 | 0.0183 | 1.42 | 0.155 | 0.0486 | 0.0458 | 1.21 | 0.225 |
mu_active | b_log_distance_par_act | 1.01 | 0.049 | 23.7 | 0 | 2.88 | 0.106 | 22.4 | 0 |
mu_active | b_log_income_k_kid_act | 0.618 | 0.0488 | 1.47 | 0.142 | 1.56 | 0.0981 | 1.36 | 0.174 |
mu_active | b_log_income_k_kid_car | 0.0169 | 0.0164 | 1.45 | 0.147 | 0.0136 | 0.0221 | 1.15 | 0.248 |
mu_active | b_log_income_k_par_act | -1.71 | -0.126 | 1.25 | 0.211 | -4.06 | -0.239 | 1.08 | 0.279 |
mu_active | b_non_work_dad_kid_ace | 2.29 | 0.0661 | 0.846 | 0.398 | 4.04 | 0.0938 | 0.851 | 0.395 |
mu_active | b_non_work_dad_kid_car | 0.0479 | 0.0167 | 1.44 | 0.149 | 0.004 | 0.00251 | 1.18 | 0.239 |
mu_active | b_non_work_dad_par_act | -6.21 | -0.165 | 0.574 | 0.566 | -12.6 | -0.263 | 0.541 | 0.588 |
mu_active | b_non_work_mom_kid_act | 5.91 | 0.247 | 1.26 | 0.208 | 9.53 | 0.313 | 1.26 | 0.208 |
mu_active | b_non_work_mom_kid_car | 0.283 | 0.0185 | 0.996 | 0.319 | 0.183 | 0.111 | 1.42 | 0.157 |
mu_active | b_non_work_mom_par_act | -23.4 | -0.684 | -0.267 | 0.79 | -38.2 | -0.774 | -0.224 | 0.822 |
mu_active | b_veh_per_driver_kid_act | -6.43 | -0.246 | 3.61 | 0.000309 | -10.6 | -0.297 | 3.18 | 0.00148 |
mu_active | b_veh_per_driver_kid_car | -0.148 | -0.0185 | 0.983 | 0.326 | -0.0895 | -0.111 | 0.991 | 0.322 |
mu_active | b_veh_per_driver_par_act | 33.1 | 0.765 | 4.45 | 8.74e-06 | 57.7 | 0.84 | 3.62 | 0.000291 |
mu_active | b_y2017_kid_act | 24.1 | 0.735 | -0.863 | 0.388 | 39 | 0.814 | -0.794 | 0.427 |
mu_active | b_y2017_kid_car | 0.082 | 0.0184 | 1.42 | 0.157 | 0.0663 | 0.062 | 1.22 | 0.223 |
mu_active | b_y2017_par_act | -129 | -0.981 | -1.73 | 0.0834 | -204 | -0.988 | -1.39 | 0.164 |
mu_car | asc_kid_act | 0.17 | 0.002 | 0.25 | 0.803 | 0.257 | 0.042 | 3.62 | 0.000295 |
mu_car | asc_kid_car | 59.9 | 0.999 | 0.228 | 0.82 | 0.272 | 0.836 | 3.31 | 0.000946 |
mu_car | asc_par_act | -0.0697 | -0.000777 | 0.249 | 0.803 | 0.21 | 0.0322 | 3.61 | 0.000307 |
mu_car | b_age_kid_act | -31.1 | -0.0666 | 0.141 | 0.888 | -4.15 | -0.115 | 1.98 | 0.0473 |
mu_car | b_age_kid_car | -216 | -0.998 | 0.226 | 0.822 | -0.922 | -0.72 | 3.27 | 0.00107 |
mu_car | b_age_par_act | 5.13 | 0.00305 | 0.2 | 0.841 | 18.2 | 0.128 | 2.62 | 0.00892 |
mu_car | b_female_kid_act | 35.9 | 0.024 | 0.359 | 0.719 | 4.83 | 0.0466 | 4.83 | 1.38e-06 |
mu_car | b_female_kid_car | 290 | 0.985 | 0.23 | 0.818 | 0.573 | 0.165 | 3.33 | 0.000881 |
mu_car | b_female_par_act | 21.1 | 0.0123 | 0.335 | 0.737 | -4.18 | -0.0339 | 4.22 | 2.43e-05 |
mu_car | b_has_big_sib_kid_act | -102 | -0.0643 | 0.0936 | 0.925 | -3.06 | -0.0276 | 1.21 | 0.225 |
mu_car | b_has_big_sib_kid_car | -839 | -0.998 | 0.22 | 0.826 | -4.08 | -0.735 | 3.18 | 0.00145 |
mu_car | b_has_big_sib_par_act | -75.2 | -0.0375 | 0.14 | 0.889 | 12 | 0.0813 | 1.77 | 0.0767 |
mu_car | b_has_lil_sib_kid_act | -103 | -0.0657 | 0.126 | 0.9 | 3.27 | 0.0301 | 1.68 | 0.0936 |
mu_car | b_has_lil_sib_kid_car | -914 | -0.998 | 0.219 | 0.827 | -4.25 | -0.751 | 3.18 | 0.00149 |
mu_car | b_has_lil_sib_par_act | -110 | -0.0639 | 0.11 | 0.912 | -1.51 | -0.0128 | 1.42 | 0.156 |
mu_car | b_log_density_kid_act | 18.3 | 0.0305 | 0.139 | 0.889 | 1.9 | 0.0429 | 1.99 | 0.0462 |
mu_car | b_log_density_kid_car | 125 | 0.989 | 0.229 | 0.819 | 0.336 | 0.266 | 3.31 | 0.000928 |
mu_car | b_log_density_par_act | 3.2 | 0.00333 | 0.115 | 0.908 | -7.72 | -0.0974 | 1.54 | 0.124 |
mu_car | b_log_distance_kid_act | 35 | 0.0263 | 0.97 | 0.332 | 2.63 | 0.0278 | 13.1 | 0 |
mu_car | b_log_distance_kid_car | 283 | 0.985 | 0.23 | 0.818 | 2.25 | 0.563 | 3.35 | 0.000808 |
mu_car | b_log_distance_par_act | 34.7 | 0.0246 | 0.966 | 0.334 | 4.55 | 0.0448 | 13 | 0 |
mu_car | b_log_income_k_kid_act | 10.2 | 0.0117 | 0.24 | 0.81 | 2.78 | 0.0465 | 3.4 | 0.000666 |
mu_car | b_log_income_k_kid_car | 62.2 | 0.884 | 0.228 | 0.819 | 0.352 | 0.153 | 3.31 | 0.000942 |
mu_car | b_log_income_k_par_act | 7.05 | 0.00759 | 0.239 | 0.811 | -1.35 | -0.0212 | 3.31 | 0.000919 |
mu_car | b_non_work_dad_kid_ace | 18.6 | 0.0078 | 0.249 | 0.803 | 1.45 | 0.00897 | 2.97 | 0.00299 |
mu_car | b_non_work_dad_kid_car | 177 | 0.899 | 0.229 | 0.819 | 0.0404 | 0.00673 | 3.31 | 0.000934 |
mu_car | b_non_work_dad_par_act | 7.64 | 0.00295 | 0.24 | 0.811 | -7.88 | -0.0439 | 2.68 | 0.00731 |
mu_car | b_non_work_mom_kid_act | 121 | 0.0735 | 0.249 | 0.803 | 3.49 | 0.0305 | 3.27 | 0.00108 |
mu_car | b_non_work_mom_kid_car | 1.05e+03 | 0.998 | 0.238 | 0.812 | 4.65 | 0.755 | 3.44 | 0.000584 |
mu_car | b_non_work_mom_par_act | 81.9 | 0.0349 | 0.191 | 0.849 | -22.1 | -0.119 | 2.04 | 0.0417 |
mu_car | b_veh_per_driver_kid_act | -78.6 | -0.0438 | 0.362 | 0.718 | -12.1 | -0.0901 | 4.37 | 1.26e-05 |
mu_car | b_veh_per_driver_kid_car | -546 | -0.996 | 0.223 | 0.824 | -0.17 | -0.0563 | 3.26 | 0.00112 |
mu_car | b_veh_per_driver_par_act | -27.6 | -0.00932 | 0.434 | 0.665 | 27.4 | 0.106 | 4.43 | 9.57e-06 |
mu_car | b_y2017_kid_act | 64.3 | 0.0286 | 0.175 | 0.861 | 19.9 | 0.111 | 2.11 | 0.035 |
mu_car | b_y2017_kid_car | 301 | 0.985 | 0.23 | 0.818 | 1.8 | 0.447 | 3.34 | 0.000824 |
mu_car | b_y2017_par_act | -132 | -0.0145 | -0.14 | 0.889 | -103 | -0.133 | -0.568 | 0.57 |
mu_car | mu_active | 13 | 0.0185 | 0.207 | 0.836 | 8.27 | 0.135 | 3 | 0.00273 |
Smallest eigenvalue: 2.07143e-05
+Largest eigenvalue: 757743
+Condition number: 3.65807e+10
+ \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/mode-nest/mode_nests.pickle b/models/IATBR plan/4 alternatives/mode-nest/mode_nests.pickle new file mode 100644 index 0000000..86faf33 Binary files /dev/null and b/models/IATBR plan/4 alternatives/mode-nest/mode_nests.pickle differ diff --git a/models/IATBR plan/4 alternatives/mode-nest/model-mode-nest.py b/models/IATBR plan/4 alternatives/mode-nest/model-mode-nest.py new file mode 100644 index 0000000..a33c585 --- /dev/null +++ b/models/IATBR plan/4 alternatives/mode-nest/model-mode-nest.py @@ -0,0 +1,220 @@ +# Model predicts the choice among four alternatives: +# * Car with a parent +# * Car without a parent (presumably a carpool) +# * Active with a parent +# * Active without a parent + +# In this model, the alternatives are independent + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable +from biogeme.nests import OneNestForNestedLogit, NestsForNestedLogit + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips_sc.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +y2017 = Variable('sc_y2017') +veh_per_driver = Variable('sc_veh_per_driver') +non_work_mom = Variable('sc_non_work_mom') +non_work_dad = Variable('sc_non_work_dad') +age = Variable('sc_age') +female = Variable('sc_female') +has_lil_sib = Variable('sc_has_lil_sib') +has_big_sib = Variable('sc_has_big_sib') +log_inc_k = Variable('sc_log_inc_k') +log_distance = Variable('sc_log_distance') +log_density = Variable('sc_log_density') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_car = Variable('av_kid_car') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car with parent is reference case) +asc_par_car = Beta('asc_par_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_car = Beta('asc_kid_car', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_par_car = Beta('b_log_income_k_par_car', 0, None, None, 1) +b_veh_per_driver_par_car = Beta('b_veh_per_driver_par_car', 0, None, None, 1) +b_non_work_mom_par_car = Beta('b_non_work_mom_par_car', 0, None, None, 1) +b_non_work_dad_par_car = Beta('b_non_work_dad_par_car', 0, None, None, 1) + +b_age_par_car = Beta('b_age_par_car', 0, None, None, 1) +b_female_par_car = Beta('b_female_par_car', 0, None, None, 1) +b_has_lil_sib_par_car = Beta('b_has_lil_sib_par_car', 0, None, None, 1) +b_has_big_sib_par_car = Beta('b_has_big_sib_par_car', 0, None, None, 1) + +b_log_distance_par_car = Beta('b_log_distance_par_car', 0, None, None, 1) +b_log_density_par_car = Beta('b_log_density_par_car', 0, None, None, 1) + +b_y2017_par_car = Beta('b_y2017_par_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) + +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for with kid car +b_log_income_k_kid_car = Beta('b_log_income_k_kid_car', 0, None, None, 0) +b_veh_per_driver_kid_car = Beta('b_veh_per_driver_kid_car', 0, None, None, 0) +b_non_work_mom_kid_car = Beta('b_non_work_mom_kid_car', 0, None, None, 0) +b_non_work_dad_kid_car = Beta('b_non_work_dad_kid_car', 0, None, None, 0) + +b_age_kid_car = Beta('b_age_kid_car', 0, None, None, 0) +b_female_kid_car = Beta('b_female_kid_car', 0, None, None, 0) +b_has_lil_sib_kid_car = Beta('b_has_lil_sib_kid_car', 0, None, None, 0) +b_has_big_sib_kid_car = Beta('b_has_big_sib_kid_car', 0, None, None, 0) + +b_log_distance_kid_car = Beta('b_log_distance_kid_car', 0, None, None, 0) +b_log_density_kid_car = Beta('b_log_density_kid_car', 0, None, None, 0) + +b_y2017_kid_car = Beta('b_y2017_kid_car', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) + +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# Definition of utility functions +V_par_car = ( + asc_par_car + + b_log_income_k_par_car * log_inc_k + + b_veh_per_driver_par_car * veh_per_driver + + b_non_work_mom_par_car * non_work_mom + + b_non_work_dad_par_car * non_work_dad + + b_age_par_car * age + + b_female_par_car * female + + b_has_lil_sib_par_car * has_lil_sib + + b_has_big_sib_par_car * has_big_sib + + b_log_distance_par_car * log_distance + + b_log_density_par_car * log_density + + b_y2017_par_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_inc_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_car = ( + asc_kid_car + + b_log_income_k_kid_car * log_inc_k + + b_veh_per_driver_kid_car * veh_per_driver + + b_non_work_mom_kid_car * non_work_mom + + b_non_work_dad_kid_car * non_work_dad + + b_age_kid_car * age + + b_female_kid_car * female + + b_has_lil_sib_kid_car * has_lil_sib + + b_has_big_sib_kid_car * has_big_sib + + b_log_distance_kid_car * log_distance + + b_log_density_kid_car * log_density + + b_y2017_kid_car * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_inc_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {17: V_par_car, + 18: V_par_act, + 27: V_kid_car, + 28: V_kid_act} + +# associate availability conditions with alternatives: + +av = {17: av_par_car, + 18: av_par_act, + 27: av_kid_car, + 28: av_kid_act} + +# Define nests based on mode +mu_car = Beta('mu_car', 1, 1.0, None, 0) +mu_active = Beta('mu_active', 1, 1.0, None, 0) + +active_nest = OneNestForNestedLogit( + nest_param=mu_active, + list_of_alternatives=[18,28], + name='active_nest' +) + +car_nest = OneNestForNestedLogit( + nest_param=mu_car, + list_of_alternatives=[17,27], + name='car_nest' +) + +mode_nests = NestsForNestedLogit( + choice_set=list(V), + tuple_of_nests=(active_nest, + car_nest) +) + +# Define model +my_model = models.lognested(V, av, mode_nests, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, my_model) +the_biogeme.modelName = 'mode_nests' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/no-nests/__no_nests.iter b/models/IATBR plan/4 alternatives/no-nests/__no_nests.iter new file mode 100644 index 0000000..1830cf4 --- /dev/null +++ b/models/IATBR plan/4 alternatives/no-nests/__no_nests.iter @@ -0,0 +1,36 @@ +asc_kid_act = -5.2122400811912515 +asc_kid_car = -3.1115933329671495 +asc_par_act = -5.646823633017916 +b_age_kid_act = 0.2564704712533801 +b_age_kid_car = 0.11365469104628928 +b_age_par_act = -0.23906049874400376 +b_female_kid_act = -0.3327550268376772 +b_female_kid_car = -0.14026267858294256 +b_female_par_act = -0.14549175371821993 +b_has_big_sib_kid_act = 0.3908707704260334 +b_has_big_sib_kid_car = 0.43780286059662465 +b_has_big_sib_par_act = 0.08335845355445815 +b_has_lil_sib_kid_act = 0.26797920461263536 +b_has_lil_sib_kid_car = 0.46471052040710814 +b_has_lil_sib_par_act = 0.33209742521431024 +b_log_density_kid_act = 0.16475722056020736 +b_log_density_kid_car = -0.059997408800805944 +b_log_density_par_act = 0.3964596833915963 +b_log_distance_kid_act = -1.6485059372035005 +b_log_distance_kid_car = -0.16892519493602517 +b_log_distance_par_act = -1.7443302758107384 +b_log_income_k_kid_act = -0.052553650963168476 +b_log_income_k_kid_car = -0.03507712048760409 +b_log_income_k_par_act = 0.0613817649425659 +b_non_work_dad_kid_ace = -0.11726961837942959 +b_non_work_dad_kid_car = -0.07975168413280843 +b_non_work_dad_par_act = 0.1955382517190136 +b_non_work_mom_kid_act = -0.1831847807325058 +b_non_work_mom_kid_car = -0.5337536692306336 +b_non_work_mom_par_act = 0.370195493136026 +b_veh_per_driver_kid_act = -0.15667096729058583 +b_veh_per_driver_kid_car = 0.25294810366375503 +b_veh_per_driver_par_act = -1.0999370205559784 +b_y2017_kid_act = -0.22361412485849755 +b_y2017_kid_car = -0.1838435886593981 +b_y2017_par_act = 2.676093933885002 diff --git a/models/IATBR plan/4 alternatives/no-nests/biogeme.toml b/models/IATBR plan/4 alternatives/no-nests/biogeme.toml new file mode 100644 index 0000000..02c4266 --- /dev/null +++ b/models/IATBR plan/4 alternatives/no-nests/biogeme.toml @@ -0,0 +1,90 @@ +# Default parameter file for Biogeme 3.2.13 +# Automatically created on March 27, 2024. 09:50:14 + +[MonteCarlo] +number_of_draws = 20000 # int: Number of draws for Monte-Carlo integration. +seed = 0 # int: Seed used for the pseudo-random number generation. It is useful + # only when each run should generate the exact same result. If 0, a new + # seed is used at each run. + +[MultiThreading] +number_of_threads = 0 # int: Number of threads/processors to be used. If the + # parameter is 0, the number of available threads is + # calculated using cpu_count(). + +[AssistedSpecification] +maximum_number_parameters = 50 # int: maximum number of parameters allowed in a + # model. Each specification with a higher number + # is deemed invalid and not estimated. +number_of_neighbors = 20 # int: maximum number of neighbors that are visited by + # the VNS algorithm. +largest_neighborhood = 20 # int: size of the largest neighborhood copnsidered by + # the Variable Neighborhood Search (VNS) algorithm. +maximum_attempts = 100 # int: an attempts consists in selecting a solution in the + # Pareto set, and trying to improve it. The parameter + # imposes an upper bound on the total number of attempts, + # irrespectively if they are successful or not. + +[Output] +identification_threshold = 1e-05 # float: if the smallest eigenvalue of the + # second derivative matrix is lesser or equal to + # this parameter, the model is considered not + # identified. The corresponding eigenvector is + # then reported to identify the parameters + # involved in the issue. +only_robust_stats = "True" # bool: "True" if only the robust statistics need to be + # reported. If "False", the statistics from the + # Rao-Cramer bound are also reported. +generate_html = "True" # bool: "True" if the HTML file with the results must be + # generated. +generate_pickle = "True" # bool: "True" if the pickle file with the results must be + # generated. + +[SimpleBounds] +second_derivatives = 1.0 # float: proportion (between 0 and 1) of iterations when + # the analytical Hessian is calculated +tolerance = 6.06273418136464e-06 # float: the algorithm stops when this precision + # is reached +max_iterations = 500 # int: maximum number of iterations +infeasible_cg = "False" # If True, the conjugate gradient algorithm may generate + # infeasible solutions until termination. The result + # will then be projected on the feasible domain. If + # False, the algorithm stops as soon as an infeasible + # iterate is generated +initial_radius = 1 # Initial radius of the trust region +steptol = 1e-05 # The algorithm stops when the relative change in x is below this + # threshold. Basically, if p significant digits of x are needed, + # steptol should be set to 1.0e-p. +enlarging_factor = 10 # If an iteration is very successful, the radius of the + # trust region is multiplied by this factor + +[Specification] +missing_data = 99999 # number: If one variable has this value, it is assumed that + # a data is missing and an exception will be triggered. + +[TrustRegion] +dogleg = "True" # bool: choice of the method to solve the trust region subproblem. + # True: dogleg. False: truncated conjugate gradient. + +[Estimation] +bootstrap_samples = 100 # int: number of re-estimations for bootstrap sampling. +max_number_parameters_to_report = 15 # int: maximum number of parameters to + # report during the estimation. +save_iterations = "True" # bool: If True, the current iterate is saved after each + # iteration, in a file named ``__[modelName].iter``, + # where ``[modelName]`` is the name given to the model. + # If such a file exists, the starting values for the + # estimation are replaced by the values saved in the + # file. +maximum_number_catalog_expressions = 100 # If the expression contrains catalogs, + # the parameter sets an upper bound of + # the total number of possible + # combinations that can be estimated in + # the same loop. +optimization_algorithm = "simple_bounds" # str: optimization algorithm to be used + # for estimation. Valid values: + # ['scipy', 'LS-newton', 'TR-newton', + # 'LS-BFGS', 'TR-BFGS', 'simple_bounds', + # 'simple_bounds_newton', + # 'simple_bounds_BFGS'] + diff --git a/models/IATBR plan/4 alternatives/no-nests/model-no-nest.py b/models/IATBR plan/4 alternatives/no-nests/model-no-nest.py new file mode 100644 index 0000000..2d74e6b --- /dev/null +++ b/models/IATBR plan/4 alternatives/no-nests/model-no-nest.py @@ -0,0 +1,197 @@ +# Model predicts the choice among four alternatives: +# * Car with a parent +# * Car without a parent (presumably a carpool) +# * Active with a parent +# * Active without a parent + +# In this model, the alternatives are independent + +import pandas as pd + +import biogeme.biogeme as bio +from biogeme import models +from biogeme.expressions import Beta +import biogeme.database as db +from biogeme.expressions import Variable + +from pyprojroot.here import here + +# Read in data +df_est = pd.read_csv(here('models/IATBR plan/trips.csv')) + +# Set up biogeme databases +database_est = db.Database('est', df_est) + +# Define variables for biogeme +mode_ind = Variable('mode_ind') +y2017 = Variable('y2017') +veh_per_driver = Variable('veh_per_driver') +non_work_mom = Variable('non_work_mom') +non_work_dad = Variable('non_work_dad') +age = Variable('age') +female = Variable('female') +has_lil_sib = Variable('has_lil_sib') +has_big_sib = Variable('has_big_sib') +log_inc_k = Variable('log_inc_k') +log_distance = Variable('log_distance') +log_density = Variable('log_density') +av_par_car = Variable('av_par_car') +av_par_act = Variable('av_par_act') +av_kid_car = Variable('av_kid_car') +av_kid_act = Variable('av_kid_act') + +# alternative specific constants (car with parent is reference case) +asc_par_car = Beta('asc_par_car', 0, None, None, 1) +asc_par_act = Beta('asc_par_act', 0, None, None, 0) +asc_kid_car = Beta('asc_kid_car', 0, None, None, 0) +asc_kid_act = Beta('asc_kid_act', 0, None, None, 0) + +# parent car betas (not estimated for reference case) +b_log_income_k_par_car = Beta('b_log_income_k_par_car', 0, None, None, 1) +b_veh_per_driver_par_car = Beta('b_veh_per_driver_par_car', 0, None, None, 1) +b_non_work_mom_par_car = Beta('b_non_work_mom_par_car', 0, None, None, 1) +b_non_work_dad_par_car = Beta('b_non_work_dad_par_car', 0, None, None, 1) + +b_age_par_car = Beta('b_age_par_car', 0, None, None, 1) +b_female_par_car = Beta('b_female_par_car', 0, None, None, 1) +b_has_lil_sib_par_car = Beta('b_has_lil_sib_par_car', 0, None, None, 1) +b_has_big_sib_par_car = Beta('b_has_big_sib_par_car', 0, None, None, 1) + +b_log_distance_par_car = Beta('b_log_distance_par_car', 0, None, None, 1) +b_log_density_par_car = Beta('b_log_density_par_car', 0, None, None, 1) + +b_y2017_par_car = Beta('b_y2017_par_car', 0, None, None, 1) + +# betas for with parent active +b_log_income_k_par_act = Beta('b_log_income_k_par_act', 0, None, None, 0) +b_veh_per_driver_par_act = Beta('b_veh_per_driver_par_act', 0, None, None, 0) +b_non_work_mom_par_act = Beta('b_non_work_mom_par_act', 0, None, None, 0) +b_non_work_dad_par_act = Beta('b_non_work_dad_par_act', 0, None, None, 0) + +b_age_par_act = Beta('b_age_par_act', 0, None, None, 0) +b_female_par_act = Beta('b_female_par_act', 0, None, None, 0) +b_has_lil_sib_par_act = Beta('b_has_lil_sib_par_act', 0, None, None, 0) +b_has_big_sib_par_act = Beta('b_has_big_sib_par_act', 0, None, None, 0) + +b_log_distance_par_act = Beta('b_log_distance_par_act', 0, None, None, 0) +b_log_density_par_act = Beta('b_log_density_par_act', 0, None, None, 0) + +b_y2017_par_act = Beta('b_y2017_par_act', 0, None, None, 0) + +# betas for with kid car +b_log_income_k_kid_car = Beta('b_log_income_k_kid_car', 0, None, None, 0) +b_veh_per_driver_kid_car = Beta('b_veh_per_driver_kid_car', 0, None, None, 0) +b_non_work_mom_kid_car = Beta('b_non_work_mom_kid_car', 0, None, None, 0) +b_non_work_dad_kid_car = Beta('b_non_work_dad_kid_car', 0, None, None, 0) + +b_age_kid_car = Beta('b_age_kid_car', 0, None, None, 0) +b_female_kid_car = Beta('b_female_kid_car', 0, None, None, 0) +b_has_lil_sib_kid_car = Beta('b_has_lil_sib_kid_car', 0, None, None, 0) +b_has_big_sib_kid_car = Beta('b_has_big_sib_kid_car', 0, None, None, 0) + +b_log_distance_kid_car = Beta('b_log_distance_kid_car', 0, None, None, 0) +b_log_density_kid_car = Beta('b_log_density_kid_car', 0, None, None, 0) + +b_y2017_kid_car = Beta('b_y2017_kid_car', 0, None, None, 0) + +# betas for kid active +b_log_income_k_kid_act = Beta('b_log_income_k_kid_act', 0, None, None, 0) +b_veh_per_driver_kid_act = Beta('b_veh_per_driver_kid_act', 0, None, None, 0) +b_non_work_mom_kid_act = Beta('b_non_work_mom_kid_act', 0, None, None, 0) +b_non_work_dad_kid_act = Beta('b_non_work_dad_kid_ace', 0, None, None, 0) + +b_age_kid_act = Beta('b_age_kid_act', 0, None, None, 0) +b_female_kid_act = Beta('b_female_kid_act', 0, None, None, 0) +b_has_lil_sib_kid_act = Beta('b_has_lil_sib_kid_act', 0, None, None, 0) +b_has_big_sib_kid_act = Beta('b_has_big_sib_kid_act', 0, None, None, 0) + +b_log_distance_kid_act = Beta('b_log_distance_kid_act', 0, None, None, 0) +b_log_density_kid_act = Beta('b_log_density_kid_act', 0, None, None, 0) + +b_y2017_kid_act = Beta('b_y2017_kid_act', 0, None, None, 0) + +# Definition of utility functions +V_par_car = ( + asc_par_car + + b_log_income_k_par_car * log_inc_k + + b_veh_per_driver_par_car * veh_per_driver + + b_non_work_mom_par_car * non_work_mom + + b_non_work_dad_par_car * non_work_dad + + b_age_par_car * age + + b_female_par_car * female + + b_has_lil_sib_par_car * has_lil_sib + + b_has_big_sib_par_car * has_big_sib + + b_log_distance_par_car * log_distance + + b_log_density_par_car * log_density + + b_y2017_par_car * y2017 +) + +V_par_act = ( + asc_par_act + + b_log_income_k_par_act * log_inc_k + + b_veh_per_driver_par_act * veh_per_driver + + b_non_work_mom_par_act * non_work_mom + + b_non_work_dad_par_act * non_work_dad + + b_age_par_act * age + + b_female_par_act * female + + b_has_lil_sib_par_act * has_lil_sib + + b_has_big_sib_par_act * has_big_sib + + b_log_distance_par_act * log_distance + + b_log_density_par_act * log_density + + b_y2017_par_act * y2017 +) + +V_kid_car = ( + asc_kid_car + + b_log_income_k_kid_car * log_inc_k + + b_veh_per_driver_kid_car * veh_per_driver + + b_non_work_mom_kid_car * non_work_mom + + b_non_work_dad_kid_car * non_work_dad + + b_age_kid_car * age + + b_female_kid_car * female + + b_has_lil_sib_kid_car * has_lil_sib + + b_has_big_sib_kid_car * has_big_sib + + b_log_distance_kid_car * log_distance + + b_log_density_kid_car * log_density + + b_y2017_kid_car * y2017 +) + +V_kid_act = ( + asc_kid_act + + b_log_income_k_kid_act * log_inc_k + + b_veh_per_driver_kid_act * veh_per_driver + + b_non_work_mom_kid_act * non_work_mom + + b_non_work_dad_kid_act * non_work_dad + + b_age_kid_act * age + + b_female_kid_act * female + + b_has_lil_sib_kid_act * has_lil_sib + + b_has_big_sib_kid_act * has_big_sib + + b_log_distance_kid_act * log_distance + + b_log_density_kid_act * log_density + + b_y2017_kid_act * y2017 +) + +# Associate utility functions with alternative numbers +V = {17: V_par_car, + 18: V_par_act, + 27: V_kid_car, + 28: V_kid_act} + +# associate availability conditions with alternatives: + +av = {17: av_par_car, + 18: av_par_act, + 27: av_kid_car, + 28: av_kid_act} + +# Define model +my_model = models.loglogit(V, av, mode_ind) + +# Create biogeme object +the_biogeme = bio.BIOGEME(database_est, my_model) +the_biogeme.modelName = 'no_nests' + +# estimate parameters +results = the_biogeme.estimate() + +print(results.short_summary()) \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/no-nests/no_nests.html b/models/IATBR plan/4 alternatives/no-nests/no_nests.html new file mode 100644 index 0000000..2890c0f --- /dev/null +++ b/models/IATBR plan/4 alternatives/no-nests/no_nests.html @@ -0,0 +1,735 @@ + + + + +biogeme 3.2.13 [2024-04-03]
+Python package
+Home page: http://biogeme.epfl.ch
+Submit questions to https://groups.google.com/d/forum/biogeme
+Michel Bierlaire, Transport and Mobility Laboratory, Ecole Polytechnique Fédérale de Lausanne (EPFL)
+This file has automatically been generated on 2024-04-03 13:43:54.904909
+Report file: | no_nests~00.html |
Database name: | est |
Number of estimated parameters: | 36 |
Sample size: | 4910 |
Excluded observations: | 0 |
Init log likelihood: | -234501 |
Final log likelihood: | -4220.598 |
Likelihood ratio test for the init. model: | 460560.8 |
Rho-square for the init. model: | 0.982 |
Rho-square-bar for the init. model: | 0.982 |
Akaike Information Criterion: | 8513.197 |
Bayesian Information Criterion: | 8747.162 |
Final gradient norm: | 2.0075E+00 |
Nbr of threads: | 12 |
Relative gradient: | 5.930660018695989e-06 |
Cause of termination: | Relative gradient = 5.9e-06 <= 6.1e-06 |
Number of function evaluations: | 42 |
Number of gradient evaluations: | 30 |
Number of hessian evaluations: | 29 |
Algorithm: | Newton with trust region for simple bound constraints |
Number of iterations: | 41 |
Proportion of Hessian calculation: | 29/29 = 100.0% |
Optimization time: | 0:00:28.280687 |
Name | Value | Rob. Std err | Rob. t-test | Rob. p-value |
---|---|---|---|---|
asc_kid_act | -5.21 | 0.409 | -12.8 | 0 |
asc_kid_car | -3.11 | 0.568 | -5.48 | 4.31e-08 |
asc_par_act | -5.65 | 0.902 | -6.26 | 3.82e-10 |
b_age_kid_act | 0.256 | 0.0178 | 14.4 | 0 |
b_age_kid_car | 0.114 | 0.0302 | 3.77 | 0.000166 |
b_age_par_act | -0.239 | 0.0359 | -6.66 | 2.81e-11 |
b_female_kid_act | -0.333 | 0.0736 | -4.52 | 6.16e-06 |
b_female_kid_car | -0.14 | 0.116 | -1.21 | 0.226 |
b_female_par_act | -0.145 | 0.134 | -1.08 | 0.278 |
b_has_big_sib_kid_act | 0.391 | 0.0769 | 5.08 | 3.71e-07 |
b_has_big_sib_kid_car | 0.438 | 0.125 | 3.49 | 0.000486 |
b_has_big_sib_par_act | 0.0834 | 0.139 | 0.599 | 0.549 |
b_has_lil_sib_kid_act | 0.268 | 0.0772 | 3.47 | 0.000518 |
b_has_lil_sib_kid_car | 0.465 | 0.123 | 3.77 | 0.000164 |
b_has_lil_sib_par_act | 0.332 | 0.14 | 2.37 | 0.0177 |
b_log_density_kid_act | 0.165 | 0.0299 | 5.51 | 3.68e-08 |
b_log_density_kid_car | -0.06 | 0.0391 | -1.54 | 0.124 |
b_log_density_par_act | 0.396 | 0.0765 | 5.18 | 2.23e-07 |
b_log_distance_kid_act | -1.65 | 0.0672 | -24.5 | 0 |
b_log_distance_kid_car | -0.169 | 0.123 | -1.37 | 0.171 |
b_log_distance_par_act | -1.74 | 0.114 | -15.2 | 0 |
b_log_income_k_kid_act | -0.0526 | 0.0432 | -1.22 | 0.224 |
b_log_income_k_kid_car | -0.0351 | 0.0703 | -0.499 | 0.618 |
b_log_income_k_par_act | 0.0614 | 0.0746 | 0.823 | 0.41 |
b_non_work_dad_kid_ace | -0.117 | 0.118 | -0.997 | 0.319 |
b_non_work_dad_kid_car | -0.0798 | 0.199 | -0.4 | 0.689 |
b_non_work_dad_par_act | 0.196 | 0.195 | 1 | 0.315 |
b_non_work_mom_kid_act | -0.183 | 0.0784 | -2.34 | 0.0195 |
b_non_work_mom_kid_car | -0.534 | 0.134 | -4 | 6.44e-05 |
b_non_work_mom_par_act | 0.37 | 0.139 | 2.66 | 0.00779 |
b_veh_per_driver_kid_act | -0.157 | 0.0873 | -1.79 | 0.0727 |
b_veh_per_driver_kid_car | 0.253 | 0.107 | 2.35 | 0.0186 |
b_veh_per_driver_par_act | -1.1 | 0.229 | -4.8 | 1.61e-06 |
b_y2017_kid_act | -0.224 | 0.0755 | -2.96 | 0.00307 |
b_y2017_kid_car | -0.184 | 0.118 | -1.55 | 0.121 |
b_y2017_par_act | 2.68 | 0.189 | 14.1 | 0 |
Coefficient1 | Coefficient2 | Covariance | Correlation | t-test | p-value | Rob. cov. | Rob. corr. | Rob. t-test | Rob. p-value |
---|---|---|---|---|---|---|---|---|---|
asc_kid_car | asc_kid_act | 0.0432 | 0.185 | 3.25 | 0.00114 | 0.0415 | 0.179 | 3.29 | 0.000988 |
asc_par_act | asc_kid_act | 0.0576 | 0.178 | -0.517 | 0.605 | 0.0595 | 0.161 | -0.468 | 0.64 |
asc_par_act | asc_kid_car | 0.0348 | 0.0727 | -2.62 | 0.00888 | 0.0369 | 0.072 | -2.46 | 0.0139 |
b_age_kid_act | asc_kid_act | -0.00386 | -0.547 | 13.4 | 0 | -0.00387 | -0.532 | 13.1 | 0 |
b_age_kid_act | asc_kid_car | -0.00107 | -0.102 | 5.71 | 1.12e-08 | -0.00112 | -0.11 | 5.91 | 3.51e-09 |
b_age_kid_act | asc_par_act | -0.0012 | -0.0828 | 7.24 | 4.63e-13 | -0.00134 | -0.0833 | 6.53 | 6.43e-11 |
b_age_kid_car | asc_kid_act | -0.00102 | -0.0933 | 13.3 | 0 | -0.00104 | -0.0843 | 12.9 | 0 |
b_age_kid_car | asc_kid_car | -0.00872 | -0.542 | 5.35 | 8.8e-08 | -0.0103 | -0.603 | 5.5 | 3.86e-08 |
b_age_kid_car | asc_par_act | -0.000823 | -0.0369 | 7.06 | 1.64e-12 | -0.000885 | -0.0325 | 6.38 | 1.81e-10 |
b_age_kid_car | b_age_kid_act | 9.57e-05 | 0.197 | -4.83 | 1.36e-06 | 9.77e-05 | 0.182 | -4.44 | 8.81e-06 |
b_age_par_act | asc_kid_act | -0.00146 | -0.096 | 12.3 | 0 | -0.00142 | -0.0969 | 12 | 0 |
b_age_par_act | asc_kid_car | -0.000895 | -0.0398 | 4.87 | 1.14e-06 | -0.00102 | -0.0499 | 5.03 | 4.88e-07 |
b_age_par_act | asc_par_act | -0.0138 | -0.442 | 6.5 | 7.96e-11 | -0.0141 | -0.434 | 5.89 | 3.85e-09 |
b_age_par_act | b_age_kid_act | 0.000116 | 0.17 | -12.6 | 0 | 0.000107 | 0.167 | -13.3 | 0 |
b_age_par_act | b_age_kid_car | 7.52e-05 | 0.0718 | -7.77 | 7.99e-15 | 7.25e-05 | 0.0669 | -7.78 | 7.33e-15 |
b_female_kid_act | asc_kid_act | -0.00167 | -0.0573 | 11.9 | 0 | -0.00168 | -0.0558 | 11.6 | 0 |
b_female_kid_act | asc_kid_car | -0.000695 | -0.0161 | 4.68 | 2.82e-06 | -0.000668 | -0.016 | 4.84 | 1.29e-06 |
b_female_kid_act | asc_par_act | -0.00086 | -0.0144 | 6.49 | 8.46e-11 | -0.000101 | -0.00152 | 5.87 | 4.31e-09 |
b_female_kid_act | b_age_kid_act | -2.2e-06 | -0.00169 | -7.8 | 6.22e-15 | -1.96e-05 | -0.015 | -7.75 | 8.88e-15 |
b_female_kid_act | b_age_kid_car | 1.16e-06 | 0.000579 | -5.7 | 1.21e-08 | 4.6e-06 | 0.00207 | -5.62 | 1.96e-08 |
b_female_kid_act | b_age_par_act | 6.32e-07 | 0.000225 | -1.13 | 0.258 | -6.33e-05 | -0.024 | -1.13 | 0.257 |
b_female_kid_car | asc_kid_act | -0.000759 | -0.0165 | 12.2 | 0 | -0.000772 | -0.0163 | 11.9 | 0 |
b_female_kid_car | asc_kid_car | -0.00621 | -0.0911 | 4.88 | 1.07e-06 | -0.00389 | -0.0592 | 5.07 | 4.04e-07 |
b_female_kid_car | asc_par_act | -0.000638 | -0.00676 | 6.69 | 2.24e-11 | -0.000834 | -0.00799 | 6.05 | 1.45e-09 |
b_female_kid_car | b_age_kid_act | 1.52e-07 | 7.38e-05 | -3.38 | 0.000722 | 9.04e-06 | 0.00438 | -3.39 | 0.000698 |
b_female_kid_car | b_age_kid_car | 8.88e-05 | 0.0279 | -2.14 | 0.032 | 0.000164 | 0.047 | -2.15 | 0.0317 |
b_female_kid_car | b_age_par_act | 2.59e-06 | 0.000585 | 0.809 | 0.418 | 1.62e-06 | 0.00039 | 0.815 | 0.415 |
b_female_kid_car | b_female_kid_act | 0.00163 | 0.192 | 1.54 | 0.123 | 0.00162 | 0.19 | 1.54 | 0.123 |
b_female_par_act | asc_kid_act | -0.000817 | -0.0154 | 12 | 0 | 4.06e-05 | 0.000741 | 11.8 | 0 |
b_female_par_act | asc_kid_car | -0.00059 | -0.00751 | 4.91 | 8.92e-07 | -0.0004 | -0.00525 | 5.08 | 3.86e-07 |
b_female_par_act | asc_par_act | -0.00665 | -0.061 | 6.6 | 4.02e-11 | -0.00926 | -0.0765 | 5.97 | 2.41e-09 |
b_female_par_act | b_age_kid_act | 1.79e-05 | 0.00752 | -2.98 | 0.00288 | -3.37e-05 | -0.0141 | -2.96 | 0.00304 |
b_female_par_act | b_age_kid_car | 9.91e-06 | 0.0027 | -1.9 | 0.0577 | 9.07e-06 | 0.00224 | -1.88 | 0.0595 |
b_female_par_act | b_age_par_act | 3.44e-05 | 0.00672 | 0.673 | 0.501 | 0.000362 | 0.0751 | 0.686 | 0.492 |
b_female_par_act | b_female_kid_act | 0.00196 | 0.2 | 1.35 | 0.178 | 0.00198 | 0.201 | 1.34 | 0.179 |
b_female_par_act | b_female_kid_car | 0.0013 | 0.0837 | -0.0308 | 0.975 | 0.0013 | 0.0836 | -0.0308 | 0.975 |
b_has_big_sib_kid_act | asc_kid_act | -0.00663 | -0.217 | 13.3 | 0 | -0.00634 | -0.202 | 13 | 0 |
b_has_big_sib_kid_act | asc_kid_car | -0.00219 | -0.0483 | 5.87 | 4.26e-09 | -0.00203 | -0.0464 | 6.07 | 1.26e-09 |
b_has_big_sib_kid_act | asc_par_act | -0.00221 | -0.0353 | 7.36 | 1.86e-13 | -0.00194 | -0.028 | 6.65 | 2.84e-11 |
b_has_big_sib_kid_act | b_age_kid_act | 0.000239 | 0.175 | 1.77 | 0.0769 | 0.000185 | 0.135 | 1.76 | 0.0791 |
b_has_big_sib_kid_act | b_age_kid_car | 8.63e-05 | 0.0409 | 3.43 | 0.000593 | 5.78e-05 | 0.0249 | 3.38 | 0.000712 |
b_has_big_sib_kid_act | b_age_par_act | 7.58e-05 | 0.0257 | 7.4 | 1.37e-13 | 8.18e-05 | 0.0296 | 7.51 | 6e-14 |
b_has_big_sib_kid_act | b_female_kid_act | -0.000184 | -0.0325 | 6.69 | 2.2e-11 | -0.000133 | -0.0235 | 6.72 | 1.82e-11 |
b_has_big_sib_kid_act | b_female_kid_car | -6.57e-05 | -0.00735 | 3.8 | 0.000144 | -1.33e-05 | -0.00149 | 3.82 | 0.000133 |
b_has_big_sib_kid_act | b_female_par_act | -4.12e-05 | -0.00399 | 3.47 | 0.000525 | -7.42e-05 | -0.00719 | 3.46 | 0.000546 |
b_has_big_sib_kid_car | asc_kid_act | -0.00191 | -0.0392 | 13.4 | 0 | -0.00172 | -0.0336 | 13.1 | 0 |
b_has_big_sib_kid_car | asc_kid_car | -0.0167 | -0.232 | 5.66 | 1.55e-08 | -0.0214 | -0.301 | 5.75 | 9.02e-09 |
b_has_big_sib_kid_car | asc_par_act | -0.0015 | -0.015 | 7.37 | 1.66e-13 | -0.0011 | -0.00976 | 6.67 | 2.5e-11 |
b_has_big_sib_kid_car | b_age_kid_act | 7.34e-05 | 0.0337 | 1.47 | 0.142 | 4.57e-05 | 0.0204 | 1.43 | 0.151 |
b_has_big_sib_kid_car | b_age_kid_car | 0.000577 | 0.172 | 2.68 | 0.00743 | 0.00114 | 0.3 | 2.7 | 0.00688 |
b_has_big_sib_kid_car | b_age_par_act | 5.55e-05 | 0.0118 | 5.28 | 1.27e-07 | 2.53e-05 | 0.0056 | 5.19 | 2.07e-07 |
b_has_big_sib_kid_car | b_female_kid_act | -4.71e-05 | -0.00523 | 5.38 | 7.64e-08 | -1.01e-05 | -0.00109 | 5.29 | 1.2e-07 |
b_has_big_sib_kid_car | b_female_kid_car | -0.00044 | -0.0309 | 3.37 | 0.000748 | -2.62e-05 | -0.0018 | 3.38 | 0.000717 |
b_has_big_sib_kid_car | b_female_par_act | -4.31e-05 | -0.00262 | 3.21 | 0.00134 | 1.98e-05 | 0.00118 | 3.18 | 0.00149 |
b_has_big_sib_kid_car | b_has_big_sib_kid_act | 0.00188 | 0.199 | 0.357 | 0.721 | 0.00183 | 0.189 | 0.35 | 0.727 |
b_has_big_sib_par_act | asc_kid_act | -0.0025 | -0.0449 | 12.4 | 0 | -0.00226 | -0.0397 | 12.1 | 0 |
b_has_big_sib_par_act | asc_kid_car | -0.00166 | -0.0202 | 5.27 | 1.4e-07 | -0.00168 | -0.0212 | 5.44 | 5.44e-08 |
b_has_big_sib_par_act | asc_par_act | -0.0219 | -0.192 | 6.72 | 1.77e-11 | -0.0167 | -0.133 | 6.16 | 7.41e-10 |
b_has_big_sib_par_act | b_age_kid_act | 6.44e-05 | 0.0259 | -1.23 | 0.218 | 6.98e-05 | 0.0282 | -1.24 | 0.216 |
b_has_big_sib_par_act | b_age_kid_car | 4.59e-05 | 0.012 | -0.213 | 0.831 | 3.27e-05 | 0.00779 | -0.213 | 0.831 |
b_has_big_sib_par_act | b_age_par_act | 0.000578 | 0.108 | 2.29 | 0.0223 | 0.000442 | 0.0885 | 2.29 | 0.0218 |
b_has_big_sib_par_act | b_female_kid_act | -5.85e-05 | -0.00569 | 2.63 | 0.00861 | -7.36e-05 | -0.00718 | 2.64 | 0.0084 |
b_has_big_sib_par_act | b_female_kid_car | -5.87e-05 | -0.00362 | 1.23 | 0.219 | -1.24e-05 | -0.000771 | 1.24 | 0.217 |
b_has_big_sib_par_act | b_female_par_act | -0.00044 | -0.0235 | 1.17 | 0.243 | -0.0011 | -0.0591 | 1.15 | 0.25 |
b_has_big_sib_par_act | b_has_big_sib_kid_act | 0.00221 | 0.205 | -2.12 | 0.0342 | 0.00227 | 0.212 | -2.14 | 0.0328 |
b_has_big_sib_par_act | b_has_big_sib_kid_car | 0.00148 | 0.0863 | -1.99 | 0.0465 | 0.00147 | 0.0844 | -1.98 | 0.0481 |
b_has_lil_sib_kid_act | asc_kid_act | -0.0054 | -0.177 | 13.1 | 0 | -0.00525 | -0.166 | 12.8 | 0 |
b_has_lil_sib_kid_act | asc_kid_car | -0.00191 | -0.0423 | 5.67 | 1.41e-08 | -0.0016 | -0.0365 | 5.87 | 4.44e-09 |
b_has_lil_sib_kid_act | asc_par_act | -0.0022 | -0.0352 | 7.21 | 5.64e-13 | -0.00148 | -0.0212 | 6.52 | 6.91e-11 |
b_has_lil_sib_kid_act | b_age_kid_act | 3.15e-05 | 0.023 | 0.147 | 0.883 | 1.78e-05 | 0.0129 | 0.146 | 0.884 |
b_has_lil_sib_kid_act | b_age_kid_car | 2.99e-05 | 0.0142 | 1.9 | 0.0575 | 2.45e-05 | 0.0105 | 1.87 | 0.0617 |
b_has_lil_sib_kid_act | b_age_par_act | 2.21e-05 | 0.00753 | 5.92 | 3.17e-09 | -3.47e-05 | -0.0125 | 5.93 | 3.09e-09 |
b_has_lil_sib_kid_act | b_female_kid_act | -5.75e-05 | -0.0102 | 5.62 | 1.88e-08 | -0.000141 | -0.0247 | 5.56 | 2.65e-08 |
b_has_lil_sib_kid_act | b_female_kid_car | -3.07e-05 | -0.00344 | 2.93 | 0.0034 | -4.1e-05 | -0.00458 | 2.93 | 0.00341 |
b_has_lil_sib_kid_act | b_female_par_act | -5.35e-06 | -0.00052 | 2.68 | 0.0074 | -9.51e-05 | -0.00918 | 2.66 | 0.00782 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_act | 0.00156 | 0.264 | -1.32 | 0.188 | 0.00159 | 0.269 | -1.32 | 0.187 |
b_has_lil_sib_kid_act | b_has_big_sib_kid_car | 0.000561 | 0.0595 | -1.21 | 0.228 | 0.000575 | 0.0594 | -1.18 | 0.236 |
b_has_lil_sib_kid_act | b_has_big_sib_par_act | 0.000666 | 0.0619 | 1.19 | 0.235 | 0.000743 | 0.0692 | 1.2 | 0.232 |
b_has_lil_sib_kid_car | asc_kid_act | -0.0016 | -0.0323 | 13.5 | 0 | -0.00117 | -0.0232 | 13.2 | 0 |
b_has_lil_sib_kid_car | asc_kid_car | -0.0146 | -0.2 | 5.73 | 1.02e-08 | -0.0125 | -0.178 | 5.94 | 2.9e-09 |
b_has_lil_sib_kid_car | asc_par_act | -0.00132 | -0.013 | 7.41 | 1.3e-13 | -0.000778 | -0.00699 | 6.71 | 1.98e-11 |
b_has_lil_sib_kid_car | b_age_kid_act | 1.28e-05 | 0.0058 | 1.66 | 0.0965 | 4.23e-06 | 0.00193 | 1.67 | 0.0945 |
b_has_lil_sib_kid_car | b_age_kid_car | 5.09e-05 | 0.015 | 2.77 | 0.0056 | -0.000255 | -0.0686 | 2.72 | 0.00647 |
b_has_lil_sib_kid_car | b_age_par_act | 1.49e-05 | 0.00314 | 5.42 | 5.87e-08 | -1.83e-05 | -0.00414 | 5.47 | 4.39e-08 |
b_has_lil_sib_kid_car | b_female_kid_act | -6.75e-06 | -0.00074 | 5.53 | 3.24e-08 | -2.13e-05 | -0.00235 | 5.55 | 2.89e-08 |
b_has_lil_sib_kid_car | b_female_kid_car | -0.000203 | -0.0141 | 3.54 | 0.000406 | 0.000183 | 0.0128 | 3.6 | 0.000317 |
b_has_lil_sib_kid_car | b_female_par_act | -1.79e-05 | -0.00108 | 3.34 | 0.000834 | 3.8e-05 | 0.0023 | 3.35 | 0.000802 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_act | 0.00055 | 0.0575 | 0.519 | 0.604 | 0.000563 | 0.0594 | 0.522 | 0.601 |
b_has_lil_sib_kid_car | b_has_big_sib_kid_car | 0.00433 | 0.284 | 0.182 | 0.855 | 0.00406 | 0.263 | 0.178 | 0.859 |
b_has_lil_sib_kid_car | b_has_big_sib_par_act | 0.000444 | 0.0256 | 2.06 | 0.0389 | 0.000467 | 0.0272 | 2.08 | 0.0376 |
b_has_lil_sib_kid_car | b_has_lil_sib_kid_act | 0.00182 | 0.19 | 1.48 | 0.139 | 0.00181 | 0.19 | 1.49 | 0.138 |
b_has_lil_sib_par_act | asc_kid_act | -0.00211 | -0.0379 | 13 | 0 | -0.00166 | -0.029 | 12.7 | 0 |
b_has_lil_sib_par_act | asc_kid_car | -0.00143 | -0.0174 | 5.68 | 1.36e-08 | -0.00112 | -0.0141 | 5.87 | 4.44e-09 |
b_has_lil_sib_par_act | asc_par_act | -0.0172 | -0.151 | 7.06 | 1.65e-12 | -0.0196 | -0.155 | 6.4 | 1.53e-10 |
b_has_lil_sib_par_act | b_age_kid_act | 2.56e-06 | 0.00103 | 0.535 | 0.593 | -3.86e-05 | -0.0155 | 0.535 | 0.593 |
b_has_lil_sib_par_act | b_age_kid_car | -5.91e-07 | -0.000154 | 1.53 | 0.126 | -3.31e-05 | -0.00784 | 1.52 | 0.128 |
b_has_lil_sib_par_act | b_age_par_act | 8.62e-05 | 0.0161 | 3.95 | 7.94e-05 | 0.000567 | 0.113 | 4.06 | 4.86e-05 |
b_has_lil_sib_par_act | b_female_kid_act | -1.6e-06 | -0.000155 | 4.2 | 2.66e-05 | -8.11e-05 | -0.00787 | 4.19 | 2.8e-05 |
b_has_lil_sib_par_act | b_female_kid_car | -2.74e-05 | -0.00168 | 2.59 | 0.00949 | 2.44e-05 | 0.0015 | 2.6 | 0.00927 |
b_has_lil_sib_par_act | b_female_par_act | -0.00033 | -0.0176 | 2.44 | 0.0146 | -0.000599 | -0.0319 | 2.42 | 0.0154 |
b_has_lil_sib_par_act | b_has_big_sib_kid_act | 0.000647 | 0.0599 | -0.377 | 0.706 | 0.000703 | 0.0653 | -0.378 | 0.705 |
b_has_lil_sib_par_act | b_has_big_sib_kid_car | 0.000429 | 0.0249 | -0.574 | 0.566 | 0.000431 | 0.0245 | -0.569 | 0.569 |
b_has_lil_sib_par_act | b_has_big_sib_par_act | 0.00514 | 0.262 | 1.46 | 0.144 | 0.00492 | 0.253 | 1.46 | 0.145 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_act | 0.0022 | 0.204 | 0.441 | 0.659 | 0.00222 | 0.205 | 0.441 | 0.659 |
b_has_lil_sib_par_act | b_has_lil_sib_kid_car | 0.00146 | 0.084 | -0.74 | 0.46 | 0.00147 | 0.0852 | -0.743 | 0.458 |
b_log_density_kid_act | asc_kid_act | -0.00723 | -0.636 | 12.9 | 0 | -0.00801 | -0.655 | 12.5 | 0 |
b_log_density_kid_act | asc_kid_car | -0.00186 | -0.111 | 5.54 | 3.03e-08 | -0.00176 | -0.103 | 5.73 | 1.01e-08 |
b_log_density_kid_act | asc_par_act | -0.00279 | -0.12 | 7.1 | 1.21e-12 | -0.00348 | -0.129 | 6.41 | 1.43e-10 |
b_log_density_kid_act | b_age_kid_act | 1.62e-05 | 0.0319 | -2.77 | 0.00568 | 8.86e-06 | 0.0166 | -2.65 | 0.00798 |
b_log_density_kid_act | b_age_kid_car | -5.03e-06 | -0.00642 | 1.29 | 0.198 | -4.08e-06 | -0.00452 | 1.2 | 0.23 |
b_log_density_kid_act | b_age_par_act | 1.63e-05 | 0.015 | 8.52 | 0 | 2.7e-05 | 0.0252 | 8.75 | 0 |
b_log_density_kid_act | b_female_kid_act | -6.36e-05 | -0.0303 | 6.25 | 4.05e-10 | -5.36e-05 | -0.0244 | 6.21 | 5.34e-10 |
b_log_density_kid_act | b_female_kid_car | -4.11e-06 | -0.00124 | 2.55 | 0.0107 | -2.62e-05 | -0.00757 | 2.55 | 0.0109 |
b_log_density_kid_act | b_female_par_act | -3.16e-05 | -0.00826 | 2.26 | 0.0236 | -1.36e-05 | -0.00339 | 2.25 | 0.0242 |
b_log_density_kid_act | b_has_big_sib_kid_act | 1.74e-05 | 0.00789 | -2.76 | 0.0058 | 3.13e-05 | 0.0136 | -2.75 | 0.0059 |
b_log_density_kid_act | b_has_big_sib_kid_car | 3.05e-06 | 0.000868 | -2.17 | 0.0302 | 3.67e-06 | 0.000976 | -2.12 | 0.0343 |
b_log_density_kid_act | b_has_big_sib_par_act | 2.5e-05 | 0.00624 | 0.571 | 0.568 | -2.68e-05 | -0.00643 | 0.571 | 0.568 |
b_log_density_kid_act | b_has_lil_sib_kid_act | 2.64e-05 | 0.012 | -1.26 | 0.206 | 5.41e-05 | 0.0234 | -1.26 | 0.209 |
b_log_density_kid_act | b_has_lil_sib_kid_car | 6.04e-06 | 0.0017 | -2.36 | 0.0185 | -4.58e-05 | -0.0124 | -2.36 | 0.0184 |
b_log_density_kid_act | b_has_lil_sib_par_act | 2.4e-05 | 0.00599 | -1.17 | 0.242 | 2.88e-05 | 0.00688 | -1.17 | 0.242 |
b_log_density_kid_car | asc_kid_act | -0.00197 | -0.12 | 12.7 | 0 | -0.00188 | -0.118 | 12.4 | 0 |
b_log_density_kid_car | asc_kid_car | -0.0135 | -0.557 | 4.99 | 6.02e-07 | -0.0109 | -0.493 | 5.19 | 2.14e-07 |
b_log_density_kid_car | asc_par_act | -0.00154 | -0.0461 | 6.84 | 8.07e-12 | -0.00169 | -0.048 | 6.18 | 6.58e-10 |
b_log_density_kid_car | b_age_kid_act | 3e-06 | 0.0041 | -7.07 | 1.54e-12 | 4.6e-06 | 0.00661 | -7.39 | 1.45e-13 |
b_log_density_kid_car | b_age_kid_car | 1.39e-05 | 0.0123 | -3.53 | 0.00041 | -1.07e-05 | -0.00907 | -3.5 | 0.000459 |
b_log_density_kid_car | b_age_par_act | 6.53e-06 | 0.00415 | 3.19 | 0.0014 | 1.49e-05 | 0.0106 | 3.39 | 0.000692 |
b_log_density_kid_car | b_female_kid_act | -1.42e-05 | -0.00469 | 3.23 | 0.00122 | -4.02e-05 | -0.014 | 3.25 | 0.00114 |
b_log_density_kid_car | b_female_kid_car | -0.000125 | -0.0261 | 0.647 | 0.518 | -0.000212 | -0.047 | 0.648 | 0.517 |
b_log_density_kid_car | b_female_par_act | -1.56e-05 | -0.00284 | 0.61 | 0.542 | 3.44e-06 | 0.000657 | 0.612 | 0.541 |
b_log_density_kid_car | b_has_big_sib_kid_act | 2.18e-05 | 0.00687 | -5.18 | 2.26e-07 | 2.26e-05 | 0.00751 | -5.24 | 1.57e-07 |
b_log_density_kid_car | b_has_big_sib_kid_car | 7.32e-06 | 0.00145 | -3.85 | 0.00012 | -0.000388 | -0.0791 | -3.71 | 0.000211 |
b_log_density_kid_car | b_has_big_sib_par_act | 2.58e-05 | 0.00447 | -0.984 | 0.325 | 5.15e-06 | 0.000947 | -0.992 | 0.321 |
b_log_density_kid_car | b_has_lil_sib_kid_act | 2.41e-05 | 0.00763 | -3.77 | 0.000161 | -1.9e-05 | -0.0063 | -3.78 | 0.000156 |
b_log_density_kid_car | b_has_lil_sib_kid_car | 1.86e-05 | 0.00364 | -4.02 | 5.9e-05 | 0.000125 | 0.026 | -4.09 | 4.35e-05 |
b_log_density_kid_car | b_has_lil_sib_par_act | 2.8e-05 | 0.00485 | -2.69 | 0.00721 | 7.64e-06 | 0.0014 | -2.7 | 0.00698 |
b_log_density_kid_car | b_log_density_kid_act | 0.000236 | 0.201 | -4.98 | 6.41e-07 | 0.000224 | 0.192 | -5.06 | 4.19e-07 |
b_log_density_par_act | asc_kid_act | -0.00259 | -0.1 | 13.7 | 0 | -0.00341 | -0.109 | 13.2 | 0 |
b_log_density_par_act | asc_kid_car | -0.00147 | -0.0384 | 5.91 | 3.43e-09 | -0.00162 | -0.0372 | 6.09 | 1.13e-09 |
b_log_density_par_act | asc_par_act | -0.038 | -0.717 | 7.01 | 2.37e-12 | -0.0516 | -0.747 | 6.29 | 3.13e-10 |
b_log_density_par_act | b_age_kid_act | -7.51e-06 | -0.00649 | 2.07 | 0.0382 | 1.81e-05 | 0.0132 | 1.79 | 0.074 |
b_log_density_par_act | b_age_kid_car | -2.65e-07 | -0.000149 | 4.01 | 6.18e-05 | 7.01e-06 | 0.00304 | 3.44 | 0.000581 |
b_log_density_par_act | b_age_par_act | -7.94e-05 | -0.0319 | 8.31 | 0 | 7.69e-05 | 0.028 | 7.6 | 3e-14 |
b_log_density_par_act | b_female_kid_act | -1.29e-05 | -0.0027 | 7.42 | 1.13e-13 | 2.45e-05 | 0.00435 | 6.88 | 5.92e-12 |
b_log_density_par_act | b_female_kid_car | -3.86e-06 | -0.000512 | 4.03 | 5.46e-05 | 5.11e-05 | 0.00577 | 3.88 | 0.000105 |
b_log_density_par_act | b_female_par_act | -0.000156 | -0.0179 | 3.62 | 0.000298 | -0.000489 | -0.0476 | 3.44 | 0.000586 |
b_log_density_par_act | b_has_big_sib_kid_act | 1.66e-06 | 0.000332 | 0.0554 | 0.956 | -6.66e-05 | -0.0113 | 0.0512 | 0.959 |
b_log_density_par_act | b_has_big_sib_kid_car | 3.97e-06 | 0.000497 | -0.298 | 0.766 | -2.56e-05 | -0.00267 | -0.281 | 0.779 |
b_log_density_par_act | b_has_big_sib_par_act | 0.000151 | 0.0165 | 2.04 | 0.0412 | 0.000118 | 0.011 | 1.98 | 0.0476 |
b_log_density_par_act | b_has_lil_sib_kid_act | 1.96e-05 | 0.00392 | 1.28 | 0.201 | 2.24e-05 | 0.00379 | 1.18 | 0.236 |
b_log_density_par_act | b_has_lil_sib_kid_car | 4.34e-06 | 0.000537 | -0.487 | 0.626 | -4.56e-05 | -0.00483 | -0.469 | 0.639 |
b_log_density_par_act | b_has_lil_sib_par_act | 0.000201 | 0.022 | 0.42 | 0.675 | -0.000374 | -0.0349 | 0.397 | 0.691 |
b_log_density_par_act | b_log_density_kid_act | 0.000314 | 0.169 | 3.48 | 0.000493 | 0.000372 | 0.162 | 2.99 | 0.0028 |
b_log_density_par_act | b_log_density_kid_car | 0.000183 | 0.0682 | 6.12 | 9.31e-10 | 0.000185 | 0.0619 | 5.45 | 5.04e-08 |
b_log_distance_kid_act | asc_kid_act | 0.00687 | 0.268 | 9.25 | 0 | 0.00616 | 0.224 | 8.93 | 0 |
b_log_distance_kid_act | asc_kid_car | 0.0015 | 0.0396 | 2.49 | 0.0129 | 0.00161 | 0.0422 | 2.57 | 0.0102 |
b_log_distance_kid_act | asc_par_act | 0.00284 | 0.054 | 4.92 | 8.81e-07 | 0.00291 | 0.048 | 4.44 | 9.13e-06 |
b_log_distance_kid_act | b_age_kid_act | -0.000271 | -0.237 | -26.9 | 0 | -0.000284 | -0.237 | -25.9 | 0 |
b_log_distance_kid_act | b_age_kid_car | -5.64e-05 | -0.0319 | -24.9 | 0 | -8.78e-05 | -0.0433 | -23.5 | 0 |
b_log_distance_kid_act | b_age_par_act | -0.000159 | -0.0645 | -18.3 | 0 | -0.000149 | -0.0616 | -18 | 0 |
b_log_distance_kid_act | b_female_kid_act | 0.000293 | 0.0618 | -13.9 | 0 | 0.000338 | 0.0683 | -13.7 | 0 |
b_log_distance_kid_act | b_female_kid_car | 5.09e-05 | 0.0068 | -11.4 | 0 | 0.000114 | 0.0147 | -11.3 | 0 |
b_log_distance_kid_act | b_female_par_act | 0.000155 | 0.0179 | -10.2 | 0 | 0.000523 | 0.058 | -10.3 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_act | -0.000118 | -0.0238 | -20.1 | 0 | -8.46e-05 | -0.0164 | -19.8 | 0 |
b_log_distance_kid_act | b_has_big_sib_kid_car | 1.72e-05 | 0.00217 | -15.1 | 0 | 7.96e-05 | 0.00944 | -14.7 | 0 |
b_log_distance_kid_act | b_has_big_sib_par_act | -0.000139 | -0.0154 | -11.2 | 0 | -6.51e-05 | -0.00696 | -11.2 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_act | -0.000187 | -0.0377 | -18.8 | 0 | -0.000333 | -0.0641 | -18.2 | 0 |
b_log_distance_kid_act | b_has_lil_sib_kid_car | -1.17e-05 | -0.00146 | -15.1 | 0 | -2.45e-05 | -0.00295 | -15 | 0 |
b_log_distance_kid_act | b_has_lil_sib_par_act | -0.000147 | -0.0162 | -12.8 | 0 | -0.000304 | -0.0323 | -12.6 | 0 |
b_log_distance_kid_act | b_log_density_kid_act | -6.28e-05 | -0.0341 | -25.4 | 0 | 1.89e-05 | 0.00941 | -24.7 | 0 |
b_log_distance_kid_act | b_log_density_kid_car | 5.48e-06 | 0.00206 | -20.8 | 0 | 2.04e-05 | 0.00779 | -20.5 | 0 |
b_log_distance_kid_act | b_log_density_par_act | 5.3e-06 | 0.00126 | -22.3 | 0 | -0.000149 | -0.0289 | -19.8 | 0 |
b_log_distance_kid_car | asc_kid_act | 0.00174 | 0.0373 | 12.3 | 0 | 0.00186 | 0.0368 | 11.9 | 0 |
b_log_distance_kid_car | asc_kid_car | 0.0121 | 0.175 | 5.09 | 3.67e-07 | 0.0123 | 0.175 | 5.26 | 1.46e-07 |
b_log_distance_kid_car | asc_par_act | 0.00133 | 0.0139 | 6.67 | 2.52e-11 | 0.00197 | 0.0177 | 6.03 | 1.62e-09 |
b_log_distance_kid_car | b_age_kid_act | -9.37e-05 | -0.0449 | -3.56 | 0.000372 | -0.000153 | -0.0696 | -3.38 | 0.000727 |
b_log_distance_kid_car | b_age_kid_car | -0.000422 | -0.131 | -2.28 | 0.0227 | -0.000376 | -0.101 | -2.17 | 0.0297 |
b_log_distance_kid_car | b_age_par_act | -7.96e-05 | -0.0177 | 0.565 | 0.572 | -0.000119 | -0.0267 | 0.542 | 0.588 |
b_log_distance_kid_car | b_female_kid_act | 9.38e-05 | 0.0109 | 1.19 | 0.234 | 0.000233 | 0.0257 | 1.15 | 0.249 |
b_log_distance_kid_car | b_female_kid_car | 0.000303 | 0.0223 | -0.176 | 0.861 | 6.99e-05 | 0.00489 | -0.17 | 0.865 |
b_log_distance_kid_car | b_female_par_act | 8.24e-05 | 0.00524 | -0.132 | 0.895 | 0.000318 | 0.0192 | -0.13 | 0.897 |
b_log_distance_kid_car | b_has_big_sib_kid_act | -0.000142 | -0.0157 | -3.96 | 7.56e-05 | -1.06e-05 | -0.00112 | -3.85 | 0.000119 |
b_log_distance_kid_car | b_has_big_sib_kid_car | 0.000289 | 0.0201 | -3.61 | 0.000308 | -0.000623 | -0.0402 | -3.38 | 0.000724 |
b_log_distance_kid_car | b_has_big_sib_par_act | -0.000124 | -0.00755 | -1.38 | 0.169 | -0.0001 | -0.00583 | -1.35 | 0.176 |
b_log_distance_kid_car | b_has_lil_sib_kid_act | -0.000182 | -0.0201 | -3.09 | 0.00204 | -0.000141 | -0.0148 | -2.98 | 0.00286 |
b_log_distance_kid_car | b_has_lil_sib_kid_car | 9.05e-06 | 0.000621 | -3.71 | 0.000207 | -0.000485 | -0.0319 | -3.58 | 0.000349 |
b_log_distance_kid_car | b_has_lil_sib_par_act | -0.000149 | -0.00905 | -2.73 | 0.00638 | -0.000226 | -0.0131 | -2.67 | 0.00765 |
b_log_distance_kid_car | b_log_density_kid_act | 4.38e-05 | 0.0131 | -2.77 | 0.00561 | 7.64e-05 | 0.0207 | -2.64 | 0.00827 |
b_log_distance_kid_car | b_log_density_kid_car | 1.71e-05 | 0.00353 | -0.877 | 0.381 | 1.42e-06 | 0.000294 | -0.842 | 0.4 |
b_log_distance_kid_car | b_log_density_par_act | 3.82e-05 | 0.005 | -4.22 | 2.43e-05 | -1.32e-05 | -0.00139 | -3.89 | 9.97e-05 |
b_log_distance_kid_car | b_log_distance_kid_act | 0.00181 | 0.239 | 12.4 | 0 | 0.00221 | 0.266 | 12 | 0 |
b_log_distance_par_act | asc_kid_act | 0.00247 | 0.0564 | 8.53 | 0 | 0.00172 | 0.0367 | 8.25 | 2.22e-16 |
b_log_distance_par_act | asc_kid_car | 0.00121 | 0.0186 | 2.29 | 0.0217 | 0.00122 | 0.0188 | 2.37 | 0.0179 |
b_log_distance_par_act | asc_par_act | 0.0204 | 0.227 | 4.9 | 9.57e-07 | 0.0316 | 0.306 | 4.47 | 7.95e-06 |
b_log_distance_par_act | b_age_kid_act | -4.35e-05 | -0.0222 | -17.8 | 0 | -6.27e-05 | -0.0308 | -17.2 | 0 |
b_log_distance_par_act | b_age_kid_car | -3.54e-05 | -0.0117 | -16.3 | 0 | -5.13e-05 | -0.0149 | -15.6 | 0 |
b_log_distance_par_act | b_age_par_act | -0.000202 | -0.048 | -12.7 | 0 | -0.00073 | -0.178 | -12 | 0 |
b_log_distance_par_act | b_female_kid_act | 0.00011 | 0.0136 | -10.7 | 0 | 0.000447 | 0.0531 | -10.6 | 0 |
b_log_distance_par_act | b_female_kid_car | 3.9e-05 | 0.00304 | -10 | 0 | 0.000179 | 0.0136 | -9.93 | 0 |
b_log_distance_par_act | b_female_par_act | 0.000509 | 0.0345 | -9.38 | 0 | 0.00023 | 0.015 | -9.13 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_act | -1.2e-05 | -0.00142 | -15.9 | 0 | 1.35e-05 | 0.00153 | -15.5 | 0 |
b_log_distance_par_act | b_has_big_sib_kid_car | 2.36e-05 | 0.00174 | -13.2 | 0 | 6.49e-05 | 0.00452 | -12.9 | 0 |
b_log_distance_par_act | b_has_big_sib_par_act | -0.000272 | -0.0176 | -10.2 | 0 | 0.000277 | 0.0174 | -10.2 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_act | -0.000147 | -0.0173 | -14.8 | 0 | -0.000247 | -0.0279 | -14.4 | 0 |
b_log_distance_par_act | b_has_lil_sib_kid_car | -1.08e-05 | -0.00079 | -13.3 | 0 | -4.11e-05 | -0.00291 | -13.1 | 0 |
b_log_distance_par_act | b_has_lil_sib_par_act | -0.000623 | -0.0403 | -11.4 | 0 | -0.00116 | -0.0725 | -11.1 | 0 |
b_log_distance_par_act | b_log_density_kid_act | -6.42e-05 | -0.0204 | -16.7 | 0 | -0.000108 | -0.0314 | -16 | 0 |
b_log_distance_par_act | b_log_density_kid_car | -5.64e-07 | -0.000124 | -14.3 | 0 | -2e-05 | -0.00447 | -13.9 | 0 |
b_log_distance_par_act | b_log_density_par_act | -0.000263 | -0.0366 | -16.5 | 0 | -0.000497 | -0.0567 | -15.2 | 0 |
b_log_distance_par_act | b_log_distance_kid_act | 0.00244 | 0.343 | -0.896 | 0.37 | 0.00268 | 0.348 | -0.866 | 0.387 |
b_log_distance_par_act | b_log_distance_kid_car | 0.00158 | 0.122 | -10.4 | 0 | 0.00198 | 0.14 | -10.1 | 0 |
b_log_income_k_kid_act | asc_kid_act | -0.00869 | -0.508 | 12.3 | 0 | -0.00923 | -0.523 | 11.9 | 0 |
b_log_income_k_kid_act | asc_kid_car | -0.00274 | -0.108 | 5.15 | 2.58e-07 | -0.00261 | -0.106 | 5.33 | 9.98e-08 |
b_log_income_k_kid_act | asc_par_act | -0.00341 | -0.0972 | 6.83 | 8.7e-12 | -0.00259 | -0.0666 | 6.18 | 6.57e-10 |
b_log_income_k_kid_act | b_age_kid_act | 4.16e-05 | 0.0543 | -6.76 | 1.35e-11 | 5.45e-05 | 0.0708 | -6.79 | 1.15e-11 |
b_log_income_k_kid_act | b_age_kid_car | 7.56e-06 | 0.00641 | -3.27 | 0.00109 | 1.36e-05 | 0.0104 | -3.17 | 0.00152 |
b_log_income_k_kid_act | b_age_par_act | 8.71e-06 | 0.00528 | 3.25 | 0.00117 | 1.01e-05 | 0.0065 | 3.33 | 0.000865 |
b_log_income_k_kid_act | b_female_kid_act | -1.84e-05 | -0.00581 | 3.28 | 0.00102 | 3.83e-05 | 0.0121 | 3.3 | 0.000965 |
b_log_income_k_kid_act | b_female_kid_car | -5.87e-06 | -0.00117 | 0.709 | 0.479 | 2.01e-05 | 0.00402 | 0.711 | 0.477 |
b_log_income_k_kid_act | b_female_par_act | -1.27e-05 | -0.0022 | 0.661 | 0.509 | -5.34e-05 | -0.00921 | 0.657 | 0.511 |
b_log_income_k_kid_act | b_has_big_sib_kid_act | 2.61e-05 | 0.00786 | -5.04 | 4.64e-07 | 7.56e-05 | 0.0228 | -5.08 | 3.82e-07 |
b_log_income_k_kid_act | b_has_big_sib_kid_car | -9.58e-06 | -0.00181 | -3.77 | 0.000165 | 1.95e-06 | 0.00036 | -3.7 | 0.00022 |
b_log_income_k_kid_act | b_has_big_sib_par_act | 4.05e-05 | 0.00672 | -0.93 | 0.352 | 1.96e-05 | 0.00327 | -0.934 | 0.35 |
b_log_income_k_kid_act | b_has_lil_sib_kid_act | 0.000155 | 0.0467 | -3.71 | 0.000206 | 0.000121 | 0.0362 | -3.68 | 0.000233 |
b_log_income_k_kid_act | b_has_lil_sib_kid_car | 3.15e-05 | 0.00589 | -3.94 | 8.02e-05 | 4.61e-05 | 0.00866 | -3.97 | 7.18e-05 |
b_log_income_k_kid_act | b_has_lil_sib_par_act | 6.95e-05 | 0.0115 | -2.63 | 0.00851 | 3.86e-05 | 0.00638 | -2.63 | 0.00855 |
b_log_income_k_kid_act | b_log_density_kid_act | 6.27e-05 | 0.0509 | -4.31 | 1.66e-05 | 0.000114 | 0.0882 | -4.32 | 1.57e-05 |
b_log_income_k_kid_act | b_log_density_kid_car | 7.28e-06 | 0.00411 | 0.125 | 0.9 | 9.21e-06 | 0.00546 | 0.128 | 0.898 |
b_log_income_k_kid_act | b_log_density_par_act | 3.03e-05 | 0.0108 | -5.78 | 7.32e-09 | 3.72e-05 | 0.0112 | -5.13 | 2.85e-07 |
b_log_income_k_kid_act | b_log_distance_kid_act | -0.000208 | -0.0747 | 19.9 | 0 | -0.000185 | -0.0637 | 19.4 | 0 |
b_log_income_k_kid_act | b_log_distance_kid_car | -5.85e-05 | -0.0116 | 0.927 | 0.354 | -5.16e-05 | -0.00969 | 0.888 | 0.375 |
b_log_income_k_kid_act | b_log_distance_par_act | -7.07e-05 | -0.0149 | 14.2 | 0 | 0.000165 | 0.0334 | 14 | 0 |
b_log_income_k_kid_car | asc_kid_act | -0.00275 | -0.0959 | 12.6 | 0 | -0.00262 | -0.091 | 12.3 | 0 |
b_log_income_k_kid_car | asc_kid_car | -0.024 | -0.568 | 4.87 | 1.1e-06 | -0.0211 | -0.528 | 5.06 | 4.21e-07 |
b_log_income_k_kid_car | asc_par_act | -0.00226 | -0.0386 | 6.84 | 7.78e-12 | -0.00253 | -0.04 | 6.18 | 6.24e-10 |
b_log_income_k_kid_car | b_age_kid_act | 8.28e-06 | 0.00647 | -3.94 | 8.25e-05 | 1.39e-05 | 0.0111 | -4.03 | 5.56e-05 |
b_log_income_k_kid_car | b_age_kid_car | 9.39e-05 | 0.0476 | -1.96 | 0.0498 | 0.000144 | 0.068 | -1.99 | 0.0462 |
b_log_income_k_kid_car | b_age_par_act | 8.53e-06 | 0.0031 | 2.51 | 0.0122 | 3.3e-05 | 0.0131 | 2.6 | 0.00938 |
b_log_income_k_kid_car | b_female_kid_act | -7.03e-06 | -0.00133 | 2.89 | 0.00381 | 3.72e-05 | 0.00719 | 2.94 | 0.00333 |
b_log_income_k_kid_car | b_female_kid_car | -8.45e-06 | -0.00101 | 0.77 | 0.441 | -0.000356 | -0.0438 | 0.762 | 0.446 |
b_log_income_k_kid_car | b_female_par_act | -6.42e-06 | -0.000666 | 0.726 | 0.468 | -7.17e-05 | -0.0076 | 0.726 | 0.468 |
b_log_income_k_kid_car | b_has_big_sib_kid_act | -1.37e-05 | -0.00246 | -4.03 | 5.48e-05 | 1.09e-06 | 0.000202 | -4.09 | 4.34e-05 |
b_log_income_k_kid_car | b_has_big_sib_kid_car | 7.97e-05 | 0.00902 | -3.34 | 0.000849 | 0.000372 | 0.0421 | -3.35 | 0.000814 |
b_log_income_k_kid_car | b_has_big_sib_par_act | 6.19e-06 | 0.000614 | -0.753 | 0.452 | 7.95e-05 | 0.00813 | -0.762 | 0.446 |
b_log_income_k_kid_car | b_has_lil_sib_kid_act | 2.65e-05 | 0.00478 | -2.88 | 0.00393 | 4.59e-05 | 0.00845 | -2.91 | 0.00356 |
b_log_income_k_kid_car | b_has_lil_sib_kid_car | 0.00046 | 0.0515 | -3.56 | 0.000366 | 0.000636 | 0.0734 | -3.64 | 0.000274 |
b_log_income_k_kid_car | b_has_lil_sib_par_act | 3.44e-05 | 0.00341 | -2.33 | 0.0197 | 7.69e-05 | 0.00781 | -2.35 | 0.0187 |
b_log_income_k_kid_car | b_log_density_kid_act | 7.59e-06 | 0.00369 | -2.58 | 0.0098 | 9.98e-06 | 0.00475 | -2.62 | 0.00879 |
b_log_income_k_kid_car | b_log_density_kid_car | 2.27e-05 | 0.00768 | 0.301 | 0.763 | -0.000134 | -0.049 | 0.304 | 0.761 |
b_log_income_k_kid_car | b_log_density_par_act | 5.96e-06 | 0.00127 | -4.45 | 8.6e-06 | 1.96e-05 | 0.00364 | -4.16 | 3.19e-05 |
b_log_income_k_kid_car | b_log_distance_kid_act | -7.4e-05 | -0.0159 | 16.6 | 0 | -4.8e-05 | -0.0102 | 16.5 | 0 |
b_log_income_k_kid_car | b_log_distance_kid_car | -0.000608 | -0.0719 | 0.942 | 0.346 | -0.000385 | -0.0444 | 0.925 | 0.355 |
b_log_income_k_kid_car | b_log_distance_par_act | -6.33e-05 | -0.00798 | 12.9 | 0 | 1.43e-05 | 0.00178 | 12.7 | 0 |
b_log_income_k_kid_car | b_log_income_k_kid_act | 0.000603 | 0.194 | 0.229 | 0.819 | 0.000561 | 0.185 | 0.232 | 0.817 |
b_log_income_k_par_act | asc_kid_act | -0.00329 | -0.112 | 12.8 | 0 | -0.00274 | -0.0899 | 12.5 | 0 |
b_log_income_k_par_act | asc_kid_car | -0.00224 | -0.0515 | 5.32 | 1.02e-07 | -0.00238 | -0.0563 | 5.5 | 3.83e-08 |
b_log_income_k_par_act | asc_par_act | -0.0248 | -0.411 | 6.74 | 1.62e-11 | -0.0228 | -0.339 | 6.14 | 8.31e-10 |
b_log_income_k_par_act | b_age_kid_act | 1.08e-05 | 0.00823 | -2.57 | 0.0103 | 1.29e-05 | 0.00975 | -2.55 | 0.0108 |
b_log_income_k_par_act | b_age_kid_car | 9.36e-06 | 0.00462 | -0.663 | 0.507 | 1.37e-05 | 0.00608 | -0.651 | 0.515 |
b_log_income_k_par_act | b_age_par_act | 0.000237 | 0.0837 | 3.73 | 0.000189 | 2.73e-05 | 0.0102 | 3.65 | 0.000267 |
b_log_income_k_par_act | b_female_kid_act | -1.21e-05 | -0.00222 | 3.78 | 0.00016 | -2.35e-05 | -0.00428 | 3.75 | 0.000174 |
b_log_income_k_par_act | b_female_kid_car | -5.53e-06 | -0.000644 | 1.46 | 0.143 | -6.54e-05 | -0.00758 | 1.46 | 0.144 |
b_log_income_k_par_act | b_female_par_act | -0.000234 | -0.0236 | 1.34 | 0.181 | -0.000377 | -0.0376 | 1.33 | 0.185 |
b_log_income_k_par_act | b_has_big_sib_kid_act | 2.84e-05 | 0.00498 | -3.09 | 0.002 | 1.47e-05 | 0.00257 | -3.08 | 0.00207 |
b_log_income_k_par_act | b_has_big_sib_kid_car | 5.28e-06 | 0.00058 | -2.63 | 0.00863 | 5.89e-05 | 0.0063 | -2.59 | 0.00971 |
b_log_income_k_par_act | b_has_big_sib_par_act | 0.000688 | 0.0663 | -0.143 | 0.886 | 0.000129 | 0.0124 | -0.14 | 0.889 |
b_log_income_k_par_act | b_has_lil_sib_kid_act | 6.51e-05 | 0.0114 | -1.95 | 0.0516 | 1.01e-05 | 0.00175 | -1.93 | 0.054 |
b_log_income_k_par_act | b_has_lil_sib_kid_car | 3.22e-05 | 0.0035 | -2.79 | 0.0052 | 7.37e-05 | 0.00802 | -2.81 | 0.00497 |
b_log_income_k_par_act | b_has_lil_sib_par_act | 0.000241 | 0.0232 | -1.72 | 0.0847 | 0.000612 | 0.0586 | -1.75 | 0.0802 |
b_log_income_k_par_act | b_log_density_kid_act | 2.49e-05 | 0.0118 | -1.31 | 0.191 | 2.55e-05 | 0.0114 | -1.29 | 0.196 |
b_log_income_k_par_act | b_log_density_kid_car | 4.08e-06 | 0.00134 | 1.43 | 0.152 | 6.19e-06 | 0.00213 | 1.44 | 0.149 |
b_log_income_k_par_act | b_log_density_par_act | 0.000201 | 0.0417 | -3.47 | 0.000518 | -3.25e-06 | -0.000569 | -3.13 | 0.00172 |
b_log_income_k_par_act | b_log_distance_kid_act | -4.42e-05 | -0.00926 | 17.3 | 0 | 0.000198 | 0.0395 | 17.4 | 0 |
b_log_income_k_par_act | b_log_distance_kid_car | -4.55e-05 | -0.00523 | 1.66 | 0.0979 | 5.42e-05 | 0.00589 | 1.6 | 0.109 |
b_log_income_k_par_act | b_log_distance_par_act | -0.000609 | -0.0745 | 13.1 | 0 | -0.000843 | -0.0989 | 12.7 | 0 |
b_log_income_k_par_act | b_log_income_k_kid_act | 0.000707 | 0.222 | 1.48 | 0.139 | 0.000631 | 0.196 | 1.45 | 0.147 |
b_log_income_k_par_act | b_log_income_k_kid_car | 0.000486 | 0.091 | 0.979 | 0.327 | 0.000522 | 0.0996 | 0.992 | 0.321 |
b_non_work_dad_kid_ace | asc_kid_act | -0.0044 | -0.0936 | 12 | 0 | -0.00631 | -0.131 | 11.6 | 0 |
b_non_work_dad_kid_ace | asc_kid_car | -0.00153 | -0.022 | 4.97 | 6.53e-07 | -0.00216 | -0.0323 | 5.13 | 2.91e-07 |
b_non_work_dad_kid_ace | asc_par_act | -0.00215 | -0.0224 | 6.7 | 2.09e-11 | -0.00258 | -0.0243 | 6.06 | 1.36e-09 |
b_non_work_dad_kid_ace | b_age_kid_act | -0.000132 | -0.0628 | -3.1 | 0.00195 | -0.000103 | -0.0492 | -3.12 | 0.00182 |
b_non_work_dad_kid_ace | b_age_kid_car | -3.17e-05 | -0.0098 | -1.9 | 0.0576 | 2.31e-06 | 0.000651 | -1.9 | 0.0572 |
b_non_work_dad_kid_ace | b_age_par_act | -4.61e-05 | -0.0102 | 0.977 | 0.329 | 6.52e-05 | 0.0154 | 0.994 | 0.32 |
b_non_work_dad_kid_ace | b_female_kid_act | 0.000115 | 0.0133 | 1.56 | 0.119 | 2.36e-05 | 0.00273 | 1.55 | 0.12 |
b_non_work_dad_kid_ace | b_female_kid_car | 7.8e-05 | 0.00568 | 0.139 | 0.889 | 0.000155 | 0.0114 | 0.14 | 0.889 |
b_non_work_dad_kid_ace | b_female_par_act | 0.000168 | 0.0106 | 0.159 | 0.874 | 0.000211 | 0.0134 | 0.159 | 0.874 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_act | 6.9e-05 | 0.00757 | -3.61 | 0.000303 | 0.000253 | 0.028 | -3.66 | 0.00025 |
b_non_work_dad_kid_ace | b_has_big_sib_kid_car | 8.44e-05 | 0.00581 | -3.27 | 0.00109 | 0.000249 | 0.0169 | -3.25 | 0.00114 |
b_non_work_dad_kid_ace | b_has_big_sib_par_act | 5.47e-05 | 0.0033 | -1.1 | 0.273 | 0.000136 | 0.0083 | -1.11 | 0.269 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_act | 0.000595 | 0.0655 | -2.82 | 0.00485 | 0.000626 | 0.0689 | -2.83 | 0.00467 |
b_non_work_dad_kid_ace | b_has_lil_sib_kid_car | 0.00023 | 0.0157 | -3.42 | 0.000623 | 0.000191 | 0.0132 | -3.44 | 0.000587 |
b_non_work_dad_kid_ace | b_has_lil_sib_par_act | 0.000248 | 0.015 | -2.47 | 0.0136 | 9.4e-05 | 0.00571 | -2.46 | 0.0137 |
b_non_work_dad_kid_ace | b_log_density_kid_act | 2.07e-05 | 0.00613 | -2.32 | 0.0203 | 0.000176 | 0.0501 | -2.35 | 0.0187 |
b_non_work_dad_kid_ace | b_log_density_kid_car | -1.44e-06 | -0.000296 | -0.457 | 0.647 | 2.8e-05 | 0.0061 | -0.463 | 0.643 |
b_non_work_dad_kid_ace | b_log_density_par_act | 2.54e-05 | 0.0033 | -3.81 | 0.000138 | 7.73e-05 | 0.00859 | -3.67 | 0.000238 |
b_non_work_dad_kid_ace | b_log_distance_kid_act | 2.43e-05 | 0.00319 | 11.4 | 0 | 3.14e-05 | 0.00397 | 11.3 | 0 |
b_non_work_dad_kid_ace | b_log_distance_kid_car | -3.11e-05 | -0.00224 | 0.31 | 0.757 | 0.000149 | 0.0102 | 0.305 | 0.761 |
b_non_work_dad_kid_ace | b_log_distance_par_act | -8.81e-05 | -0.00675 | 10 | 0 | 1.7e-05 | 0.00126 | 9.92 | 0 |
b_non_work_dad_kid_ace | b_log_income_k_kid_act | 0.000778 | 0.153 | -0.542 | 0.588 | 0.000833 | 0.164 | -0.546 | 0.585 |
b_non_work_dad_kid_ace | b_log_income_k_kid_car | 0.000254 | 0.0298 | -0.602 | 0.547 | 0.000281 | 0.0339 | -0.609 | 0.543 |
b_non_work_dad_kid_ace | b_log_income_k_par_act | 0.000334 | 0.0381 | -1.3 | 0.193 | 0.000269 | 0.0307 | -1.3 | 0.193 |
b_non_work_dad_kid_car | asc_kid_act | -0.0016 | -0.0205 | 11.5 | 0 | -0.00246 | -0.0302 | 11.2 | 0 |
b_non_work_dad_kid_car | asc_kid_car | -0.0122 | -0.106 | 4.75 | 2.07e-06 | -0.00226 | -0.02 | 5 | 5.59e-07 |
b_non_work_dad_kid_car | asc_par_act | -0.00128 | -0.00805 | 6.64 | 3.23e-11 | -0.00137 | -0.00764 | 6.02 | 1.77e-09 |
b_non_work_dad_kid_car | b_age_kid_act | -2.87e-05 | -0.00824 | -1.71 | 0.0875 | 7.52e-06 | 0.00212 | -1.68 | 0.093 |
b_non_work_dad_kid_car | b_age_kid_car | -0.000254 | -0.0473 | -0.972 | 0.331 | -0.000667 | -0.111 | -0.944 | 0.345 |
b_non_work_dad_kid_car | b_age_par_act | -2.07e-05 | -0.00277 | 0.798 | 0.425 | -1.78e-06 | -0.000248 | 0.786 | 0.432 |
b_non_work_dad_kid_car | b_female_kid_act | 7.55e-05 | 0.00525 | 1.21 | 0.226 | 0.000146 | 0.00995 | 1.19 | 0.232 |
b_non_work_dad_kid_car | b_female_kid_car | 0.000547 | 0.0241 | 0.269 | 0.788 | 0.00167 | 0.0723 | 0.271 | 0.786 |
b_non_work_dad_kid_car | b_female_par_act | 7.54e-05 | 0.00288 | 0.278 | 0.781 | 0.000143 | 0.00533 | 0.274 | 0.784 |
b_non_work_dad_kid_car | b_has_big_sib_kid_act | 8.63e-05 | 0.00572 | -2.24 | 0.025 | 0.000243 | 0.0159 | -2.21 | 0.0268 |
b_non_work_dad_kid_car | b_has_big_sib_kid_car | 0.000284 | 0.0118 | -2.25 | 0.0244 | 0.000131 | 0.00522 | -2.2 | 0.0277 |
b_non_work_dad_kid_car | b_has_big_sib_par_act | 6.18e-05 | 0.00226 | -0.678 | 0.498 | 0.000141 | 0.00508 | -0.672 | 0.501 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_act | 0.000226 | 0.015 | -1.66 | 0.0967 | 0.000175 | 0.0114 | -1.63 | 0.103 |
b_non_work_dad_kid_car | b_has_lil_sib_kid_car | 0.00171 | 0.0702 | -2.43 | 0.0152 | 0.00252 | 0.102 | -2.44 | 0.0148 |
b_non_work_dad_kid_car | b_has_lil_sib_par_act | 0.000183 | 0.00666 | -1.72 | 0.0863 | 0.000292 | 0.0104 | -1.7 | 0.0894 |
b_non_work_dad_kid_car | b_log_density_kid_act | 2.43e-06 | 0.000434 | -1.24 | 0.217 | 3.84e-05 | 0.00644 | -1.21 | 0.225 |
b_non_work_dad_kid_car | b_log_density_kid_car | -5.22e-05 | -0.00648 | -0.0986 | 0.921 | -0.00106 | -0.137 | -0.0948 | 0.924 |
b_non_work_dad_kid_car | b_log_density_par_act | -7.22e-06 | -0.000566 | -2.31 | 0.021 | -4.81e-05 | -0.00315 | -2.23 | 0.0259 |
b_non_work_dad_kid_car | b_log_distance_kid_act | -3.76e-05 | -0.00298 | 7.6 | 2.93e-14 | 4.49e-05 | 0.00335 | 7.46 | 8.46e-14 |
b_non_work_dad_kid_car | b_log_distance_kid_car | 0.000118 | 0.00512 | 0.391 | 0.695 | -0.000138 | -0.0056 | 0.379 | 0.704 |
b_non_work_dad_kid_car | b_log_distance_par_act | -3.35e-05 | -0.00155 | 7.4 | 1.35e-13 | -6.74e-06 | -0.000295 | 7.24 | 4.48e-13 |
b_non_work_dad_kid_car | b_log_income_k_kid_act | 0.000251 | 0.0298 | -0.136 | 0.891 | 0.000292 | 0.0339 | -0.134 | 0.893 |
b_non_work_dad_kid_car | b_log_income_k_kid_car | 0.00226 | 0.16 | -0.226 | 0.821 | 0.00276 | 0.197 | -0.226 | 0.821 |
b_non_work_dad_kid_car | b_log_income_k_par_act | 0.000221 | 0.0152 | -0.677 | 0.498 | 0.000247 | 0.0166 | -0.667 | 0.505 |
b_non_work_dad_kid_car | b_non_work_dad_kid_ace | 0.00438 | 0.189 | 0.18 | 0.857 | 0.00471 | 0.201 | 0.179 | 0.858 |
b_non_work_dad_par_act | asc_kid_act | -0.00204 | -0.0251 | 12 | 0 | -0.00232 | -0.0292 | 11.8 | 0 |
b_non_work_dad_par_act | asc_kid_car | -0.00126 | -0.0105 | 5.3 | 1.17e-07 | -0.00102 | -0.00924 | 5.49 | 3.98e-08 |
b_non_work_dad_par_act | asc_par_act | -0.0129 | -0.0773 | 6.84 | 8.15e-12 | -0.0101 | -0.0577 | 6.26 | 3.9e-10 |
b_non_work_dad_par_act | b_age_kid_act | -4.42e-05 | -0.0122 | -0.297 | 0.767 | 3.32e-05 | 0.00959 | -0.312 | 0.755 |
b_non_work_dad_par_act | b_age_kid_car | -2.13e-05 | -0.00381 | 0.397 | 0.692 | -1.42e-05 | -0.00242 | 0.415 | 0.678 |
b_non_work_dad_par_act | b_age_par_act | -0.000333 | -0.0426 | 2.07 | 0.0382 | -0.000588 | -0.084 | 2.16 | 0.0305 |
b_non_work_dad_par_act | b_female_kid_act | 0.000162 | 0.0108 | 2.44 | 0.0147 | 0.000195 | 0.0136 | 2.55 | 0.0108 |
b_non_work_dad_par_act | b_female_kid_car | 7.83e-05 | 0.0033 | 1.43 | 0.153 | 0.000156 | 0.00694 | 1.49 | 0.137 |
b_non_work_dad_par_act | b_female_par_act | 0.000654 | 0.0239 | 1.41 | 0.158 | 0.000263 | 0.0101 | 1.45 | 0.147 |
b_non_work_dad_par_act | b_has_big_sib_kid_act | 2.98e-05 | 0.00189 | -0.894 | 0.371 | 0.000171 | 0.0114 | -0.937 | 0.349 |
b_non_work_dad_par_act | b_has_big_sib_kid_car | 4.43e-05 | 0.00176 | -1.02 | 0.309 | 9.94e-05 | 0.00407 | -1.05 | 0.295 |
b_non_work_dad_par_act | b_has_big_sib_par_act | 1.43e-05 | 0.000499 | 0.453 | 0.651 | 0.000464 | 0.0171 | 0.473 | 0.636 |
b_non_work_dad_par_act | b_has_lil_sib_kid_act | 0.000233 | 0.0148 | -0.333 | 0.739 | 6.44e-05 | 0.00428 | -0.346 | 0.729 |
b_non_work_dad_par_act | b_has_lil_sib_kid_car | 0.000166 | 0.00654 | -1.13 | 0.259 | 0.000227 | 0.00946 | -1.17 | 0.241 |
b_non_work_dad_par_act | b_has_lil_sib_par_act | 0.000961 | 0.0335 | -0.56 | 0.576 | 0.00198 | 0.0728 | -0.59 | 0.555 |
b_non_work_dad_par_act | b_log_density_kid_act | 2.25e-06 | 0.000385 | 0.149 | 0.882 | 6.17e-05 | 0.0106 | 0.157 | 0.876 |
b_non_work_dad_par_act | b_log_density_kid_car | -1.08e-05 | -0.00128 | 1.22 | 0.221 | -4.1e-05 | -0.00539 | 1.29 | 0.199 |
b_non_work_dad_par_act | b_log_density_par_act | -0.000265 | -0.0199 | -0.931 | 0.352 | -0.000252 | -0.0169 | -0.955 | 0.34 |
b_non_work_dad_par_act | b_log_distance_kid_act | -5.83e-05 | -0.00442 | 8.59 | 0 | 0.00015 | 0.0115 | 8.98 | 0 |
b_non_work_dad_par_act | b_log_distance_kid_car | -2.34e-05 | -0.000973 | 1.54 | 0.122 | 1.42e-05 | 0.000592 | 1.58 | 0.114 |
b_non_work_dad_par_act | b_log_distance_par_act | -0.00102 | -0.0451 | 8.2 | 2.22e-16 | 0.00033 | 0.0148 | 8.65 | 0 |
b_non_work_dad_par_act | b_log_income_k_kid_act | 0.000347 | 0.0394 | 1.2 | 0.231 | 0.000207 | 0.0246 | 1.25 | 0.211 |
b_non_work_dad_par_act | b_log_income_k_kid_car | 0.000225 | 0.0153 | 1.07 | 0.285 | 0.000208 | 0.0152 | 1.12 | 0.263 |
b_non_work_dad_par_act | b_log_income_k_par_act | 0.00178 | 0.117 | 0.641 | 0.521 | 0.00258 | 0.178 | 0.686 | 0.493 |
b_non_work_dad_par_act | b_non_work_dad_kid_ace | 0.0051 | 0.211 | 1.46 | 0.143 | 0.00444 | 0.194 | 1.51 | 0.131 |
b_non_work_dad_par_act | b_non_work_dad_kid_car | 0.00343 | 0.0856 | 1.02 | 0.309 | 0.00368 | 0.0947 | 1.04 | 0.299 |
b_non_work_mom_kid_act | asc_kid_act | -0.00441 | -0.141 | 12.1 | 0 | -0.0037 | -0.115 | 11.8 | 0 |
b_non_work_mom_kid_act | asc_kid_car | -0.00106 | -0.0229 | 4.93 | 8.43e-07 | -0.00126 | -0.0282 | 5.09 | 3.63e-07 |
b_non_work_mom_kid_act | asc_par_act | -0.00192 | -0.03 | 6.66 | 2.73e-11 | -0.00168 | -0.0237 | 6.02 | 1.71e-09 |
b_non_work_mom_kid_act | b_age_kid_act | 6.96e-05 | 0.0498 | -5.52 | 3.47e-08 | 5.78e-05 | 0.0414 | -5.52 | 3.49e-08 |
b_non_work_mom_kid_act | b_age_kid_car | 3.72e-07 | 0.000173 | -3.57 | 0.000361 | 1.87e-05 | 0.0079 | -3.54 | 0.000398 |
b_non_work_mom_kid_act | b_age_par_act | 4.83e-05 | 0.0161 | 0.643 | 0.52 | 6.87e-05 | 0.0244 | 0.654 | 0.513 |
b_non_work_mom_kid_act | b_female_kid_act | -9.42e-05 | -0.0163 | 1.38 | 0.168 | -0.000329 | -0.0569 | 1.35 | 0.176 |
b_non_work_mom_kid_act | b_female_kid_car | 2.49e-05 | 0.00273 | -0.307 | 0.759 | -3.65e-05 | -0.00402 | -0.306 | 0.759 |
b_non_work_mom_kid_act | b_female_par_act | -4.04e-05 | -0.00384 | -0.242 | 0.808 | -9.35e-05 | -0.00888 | -0.242 | 0.809 |
b_non_work_mom_kid_act | b_has_big_sib_kid_act | -5.85e-05 | -0.00967 | -5.19 | 2.09e-07 | -1.34e-05 | -0.00222 | -5.22 | 1.79e-07 |
b_non_work_mom_kid_act | b_has_big_sib_kid_car | -6.29e-05 | -0.00652 | -4.25 | 2.16e-05 | 3.04e-05 | 0.00309 | -4.2 | 2.65e-05 |
b_non_work_mom_kid_act | b_has_big_sib_par_act | -7.94e-05 | -0.00722 | -1.66 | 0.0978 | 0.000144 | 0.0132 | -1.68 | 0.0933 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_act | -0.000411 | -0.068 | -3.97 | 7.16e-05 | -0.000379 | -0.0625 | -3.98 | 6.99e-05 |
b_non_work_mom_kid_act | b_has_lil_sib_kid_car | -0.000165 | -0.0169 | -4.38 | 1.21e-05 | -0.000107 | -0.0111 | -4.41 | 1.03e-05 |
b_non_work_mom_kid_act | b_has_lil_sib_par_act | -0.000152 | -0.0138 | -3.19 | 0.00144 | -4.77e-05 | -0.00434 | -3.2 | 0.00135 |
b_non_work_mom_kid_act | b_log_density_kid_act | -0.000129 | -0.0574 | -4.09 | 4.39e-05 | -0.00014 | -0.0596 | -4.06 | 4.81e-05 |
b_non_work_mom_kid_act | b_log_density_kid_car | -4.89e-05 | -0.0151 | -1.38 | 0.168 | -5.74e-05 | -0.0187 | -1.4 | 0.163 |
b_non_work_mom_kid_act | b_log_density_par_act | -1.79e-05 | -0.00349 | -5.67 | 1.42e-08 | -7.32e-05 | -0.0122 | -5.26 | 1.47e-07 |
b_non_work_mom_kid_act | b_log_distance_kid_act | 0.000191 | 0.0377 | 14.7 | 0 | 0.000239 | 0.0454 | 14.5 | 0 |
b_non_work_mom_kid_act | b_log_distance_kid_car | 0.000223 | 0.0241 | -0.102 | 0.919 | 0.000126 | 0.013 | -0.0981 | 0.922 |
b_non_work_mom_kid_act | b_log_distance_par_act | -3.8e-05 | -0.00438 | 11.5 | 0 | 3.66e-06 | 0.000408 | 11.3 | 0 |
b_non_work_mom_kid_act | b_log_income_k_kid_act | 0.000657 | 0.194 | -1.59 | 0.111 | 0.000527 | 0.155 | -1.57 | 0.118 |
b_non_work_mom_kid_act | b_log_income_k_kid_car | 0.000205 | 0.0361 | -1.42 | 0.157 | 0.000212 | 0.0385 | -1.43 | 0.152 |
b_non_work_mom_kid_act | b_log_income_k_par_act | 0.000195 | 0.0336 | -2.3 | 0.0213 | 0.000161 | 0.0276 | -2.29 | 0.0219 |
b_non_work_mom_kid_act | b_non_work_dad_kid_ace | -0.000288 | -0.031 | -0.458 | 0.647 | 4.71e-05 | 0.0051 | -0.467 | 0.64 |
b_non_work_mom_kid_act | b_non_work_dad_kid_car | -0.000124 | -0.00803 | -0.489 | 0.625 | 4.34e-05 | 0.00277 | -0.483 | 0.629 |
b_non_work_mom_kid_act | b_non_work_dad_par_act | -0.000205 | -0.0127 | -1.72 | 0.0852 | 0.000138 | 0.00903 | -1.81 | 0.0703 |
b_non_work_mom_kid_car | asc_kid_act | -0.00148 | -0.0278 | 11.1 | 0 | -0.00166 | -0.0304 | 10.8 | 0 |
b_non_work_mom_kid_car | asc_kid_car | -0.0116 | -0.147 | 4.15 | 3.36e-05 | -0.0112 | -0.148 | 4.28 | 1.88e-05 |
b_non_work_mom_kid_car | asc_par_act | -0.00123 | -0.0113 | 6.19 | 6.18e-10 | -0.00133 | -0.011 | 5.6 | 2.15e-08 |
b_non_work_mom_kid_car | b_age_kid_act | 2.25e-05 | 0.00948 | -5.87 | 4.43e-09 | 4.5e-05 | 0.0189 | -5.88 | 4.13e-09 |
b_non_work_mom_kid_car | b_age_kid_car | 0.000223 | 0.061 | -4.8 | 1.57e-06 | 0.000273 | 0.0677 | -4.8 | 1.6e-06 |
b_non_work_mom_kid_car | b_age_par_act | 2.64e-05 | 0.00517 | -2.12 | 0.0338 | 7.42e-05 | 0.0155 | -2.14 | 0.0324 |
b_non_work_mom_kid_car | b_female_kid_act | 1.11e-06 | 0.000113 | -1.32 | 0.187 | -5.3e-05 | -0.00539 | -1.31 | 0.189 |
b_non_work_mom_kid_car | b_female_kid_car | 1.43e-05 | 0.000923 | -2.22 | 0.0261 | 1.76e-05 | 0.00114 | -2.23 | 0.0259 |
b_non_work_mom_kid_car | b_female_par_act | -1.15e-05 | -0.000644 | -2.05 | 0.0402 | -6.55e-05 | -0.00366 | -2.05 | 0.0407 |
b_non_work_mom_kid_car | b_has_big_sib_kid_act | -3.71e-05 | -0.0036 | -5.98 | 2.18e-09 | 6.47e-05 | 0.0063 | -6.02 | 1.79e-09 |
b_non_work_mom_kid_car | b_has_big_sib_kid_car | -0.00027 | -0.0164 | -5.31 | 1.1e-07 | 0.000517 | 0.0308 | -5.38 | 7.26e-08 |
b_non_work_mom_kid_car | b_has_big_sib_par_act | -9.58e-06 | -0.000512 | -3.19 | 0.00143 | -7.1e-05 | -0.00382 | -3.19 | 0.00141 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_act | -0.000154 | -0.015 | -5.17 | 2.39e-07 | -0.000106 | -0.0103 | -5.17 | 2.29e-07 |
b_non_work_mom_kid_car | b_has_lil_sib_kid_car | -0.0012 | -0.0723 | -5.29 | 1.25e-07 | -0.00179 | -0.109 | -5.22 | 1.81e-07 |
b_non_work_mom_kid_car | b_has_lil_sib_par_act | -9.59e-05 | -0.00512 | -4.46 | 8.27e-06 | -0.000112 | -0.00601 | -4.46 | 8.17e-06 |
b_non_work_mom_kid_car | b_log_density_kid_act | -2.7e-05 | -0.00708 | -5.1 | 3.35e-07 | -4.16e-05 | -0.0104 | -5.09 | 3.55e-07 |
b_non_work_mom_kid_car | b_log_density_kid_car | -0.00025 | -0.0454 | -3.34 | 0.000823 | -0.000309 | -0.0593 | -3.35 | 0.000804 |
b_non_work_mom_kid_car | b_log_density_par_act | -2.42e-05 | -0.00278 | -6.25 | 4.1e-10 | -4.18e-05 | -0.00409 | -6.03 | 1.62e-09 |
b_non_work_mom_kid_car | b_log_distance_kid_act | 3.12e-05 | 0.00361 | 7.52 | 5.44e-14 | -1.79e-05 | -0.002 | 7.45 | 9.39e-14 |
b_non_work_mom_kid_car | b_log_distance_kid_car | 0.00026 | 0.0166 | -2.07 | 0.0387 | -3.76e-05 | -0.00228 | -2 | 0.0451 |
b_non_work_mom_kid_car | b_log_distance_par_act | 1.15e-05 | 0.000777 | 6.99 | 2.8e-12 | 0.000133 | 0.0087 | 6.91 | 4.72e-12 |
b_non_work_mom_kid_car | b_log_income_k_kid_act | 0.000195 | 0.0339 | -3.46 | 0.000539 | 0.000218 | 0.0379 | -3.47 | 0.000527 |
b_non_work_mom_kid_car | b_log_income_k_kid_car | 0.00163 | 0.169 | -3.54 | 0.000394 | 0.00132 | 0.141 | -3.51 | 0.000442 |
b_non_work_mom_kid_car | b_log_income_k_par_act | 0.000147 | 0.0148 | -3.92 | 8.9e-05 | 0.000178 | 0.0179 | -3.92 | 8.84e-05 |
b_non_work_mom_kid_car | b_non_work_dad_kid_ace | -0.000134 | -0.00848 | -2.32 | 0.0201 | 4.16e-05 | 0.00265 | -2.34 | 0.0191 |
b_non_work_mom_kid_car | b_non_work_dad_kid_car | -0.00101 | -0.0387 | -1.88 | 0.06 | -0.000823 | -0.0309 | -1.87 | 0.0622 |
b_non_work_mom_kid_car | b_non_work_dad_par_act | -0.000103 | -0.00375 | -2.98 | 0.00288 | 0.000209 | 0.00804 | -3.1 | 0.00193 |
b_non_work_mom_kid_car | b_non_work_mom_kid_act | 0.00186 | 0.177 | -2.46 | 0.0139 | 0.00185 | 0.177 | -2.46 | 0.0139 |
b_non_work_mom_par_act | asc_kid_act | -0.00148 | -0.0266 | 13.1 | 0 | -0.00129 | -0.0227 | 12.8 | 0 |
b_non_work_mom_par_act | asc_kid_car | -0.000974 | -0.0118 | 5.75 | 9.02e-09 | -0.0012 | -0.0151 | 5.93 | 2.98e-09 |
b_non_work_mom_par_act | asc_par_act | -0.0164 | -0.144 | 7.11 | 1.13e-12 | -0.00929 | -0.0741 | 6.52 | 6.98e-11 |
b_non_work_mom_par_act | b_age_kid_act | 3.63e-05 | 0.0146 | 0.805 | 0.421 | 4.99e-05 | 0.0201 | 0.813 | 0.416 |
b_non_work_mom_par_act | b_age_kid_car | 2.95e-05 | 0.00768 | 1.8 | 0.0724 | 6.63e-05 | 0.0158 | 1.81 | 0.0706 |
b_non_work_mom_par_act | b_age_par_act | 0.000131 | 0.0243 | 4.21 | 2.5e-05 | 5.15e-05 | 0.0103 | 4.25 | 2.13e-05 |
b_non_work_mom_par_act | b_female_kid_act | -1.78e-05 | -0.00172 | 4.44 | 9.19e-06 | -9.36e-05 | -0.00914 | 4.45 | 8.6e-06 |
b_non_work_mom_par_act | b_female_kid_car | 9.48e-06 | 0.000583 | 2.8 | 0.00504 | -5.81e-05 | -0.00361 | 2.82 | 0.00486 |
b_non_work_mom_par_act | b_female_par_act | -0.000901 | -0.048 | 2.6 | 0.00938 | 9.69e-05 | 0.00519 | 2.67 | 0.00748 |
b_non_work_mom_par_act | b_has_big_sib_kid_act | -9.56e-05 | -0.00884 | -0.129 | 0.898 | 0.000131 | 0.0122 | -0.131 | 0.896 |
b_non_work_mom_par_act | b_has_big_sib_kid_car | -3.66e-05 | -0.00213 | -0.362 | 0.717 | -1.53e-05 | -0.000875 | -0.361 | 0.718 |
b_non_work_mom_par_act | b_has_big_sib_par_act | -0.000221 | -0.0113 | 1.44 | 0.15 | 0.000174 | 0.00897 | 1.46 | 0.143 |
b_non_work_mom_par_act | b_has_lil_sib_kid_act | -0.000182 | -0.0168 | 0.634 | 0.526 | -7.17e-05 | -0.00668 | 0.641 | 0.522 |
b_non_work_mom_par_act | b_has_lil_sib_kid_car | -0.000142 | -0.00818 | -0.502 | 0.615 | -0.000125 | -0.00728 | -0.507 | 0.612 |
b_non_work_mom_par_act | b_has_lil_sib_par_act | -0.00228 | -0.116 | 0.182 | 0.856 | -0.00181 | -0.0929 | 0.185 | 0.854 |
b_non_work_mom_par_act | b_log_density_kid_act | -4.96e-05 | -0.0124 | 1.43 | 0.152 | -9e-05 | -0.0216 | 1.44 | 0.151 |
b_non_work_mom_par_act | b_log_density_kid_car | -4.94e-05 | -0.00855 | 2.93 | 0.00334 | -8.03e-05 | -0.0148 | 2.97 | 0.00302 |
b_non_work_mom_par_act | b_log_density_par_act | -0.000466 | -0.051 | -0.167 | 0.868 | -0.00135 | -0.127 | -0.157 | 0.875 |
b_non_work_mom_par_act | b_log_distance_kid_act | 7.08e-05 | 0.00782 | 13.1 | 0 | 0.00013 | 0.0139 | 13.1 | 0 |
b_non_work_mom_par_act | b_log_distance_kid_car | 0.000171 | 0.0104 | 2.96 | 0.00306 | 0.00036 | 0.021 | 2.93 | 0.00339 |
b_non_work_mom_par_act | b_log_distance_par_act | -0.00061 | -0.0394 | 11.6 | 0 | -0.000348 | -0.0219 | 11.6 | 0 |
b_non_work_mom_par_act | b_log_income_k_kid_act | 0.000196 | 0.0324 | 2.91 | 0.00366 | 0.000149 | 0.0249 | 2.92 | 0.00347 |
b_non_work_mom_par_act | b_log_income_k_kid_car | 0.000148 | 0.0146 | 2.58 | 0.00974 | 0.000176 | 0.018 | 2.62 | 0.00881 |
b_non_work_mom_par_act | b_log_income_k_par_act | 0.00226 | 0.217 | 2.15 | 0.0317 | 0.00182 | 0.176 | 2.12 | 0.0342 |
b_non_work_mom_par_act | b_non_work_dad_kid_ace | -0.000207 | -0.0125 | 2.64 | 0.00829 | 0.00015 | 0.00916 | 2.69 | 0.00719 |
b_non_work_mom_par_act | b_non_work_dad_kid_car | -0.000108 | -0.00395 | 1.86 | 0.0623 | 0.000166 | 0.00598 | 1.86 | 0.0635 |
b_non_work_mom_par_act | b_non_work_dad_par_act | -0.000866 | -0.0302 | 0.694 | 0.487 | 0.000945 | 0.0349 | 0.742 | 0.458 |
b_non_work_mom_par_act | b_non_work_mom_kid_act | 0.0022 | 0.199 | 3.78 | 0.000159 | 0.0022 | 0.201 | 3.81 | 0.00014 |
b_non_work_mom_par_act | b_non_work_mom_kid_car | 0.00152 | 0.0808 | 4.86 | 1.15e-06 | 0.0014 | 0.0754 | 4.87 | 1.09e-06 |
b_veh_per_driver_kid_act | asc_kid_act | -0.00609 | -0.185 | 12 | 0 | -0.00666 | -0.187 | 11.7 | 0 |
b_veh_per_driver_kid_act | asc_kid_car | -0.00167 | -0.0342 | 4.96 | 7.19e-07 | -0.00115 | -0.0232 | 5.12 | 3e-07 |
b_veh_per_driver_kid_act | asc_par_act | -0.00172 | -0.0254 | 6.69 | 2.21e-11 | -0.00127 | -0.0161 | 6.05 | 1.45e-09 |
b_veh_per_driver_kid_act | b_age_kid_act | -4.12e-05 | -0.028 | -4.84 | 1.28e-06 | -2.22e-05 | -0.0143 | -4.62 | 3.77e-06 |
b_veh_per_driver_kid_act | b_age_kid_car | 1.37e-06 | 0.000603 | -3.1 | 0.00197 | -1.95e-05 | -0.0074 | -2.92 | 0.0035 |
b_veh_per_driver_kid_act | b_age_par_act | -5.89e-05 | -0.0186 | 0.896 | 0.37 | -4.22e-05 | -0.0135 | 0.869 | 0.385 |
b_veh_per_driver_kid_act | b_female_kid_act | 8.68e-05 | 0.0143 | 1.6 | 0.109 | 5.96e-05 | 0.00927 | 1.55 | 0.121 |
b_veh_per_driver_kid_act | b_female_kid_car | 3.57e-05 | 0.00371 | -0.115 | 0.908 | 5.59e-05 | 0.00553 | -0.113 | 0.91 |
b_veh_per_driver_kid_act | b_female_par_act | 0.000112 | 0.0101 | -0.0713 | 0.943 | 0.000106 | 0.00904 | -0.0701 | 0.944 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_act | 0.000161 | 0.0252 | -4.9 | 9.67e-07 | 1.71e-05 | 0.00255 | -4.71 | 2.45e-06 |
b_veh_per_driver_kid_act | b_has_big_sib_kid_car | 8.18e-05 | 0.00804 | -4.03 | 5.63e-05 | 0.00013 | 0.0119 | -3.91 | 9.21e-05 |
b_veh_per_driver_kid_act | b_has_big_sib_par_act | 7.08e-06 | 0.00061 | -1.48 | 0.14 | 9.82e-05 | 0.00808 | -1.47 | 0.143 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_act | -4.63e-05 | -0.00726 | -3.74 | 0.000183 | -0.000218 | -0.0324 | -3.59 | 0.000335 |
b_veh_per_driver_kid_act | b_has_lil_sib_kid_car | 4.18e-05 | 0.00406 | -4.17 | 3.05e-05 | 2.09e-05 | 0.00194 | -4.12 | 3.84e-05 |
b_veh_per_driver_kid_act | b_has_lil_sib_par_act | -4.2e-05 | -0.00361 | -3 | 0.00274 | -6.55e-05 | -0.00536 | -2.95 | 0.00313 |
b_veh_per_driver_kid_act | b_log_density_kid_act | 0.000155 | 0.0653 | -3.74 | 0.000184 | 0.000127 | 0.0487 | -3.54 | 0.000406 |
b_veh_per_driver_kid_act | b_log_density_kid_car | 3.7e-05 | 0.0109 | -1.05 | 0.294 | 4.11e-05 | 0.0121 | -1.02 | 0.31 |
b_veh_per_driver_kid_act | b_log_density_par_act | 1.28e-05 | 0.00237 | -5.25 | 1.5e-07 | -5.72e-06 | -0.000856 | -4.76 | 1.92e-06 |
b_veh_per_driver_kid_act | b_log_distance_kid_act | 6.25e-05 | 0.0117 | 14.3 | 0 | 0.000164 | 0.0279 | 13.7 | 0 |
b_veh_per_driver_kid_act | b_log_distance_kid_car | -0.000104 | -0.0107 | 0.0848 | 0.932 | 0.000163 | 0.0151 | 0.0817 | 0.935 |
b_veh_per_driver_kid_act | b_log_distance_par_act | 0.000321 | 0.0351 | 11.7 | 0 | 0.00043 | 0.043 | 11.3 | 0 |
b_veh_per_driver_kid_act | b_log_income_k_kid_act | -0.000561 | -0.157 | -1.05 | 0.294 | -0.000575 | -0.152 | -1.01 | 0.313 |
b_veh_per_driver_kid_act | b_log_income_k_kid_car | -0.000107 | -0.0179 | -1.1 | 0.273 | -0.000143 | -0.0233 | -1.07 | 0.283 |
b_veh_per_driver_kid_act | b_log_income_k_par_act | -0.000168 | -0.0274 | -1.93 | 0.053 | -0.00021 | -0.0323 | -1.87 | 0.0615 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_ace | 0.00042 | 0.0428 | -0.278 | 0.781 | 0.00033 | 0.0322 | -0.273 | 0.785 |
b_veh_per_driver_kid_act | b_non_work_dad_kid_car | 0.000114 | 0.00703 | -0.363 | 0.717 | 5.7e-05 | 0.00327 | -0.354 | 0.723 |
b_veh_per_driver_kid_act | b_non_work_dad_par_act | 0.000243 | 0.0143 | -1.6 | 0.109 | 3.29e-05 | 0.00194 | -1.65 | 0.0986 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_act | 0.000139 | 0.0213 | 0.235 | 0.815 | 0.000352 | 0.0514 | 0.232 | 0.817 |
b_veh_per_driver_kid_act | b_non_work_mom_kid_car | 5e-05 | 0.00451 | 2.4 | 0.0163 | 2.19e-05 | 0.00188 | 2.37 | 0.018 |
b_veh_per_driver_kid_act | b_non_work_mom_par_act | 7.98e-05 | 0.00686 | -3.24 | 0.00119 | 0.000152 | 0.0125 | -3.23 | 0.00125 |
b_veh_per_driver_kid_car | asc_kid_act | -0.0014 | -0.0354 | 13.2 | 0 | -0.000981 | -0.0223 | 12.9 | 0 |
b_veh_per_driver_kid_car | asc_kid_car | -0.0102 | -0.175 | 5.49 | 4.03e-08 | -0.00676 | -0.111 | 5.71 | 1.16e-08 |
b_veh_per_driver_kid_car | asc_par_act | -0.001 | -0.0124 | 7.18 | 6.88e-13 | -0.000513 | -0.00529 | 6.49 | 8.5e-11 |
b_veh_per_driver_kid_car | b_age_kid_act | -1.55e-05 | -0.00875 | -0.0347 | 0.972 | -2.9e-05 | -0.0151 | -0.0323 | 0.974 |
b_veh_per_driver_kid_car | b_age_kid_car | -7.39e-05 | -0.027 | 1.34 | 0.181 | -0.000227 | -0.0699 | 1.23 | 0.22 |
b_veh_per_driver_kid_car | b_age_par_act | -2.16e-05 | -0.00567 | 4.6 | 4.25e-06 | -2.82e-05 | -0.00731 | 4.33 | 1.47e-05 |
b_veh_per_driver_kid_car | b_female_kid_act | 4.61e-05 | 0.0063 | 4.74 | 2.09e-06 | 2.39e-05 | 0.00302 | 4.5 | 6.7e-06 |
b_veh_per_driver_kid_car | b_female_kid_car | 0.000206 | 0.0178 | 2.59 | 0.00949 | -0.000836 | -0.0672 | 2.41 | 0.0159 |
b_veh_per_driver_kid_car | b_female_par_act | 5.19e-05 | 0.00389 | 2.39 | 0.0168 | 3.87e-05 | 0.00269 | 2.32 | 0.0203 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_act | 4.55e-05 | 0.00592 | -1.1 | 0.272 | 5.72e-05 | 0.00693 | -1.05 | 0.295 |
b_veh_per_driver_kid_car | b_has_big_sib_kid_car | 0.00054 | 0.0441 | -1.2 | 0.232 | 0.000242 | 0.018 | -1.13 | 0.259 |
b_veh_per_driver_kid_car | b_has_big_sib_par_act | 4.39e-06 | 0.000315 | 0.987 | 0.324 | -2.09e-05 | -0.00139 | 0.964 | 0.335 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_act | 6.14e-06 | 0.0008 | -0.119 | 0.905 | -1.71e-05 | -0.00206 | -0.113 | 0.91 |
b_veh_per_driver_kid_car | b_has_lil_sib_kid_car | 0.000282 | 0.0228 | -1.35 | 0.179 | 0.000301 | 0.0227 | -1.31 | 0.19 |
b_veh_per_driver_kid_car | b_has_lil_sib_par_act | -2.4e-05 | -0.00172 | -0.46 | 0.646 | -8.26e-05 | -0.00549 | -0.447 | 0.655 |
b_veh_per_driver_kid_car | b_log_density_kid_act | 2.94e-05 | 0.0103 | 0.853 | 0.394 | 3.04e-05 | 0.00947 | 0.793 | 0.428 |
b_veh_per_driver_kid_car | b_log_density_kid_car | 0.000141 | 0.0345 | 2.94 | 0.00331 | 0.000148 | 0.0354 | 2.77 | 0.00563 |
b_veh_per_driver_kid_car | b_log_density_par_act | 2.42e-05 | 0.00373 | -1.21 | 0.227 | 2.19e-05 | 0.00266 | -1.09 | 0.276 |
b_veh_per_driver_kid_car | b_log_distance_kid_act | 1.34e-05 | 0.00209 | 16 | 0 | 9.55e-05 | 0.0132 | 15.1 | 0 |
b_veh_per_driver_kid_car | b_log_distance_kid_car | 6.89e-05 | 0.00589 | 2.75 | 0.00601 | 1.49e-05 | 0.00113 | 2.58 | 0.00989 |
b_veh_per_driver_kid_car | b_log_distance_par_act | 3.78e-05 | 0.00344 | 13.5 | 0 | 6.24e-05 | 0.00507 | 12.8 | 0 |
b_veh_per_driver_kid_car | b_log_income_k_kid_act | -0.000103 | -0.0239 | 2.79 | 0.00529 | -0.000135 | -0.0291 | 2.61 | 0.00901 |
b_veh_per_driver_kid_car | b_log_income_k_kid_car | -0.000535 | -0.0746 | 2.26 | 0.0236 | -0.0013 | -0.172 | 2.08 | 0.0371 |
b_veh_per_driver_kid_car | b_log_income_k_par_act | -6.82e-05 | -0.00923 | 1.54 | 0.125 | -0.000114 | -0.0142 | 1.45 | 0.146 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_ace | 0.000108 | 0.00912 | 2.4 | 0.0162 | 1.28e-05 | 0.00102 | 2.32 | 0.0201 |
b_veh_per_driver_kid_car | b_non_work_dad_kid_car | 0.000492 | 0.0252 | 1.53 | 0.126 | -0.000457 | -0.0213 | 1.46 | 0.145 |
b_veh_per_driver_kid_car | b_non_work_dad_par_act | 9.12e-05 | 0.00447 | 0.253 | 0.8 | -5.5e-05 | -0.00263 | 0.258 | 0.797 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_act | 6.46e-05 | 0.00824 | 3.45 | 0.000562 | 9.19e-05 | 0.0109 | 3.3 | 0.000984 |
b_veh_per_driver_kid_car | b_non_work_mom_kid_car | 0.00033 | 0.0248 | 4.77 | 1.8e-06 | 0.000904 | 0.063 | 4.74 | 2.17e-06 |
b_veh_per_driver_kid_car | b_non_work_mom_par_act | 8.53e-05 | 0.0061 | -0.683 | 0.495 | 0.000171 | 0.0115 | -0.671 | 0.502 |
b_veh_per_driver_kid_car | b_veh_per_driver_kid_act | 0.00152 | 0.184 | 3.49 | 0.000484 | 0.00142 | 0.151 | 3.21 | 0.00135 |
b_veh_per_driver_par_act | asc_kid_act | -0.00261 | -0.0341 | 9.19 | 0 | -0.00214 | -0.0229 | 8.69 | 0 |
b_veh_per_driver_par_act | asc_kid_car | -0.00123 | -0.0109 | 3.24 | 0.00118 | -0.000835 | -0.00641 | 3.28 | 0.00105 |
b_veh_per_driver_par_act | asc_par_act | -0.0309 | -0.197 | 5.21 | 1.89e-07 | -0.0586 | -0.283 | 4.59 | 4.52e-06 |
b_veh_per_driver_par_act | b_age_kid_act | -1.34e-05 | -0.00392 | -7.02 | 2.23e-12 | -4.15e-06 | -0.00102 | -5.9 | 3.68e-09 |
b_veh_per_driver_par_act | b_age_kid_car | -9.85e-06 | -0.00187 | -6.24 | 4.25e-10 | 2.11e-05 | 0.00305 | -5.25 | 1.52e-07 |
b_veh_per_driver_par_act | b_age_par_act | 0.000255 | 0.0346 | -4.42 | 9.92e-06 | 0.000614 | 0.0745 | -3.75 | 0.000175 |
b_veh_per_driver_par_act | b_female_kid_act | 8.07e-05 | 0.00572 | -3.73 | 0.000189 | 5.86e-05 | 0.00347 | -3.19 | 0.00143 |
b_veh_per_driver_par_act | b_female_kid_car | 4.23e-05 | 0.0019 | -4.28 | 1.9e-05 | 0.000158 | 0.00596 | -3.75 | 0.00018 |
b_veh_per_driver_par_act | b_female_par_act | 0.000955 | 0.0371 | -4.15 | 3.38e-05 | 0.00139 | 0.0453 | -3.67 | 0.000247 |
b_veh_per_driver_par_act | b_has_big_sib_kid_act | 5.65e-05 | 0.00381 | -7.2 | 5.84e-13 | 0.000206 | 0.0117 | -6.19 | 6.15e-10 |
b_veh_per_driver_par_act | b_has_big_sib_kid_car | 5.09e-05 | 0.00216 | -6.75 | 1.52e-11 | -7.27e-06 | -0.000253 | -5.88 | 4.04e-09 |
b_veh_per_driver_par_act | b_has_big_sib_par_act | -0.000311 | -0.0116 | -4.95 | 7.53e-07 | 0.000877 | 0.0275 | -4.47 | 7.94e-06 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_act | 5.54e-06 | 0.000374 | -6.6 | 3.99e-11 | 9.04e-06 | 0.000511 | -5.66 | 1.56e-08 |
b_veh_per_driver_par_act | b_has_lil_sib_kid_car | 3.92e-05 | 0.00164 | -6.84 | 7.94e-12 | -8.14e-05 | -0.00288 | -6 | 1.93e-09 |
b_veh_per_driver_par_act | b_has_lil_sib_par_act | -0.000767 | -0.0284 | -5.94 | 2.92e-09 | 0.000717 | 0.0223 | -5.38 | 7.28e-08 |
b_veh_per_driver_par_act | b_log_density_kid_act | 2.96e-05 | 0.00538 | -6.51 | 7.59e-11 | 5.56e-05 | 0.00811 | -5.48 | 4.37e-08 |
b_veh_per_driver_par_act | b_log_density_kid_car | 3.3e-05 | 0.00418 | -5.29 | 1.21e-07 | 3.59e-05 | 0.00401 | -4.47 | 7.66e-06 |
b_veh_per_driver_par_act | b_log_density_par_act | 0.00119 | 0.0949 | -7.59 | 3.18e-14 | 0.00222 | 0.126 | -6.44 | 1.19e-10 |
b_veh_per_driver_par_act | b_log_distance_kid_act | 9.67e-05 | 0.00779 | 2.71 | 0.00672 | -5.49e-05 | -0.00356 | 2.29 | 0.0218 |
b_veh_per_driver_par_act | b_log_distance_kid_car | -7.34e-05 | -0.00325 | -4.13 | 3.7e-05 | -9.33e-05 | -0.0033 | -3.57 | 0.000356 |
b_veh_per_driver_par_act | b_log_distance_par_act | 0.000151 | 0.00711 | 2.91 | 0.00356 | -0.00185 | -0.0704 | 2.45 | 0.0144 |
b_veh_per_driver_par_act | b_log_income_k_kid_act | -0.000131 | -0.0159 | -5.3 | 1.19e-07 | -0.000291 | -0.0294 | -4.47 | 7.99e-06 |
b_veh_per_driver_par_act | b_log_income_k_kid_car | -7.19e-05 | -0.00519 | -5.18 | 2.27e-07 | -0.000191 | -0.0118 | -4.43 | 9.61e-06 |
b_veh_per_driver_par_act | b_log_income_k_par_act | -0.004 | -0.281 | -5.17 | 2.36e-07 | -0.00516 | -0.302 | -4.44 | 9.04e-06 |
b_veh_per_driver_par_act | b_non_work_dad_kid_ace | 0.000241 | 0.0106 | -4.37 | 1.23e-05 | 1.13e-06 | 4.17e-05 | -3.81 | 0.000137 |
b_veh_per_driver_par_act | b_non_work_dad_kid_car | 8.83e-05 | 0.00234 | -3.72 | 0.000199 | 8.84e-06 | 0.000193 | -3.36 | 0.000786 |
b_veh_per_driver_par_act | b_non_work_dad_par_act | 0.0032 | 0.0812 | -4.81 | 1.48e-06 | -0.00137 | -0.0307 | -4.24 | 2.2e-05 |
b_veh_per_driver_par_act | b_non_work_mom_kid_act | 4.94e-05 | 0.00327 | -4.42 | 1e-05 | 0.000185 | 0.0103 | -3.8 | 0.000148 |
b_veh_per_driver_par_act | b_non_work_mom_kid_car | 4.77e-05 | 0.00186 | -2.42 | 0.0156 | 6.8e-05 | 0.00222 | -2.14 | 0.0327 |
b_veh_per_driver_par_act | b_non_work_mom_par_act | 0.00102 | 0.0377 | -6.29 | 3.21e-10 | 0.00165 | 0.0518 | -5.61 | 1.99e-08 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_act | 0.00276 | 0.173 | -4.82 | 1.46e-06 | 0.00253 | 0.127 | -4.02 | 5.88e-05 |
b_veh_per_driver_par_act | b_veh_per_driver_kid_car | 0.00113 | 0.0587 | -6.4 | 1.56e-10 | 0.000962 | 0.0391 | -5.42 | 5.8e-08 |
b_y2017_kid_act | asc_kid_act | -0.00289 | -0.0951 | 12.1 | 0 | -0.00447 | -0.145 | 11.7 | 0 |
b_y2017_kid_act | asc_kid_car | -0.000683 | -0.0152 | 4.86 | 1.15e-06 | -0.000446 | -0.0104 | 5.03 | 4.83e-07 |
b_y2017_kid_act | asc_par_act | -0.0037 | -0.0595 | 6.6 | 4.24e-11 | -0.00264 | -0.0387 | 5.97 | 2.33e-09 |
b_y2017_kid_act | b_age_kid_act | 1.54e-05 | 0.0114 | -6.13 | 8.93e-10 | 0.000144 | 0.107 | -6.34 | 2.29e-10 |
b_y2017_kid_act | b_age_kid_car | -3.28e-06 | -0.00157 | -4.15 | 3.35e-05 | -3.96e-05 | -0.0174 | -4.12 | 3.75e-05 |
b_y2017_kid_act | b_age_par_act | 0.000146 | 0.05 | 0.184 | 0.854 | 0.000109 | 0.04 | 0.188 | 0.851 |
b_y2017_kid_act | b_female_kid_act | 0.000119 | 0.0212 | 1.04 | 0.298 | -4.31e-05 | -0.00775 | 1.03 | 0.303 |
b_y2017_kid_act | b_female_kid_car | 3.13e-05 | 0.00353 | -0.601 | 0.548 | 2.46e-05 | 0.00282 | -0.604 | 0.546 |
b_y2017_kid_act | b_female_par_act | -0.000133 | -0.013 | -0.504 | 0.614 | -0.000223 | -0.022 | -0.503 | 0.615 |
b_y2017_kid_act | b_has_big_sib_kid_act | 0.000309 | 0.0524 | -5.81 | 6.12e-09 | 0.000486 | 0.0837 | -5.96 | 2.58e-09 |
b_y2017_kid_act | b_has_big_sib_kid_car | 7.89e-05 | 0.0084 | -4.59 | 4.43e-06 | 3.06e-05 | 0.00323 | -4.52 | 6.12e-06 |
b_y2017_kid_act | b_has_big_sib_par_act | 0.000263 | 0.0246 | -1.94 | 0.0518 | 0.000192 | 0.0183 | -1.95 | 0.0507 |
b_y2017_kid_act | b_has_lil_sib_kid_act | 0.000697 | 0.118 | -4.83 | 1.38e-06 | 0.000683 | 0.117 | -4.84 | 1.27e-06 |
b_y2017_kid_act | b_has_lil_sib_kid_car | 0.000186 | 0.0196 | -4.76 | 1.91e-06 | 0.000248 | 0.0267 | -4.82 | 1.45e-06 |
b_y2017_kid_act | b_has_lil_sib_par_act | 0.000351 | 0.0327 | -3.53 | 0.000419 | 0.000409 | 0.0386 | -3.55 | 0.000384 |
b_y2017_kid_act | b_log_density_kid_act | -4.91e-05 | -0.0225 | -4.72 | 2.35e-06 | -1.31e-06 | -0.000579 | -4.78 | 1.75e-06 |
b_y2017_kid_act | b_log_density_kid_car | -2.88e-05 | -0.00915 | -1.88 | 0.0606 | 2.11e-05 | 0.00717 | -1.93 | 0.0536 |
b_y2017_kid_act | b_log_density_par_act | 3.09e-05 | 0.00621 | -6.19 | 5.91e-10 | 1.53e-05 | 0.00264 | -5.77 | 7.73e-09 |
b_y2017_kid_act | b_log_distance_kid_act | -0.000494 | -0.1 | 13.6 | 0 | -0.000517 | -0.102 | 13.4 | 0 |
b_y2017_kid_act | b_log_distance_kid_car | -5.72e-05 | -0.00637 | -0.389 | 0.697 | -0.000162 | -0.0174 | -0.375 | 0.708 |
b_y2017_kid_act | b_log_distance_par_act | -0.00103 | -0.122 | 10.7 | 0 | -0.000777 | -0.09 | 10.7 | 0 |
b_y2017_kid_act | b_log_income_k_kid_act | 9.27e-06 | 0.00281 | -1.95 | 0.0511 | -2.75e-05 | -0.00844 | -1.96 | 0.0501 |
b_y2017_kid_act | b_log_income_k_kid_car | 1.63e-05 | 0.00297 | -1.8 | 0.0723 | -4.06e-05 | -0.00765 | -1.82 | 0.0687 |
b_y2017_kid_act | b_log_income_k_par_act | -2.56e-05 | -0.00452 | -2.67 | 0.00758 | -0.000123 | -0.0219 | -2.66 | 0.00789 |
b_y2017_kid_act | b_non_work_dad_kid_ace | 6.34e-05 | 0.00701 | -0.757 | 0.449 | 7.97e-05 | 0.00897 | -0.764 | 0.445 |
b_y2017_kid_act | b_non_work_dad_kid_car | 8.75e-07 | 5.84e-05 | -0.684 | 0.494 | -8.12e-05 | -0.00539 | -0.674 | 0.501 |
b_y2017_kid_act | b_non_work_dad_par_act | -5.86e-05 | -0.00375 | -1.92 | 0.0552 | -0.000545 | -0.0371 | -1.98 | 0.0474 |
b_y2017_kid_act | b_non_work_mom_kid_act | 0.000176 | 0.0293 | -0.374 | 0.708 | -2.16e-05 | -0.00364 | -0.371 | 0.711 |
b_y2017_kid_act | b_non_work_mom_kid_car | 4.4e-05 | 0.00431 | 2.02 | 0.0437 | -0.000171 | -0.017 | 2.01 | 0.0448 |
b_y2017_kid_act | b_non_work_mom_par_act | -3.23e-05 | -0.003 | -3.71 | 0.000207 | -2.85e-05 | -0.00271 | -3.75 | 0.000179 |
b_y2017_kid_act | b_veh_per_driver_kid_act | -7.25e-05 | -0.0114 | -0.59 | 0.555 | -4.4e-05 | -0.00667 | -0.578 | 0.563 |
b_y2017_kid_act | b_veh_per_driver_kid_car | -2.66e-05 | -0.00349 | -3.79 | 0.000153 | -1.82e-05 | -0.00224 | -3.62 | 0.000289 |
b_y2017_kid_act | b_veh_per_driver_par_act | -0.000104 | -0.00706 | 4.22 | 2.41e-05 | 0.000131 | 0.00756 | 3.64 | 0.000274 |
b_y2017_kid_car | asc_kid_act | -0.000792 | -0.0166 | 12.1 | 0 | -0.000678 | -0.014 | 11.8 | 0 |
b_y2017_kid_car | asc_kid_car | -0.00638 | -0.0905 | 4.8 | 1.61e-06 | -0.00218 | -0.0324 | 5.01 | 5.36e-07 |
b_y2017_kid_car | asc_par_act | -0.00107 | -0.011 | 6.63 | 3.41e-11 | -0.0011 | -0.0103 | 6 | 2e-09 |
b_y2017_kid_car | b_age_kid_act | 2.58e-06 | 0.00121 | -3.63 | 0.000285 | -3.3e-05 | -0.0156 | -3.67 | 0.000246 |
b_y2017_kid_car | b_age_kid_car | 8.06e-05 | 0.0245 | -2.43 | 0.0151 | 0.000122 | 0.0343 | -2.45 | 0.0141 |
b_y2017_kid_car | b_age_par_act | 5.19e-05 | 0.0113 | 0.44 | 0.66 | 6.65e-05 | 0.0156 | 0.448 | 0.654 |
b_y2017_kid_car | b_female_kid_act | 2.3e-05 | 0.00261 | 1.06 | 0.289 | 3.12e-05 | 0.00358 | 1.07 | 0.285 |
b_y2017_kid_car | b_female_kid_car | 0.000316 | 0.0227 | -0.264 | 0.792 | -0.00048 | -0.035 | -0.259 | 0.796 |
b_y2017_kid_car | b_female_par_act | -4.08e-05 | -0.00254 | -0.213 | 0.831 | -0.00012 | -0.00753 | -0.213 | 0.831 |
b_y2017_kid_car | b_has_big_sib_kid_act | 7.47e-05 | 0.00808 | -4.04 | 5.26e-05 | 4.37e-05 | 0.0048 | -4.08 | 4.54e-05 |
b_y2017_kid_car | b_has_big_sib_kid_car | 0.00067 | 0.0455 | -3.71 | 0.000211 | 0.0011 | 0.0741 | -3.74 | 0.000182 |
b_y2017_kid_car | b_has_big_sib_par_act | 0.00021 | 0.0125 | -1.46 | 0.145 | 0.00024 | 0.0146 | -1.47 | 0.141 |
b_y2017_kid_car | b_has_lil_sib_kid_act | 0.000175 | 0.019 | -3.2 | 0.00139 | 0.000237 | 0.0259 | -3.23 | 0.00122 |
b_y2017_kid_car | b_has_lil_sib_kid_car | 0.00158 | 0.106 | -3.97 | 7.15e-05 | -8.31e-05 | -0.00569 | -3.78 | 0.000155 |
b_y2017_kid_car | b_has_lil_sib_par_act | 0.000302 | 0.018 | -2.82 | 0.0048 | 0.000427 | 0.0258 | -2.85 | 0.00438 |
b_y2017_kid_car | b_log_density_kid_act | -2.1e-05 | -0.00612 | -2.82 | 0.00479 | 4.24e-05 | 0.0119 | -2.86 | 0.00423 |
b_y2017_kid_car | b_log_density_kid_car | -0.000217 | -0.044 | -0.963 | 0.336 | -0.000247 | -0.0534 | -0.977 | 0.328 |
b_y2017_kid_car | b_log_density_par_act | -3.63e-05 | -0.00465 | -4.24 | 2.22e-05 | -3.86e-06 | -0.000426 | -4.11 | 3.9e-05 |
b_y2017_kid_car | b_log_distance_kid_act | -0.000112 | -0.0145 | 10.7 | 0 | -0.000174 | -0.0219 | 10.7 | 0 |
b_y2017_kid_car | b_log_distance_kid_car | -0.000873 | -0.0619 | -0.0862 | 0.931 | -0.000643 | -0.044 | -0.0854 | 0.932 |
b_y2017_kid_car | b_log_distance_par_act | -0.000176 | -0.0133 | 9.51 | 0 | -0.00022 | -0.0162 | 9.4 | 0 |
b_y2017_kid_car | b_log_income_k_kid_act | 1.47e-05 | 0.00285 | -1.03 | 0.303 | -4.45e-05 | -0.00869 | -1.04 | 0.299 |
b_y2017_kid_car | b_log_income_k_kid_car | 9.4e-05 | 0.0109 | -1.07 | 0.286 | -0.000732 | -0.0879 | -1.04 | 0.298 |
b_y2017_kid_car | b_log_income_k_par_act | -7.39e-06 | -0.000831 | -1.74 | 0.0823 | -3.67e-05 | -0.00415 | -1.75 | 0.0804 |
b_y2017_kid_car | b_non_work_dad_kid_ace | -2.63e-06 | -0.000185 | -0.395 | 0.693 | -8.23e-05 | -0.0059 | -0.398 | 0.691 |
b_y2017_kid_car | b_non_work_dad_kid_car | 1.08e-06 | 4.58e-05 | -0.453 | 0.65 | 7.84e-05 | 0.00332 | -0.449 | 0.653 |
b_y2017_kid_car | b_non_work_dad_par_act | -3.27e-05 | -0.00133 | -1.6 | 0.11 | -4.69e-05 | -0.00203 | -1.66 | 0.0963 |
b_y2017_kid_car | b_non_work_mom_kid_act | 6.02e-05 | 0.00638 | -0.0046 | 0.996 | -0.000123 | -0.0132 | -0.00461 | 0.996 |
b_y2017_kid_car | b_non_work_mom_kid_car | 0.000257 | 0.016 | 1.96 | 0.0496 | 0.000519 | 0.0328 | 1.99 | 0.0463 |
b_y2017_kid_car | b_non_work_mom_par_act | -0.000149 | -0.00887 | -2.99 | 0.00282 | -0.000435 | -0.0264 | -2.99 | 0.00276 |
b_y2017_kid_car | b_veh_per_driver_kid_act | -4.5e-05 | -0.00452 | -0.186 | 0.853 | -5.95e-05 | -0.00575 | -0.184 | 0.854 |
b_y2017_kid_car | b_veh_per_driver_kid_car | -0.000407 | -0.034 | -2.75 | 0.0059 | -2.36e-05 | -0.00186 | -2.73 | 0.00637 |
b_y2017_kid_car | b_veh_per_driver_par_act | 4.34e-05 | 0.00188 | 4.04 | 5.26e-05 | -5.45e-05 | -0.002 | 3.55 | 0.00039 |
b_y2017_kid_car | b_y2017_kid_act | 0.00168 | 0.183 | 0.306 | 0.76 | 0.00162 | 0.181 | 0.31 | 0.757 |
b_y2017_par_act | asc_kid_act | -0.00112 | -0.0147 | 17.8 | 0 | -0.000196 | -0.00254 | 17.5 | 0 |
b_y2017_par_act | asc_kid_car | -0.00058 | -0.00516 | 9.35 | 0 | -6.71e-05 | -0.000624 | 9.66 | 0 |
b_y2017_par_act | asc_par_act | -0.038 | -0.244 | 9.45 | 0 | -0.0465 | -0.272 | 8.57 | 0 |
b_y2017_par_act | b_age_kid_act | 5.2e-05 | 0.0153 | 12.6 | 0 | 5.31e-05 | 0.0157 | 12.7 | 0 |
b_y2017_par_act | b_age_kid_car | 1.11e-05 | 0.00212 | 13.3 | 0 | -2.08e-05 | -0.00364 | 13.3 | 0 |
b_y2017_par_act | b_age_par_act | -0.000531 | -0.0726 | 14.8 | 0 | -0.000154 | -0.0227 | 15.1 | 0 |
b_y2017_par_act | b_female_kid_act | 2.09e-05 | 0.00149 | 14.7 | 0 | -0.000191 | -0.0137 | 14.7 | 0 |
b_y2017_par_act | b_female_kid_car | 1.3e-05 | 0.000587 | 12.6 | 0 | -8.86e-05 | -0.00404 | 12.7 | 0 |
b_y2017_par_act | b_female_par_act | 5.49e-05 | 0.00215 | 12.1 | 0 | 0.00259 | 0.102 | 12.8 | 0 |
b_y2017_par_act | b_has_big_sib_kid_act | 6.59e-05 | 0.00448 | 11.1 | 0 | 0.000123 | 0.00844 | 11.2 | 0 |
b_y2017_par_act | b_has_big_sib_kid_car | 5.31e-05 | 0.00226 | 9.86 | 0 | -1.5e-05 | -0.000631 | 9.85 | 0 |
b_y2017_par_act | b_has_big_sib_par_act | 0.00164 | 0.0612 | 11.3 | 0 | 0.000149 | 0.00564 | 11.1 | 0 |
b_y2017_par_act | b_has_lil_sib_kid_act | 0.00018 | 0.0122 | 11.7 | 0 | 0.000129 | 0.00882 | 11.8 | 0 |
b_y2017_par_act | b_has_lil_sib_kid_car | 0.000128 | 0.00541 | 9.73 | 0 | 0.000215 | 0.0092 | 9.82 | 0 |
b_y2017_par_act | b_has_lil_sib_par_act | 0.00289 | 0.108 | 10.4 | 0 | 0.00277 | 0.105 | 10.5 | 0 |
b_y2017_par_act | b_log_density_kid_act | -9.24e-05 | -0.0169 | 13 | 0 | -5.44e-05 | -0.0096 | 13.1 | 0 |
b_y2017_par_act | b_log_density_kid_car | -3.75e-05 | -0.00476 | 14 | 0 | 1.72e-05 | 0.00232 | 14.2 | 0 |
b_y2017_par_act | b_log_density_par_act | 0.000887 | 0.0713 | 11.5 | 0 | -0.000481 | -0.0332 | 11 | 0 |
b_y2017_par_act | b_log_distance_kid_act | -0.000174 | -0.0141 | 21.3 | 0 | 2.92e-05 | 0.00229 | 21.5 | 0 |
b_y2017_par_act | b_log_distance_kid_car | -2.69e-05 | -0.0012 | 12.7 | 0 | -0.000269 | -0.0115 | 12.5 | 0 |
b_y2017_par_act | b_log_distance_par_act | -0.00499 | -0.237 | 18.2 | 0 | -0.00639 | -0.295 | 17.8 | 0 |
b_y2017_par_act | b_log_income_k_kid_act | 2.3e-06 | 0.000279 | 13.9 | 0 | -0.000192 | -0.0235 | 14 | 0 |
b_y2017_par_act | b_log_income_k_kid_car | 1.18e-05 | 0.000854 | 13.3 | 0 | -0.000103 | -0.00776 | 13.4 | 0 |
b_y2017_par_act | b_log_income_k_par_act | -0.000322 | -0.0227 | 12.7 | 0 | 0.00238 | 0.168 | 13.7 | 0 |
b_y2017_par_act | b_non_work_dad_kid_ace | -0.000105 | -0.00464 | 12.4 | 0 | -0.000705 | -0.0316 | 12.4 | 0 |
b_y2017_par_act | b_non_work_dad_kid_car | -2.05e-05 | -0.000548 | 10.1 | 0 | -1.51e-05 | -0.0004 | 10 | 0 |
b_y2017_par_act | b_non_work_dad_par_act | 0.00125 | 0.0319 | 9.01 | 0 | 0.00141 | 0.0383 | 9.31 | 0 |
b_y2017_par_act | b_non_work_mom_kid_act | -1.09e-05 | -0.000727 | 13.8 | 0 | -9.18e-05 | -0.00618 | 13.9 | 0 |
b_y2017_par_act | b_non_work_mom_kid_car | 1.11e-05 | 0.000434 | 13.8 | 0 | -0.000313 | -0.0124 | 13.8 | 0 |
b_y2017_par_act | b_non_work_mom_par_act | 0.00123 | 0.0458 | 9.94 | 0 | 0.00307 | 0.116 | 10.4 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_act | 1.41e-05 | 0.00089 | 13.6 | 0 | 1.09e-06 | 6.58e-05 | 13.6 | 0 |
b_y2017_par_act | b_veh_per_driver_kid_car | -1.33e-05 | -0.0007 | 11.2 | 0 | -4.55e-05 | -0.00223 | 11.1 | 0 |
b_y2017_par_act | b_veh_per_driver_par_act | -0.00103 | -0.028 | 13.7 | 0 | 0.00284 | 0.0653 | 13.1 | 0 |
b_y2017_par_act | b_y2017_kid_act | 0.00263 | 0.18 | 15.1 | 0 | 0.00245 | 0.171 | 15.1 | 0 |
b_y2017_par_act | b_y2017_kid_car | 0.00144 | 0.0626 | 13 | 0 | 0.00135 | 0.0601 | 13.2 | 0 |
Smallest eigenvalue: 1.46184
+Largest eigenvalue: 166961
+Condition number: 114212
+ \ No newline at end of file diff --git a/models/IATBR plan/4 alternatives/no-nests/no_nests.pickle b/models/IATBR plan/4 alternatives/no-nests/no_nests.pickle new file mode 100644 index 0000000..c9f262e Binary files /dev/null and b/models/IATBR plan/4 alternatives/no-nests/no_nests.pickle differ diff --git a/models/IATBR plan/analysis-plan.Rmd b/models/IATBR plan/analysis-plan.Rmd index 86e61e0..3a15e4a 100644 --- a/models/IATBR plan/analysis-plan.Rmd +++ b/models/IATBR plan/analysis-plan.Rmd @@ -10,6 +10,9 @@ knitr::opts_chunk$set(echo = TRUE) # Simplified model structure +Expanded sample to include 7-year-olds and 14-year-olds. +Combined 2009 and 2017 data sets + Two independence categories: 1. With household adults @@ -31,32 +34,45 @@ Four combined categories: ### Unnested model: -* log likelihood: -1447.855 +* log likelihood: -4220.598 +* AIC: 8513.197 * Significant predictors: * All three alternative specific constants (reference is car with parent) * Age - * Positive for active independent + * Positive for both independent * Negative for active with parent * Child's sex * Negative for active independent + * Has older sib + * Positive for both independent + * Has younger sib + * Positive for all * Density * Positive for both active alternatives * Distance * Negative for both active alternatives * Non-working mom * Negative for both independent alternatives - * Positive for walk with parent + * Positive for active with parent * Vehicle per driver * Negative for walk with parent - + * Positive for car without parent + * Year 2017 + * Negative for walk without parent + * positive for walk with parent +* Non-significant predictors + * Income + * Non-working dad + ### Mode-based nests: -* log likelihood: -1447.621 -* Nests not valid (nesting coefficients not sig greater than one.) +* log likelihood: -1869.092 +* mu_car: (-37.962, 47.112) +* mu_walk: (-0.7955, 3.7355) -### Independence-based nestsL +### Independence-based nests: -* Failed to converge +* Failed to converge after 5000 iterations # Further simplification @@ -68,7 +84,8 @@ observations out of 1658 (4%) ### Unnested model: -* log likelihood: -1188.731 +* log likelihood: -4220.598 +* AIC: 8513.197 * Significant predictors (same as with four alternatives): * Both alternative specific constants (reference is car with parent) * Age diff --git a/models/IATBR plan/cross-nest-compare-figs.R b/models/IATBR plan/cross-nest-compare-figs.R new file mode 100644 index 0000000..16b6133 --- /dev/null +++ b/models/IATBR plan/cross-nest-compare-figs.R @@ -0,0 +1,144 @@ +library(tidyverse) + +## It would be better not to have to type these in manually, like if I had +## output them to a csv file from biogeme instead of just the html summary. +## Oh Well. + +var_names <- c("intercept", + "Year 2017 (relative to 2009)", + "log(household income)", + "Vehicles per driver", + "Non-working father", + "Non-working mother", + "Age", + "Female", + "Has younger sibling", + "Has older sibling", + "log(trip distance)", + "log(density)") + +var_names <- factor(var_names, levels = var_names) + +results <- tibble(model = c(rep("Cross-nested", 24), + rep("Unnested", 24)), + variable= rep(sort(rep(var_names, 2)), 2), + alternative= rep(rep(c("Utility of traveling WITHOUT\na parent by active modes\n(relative to traveling by car)", + "Utility of traveling WITH\na parent by active modes\n(relative to traveling by car)"),12), 2), + coeff = c(-4.91, + -3.85, + 0.08, + 1.26, + -0.04, + 0.01, + -0.25, + -0.53, + -0.06, + 0.06, + -0.09, + 0.16, + 0.21, + -0.05, + -0.29, + -0.14, + 0.19, + 0.2, + 0.32, + 0.08, + -1.52, + -1.27, + 0.18, + 0.25, + -5.22, + -5.68, + -0.2, + 2.7, + -0.05, + 0.07, + -0.19, + -1.13, + -0.11, + 0.2, + -0.12, + 0.42, + 0.24, + -0.25, + -0.32, + -0.13, + 0.21, + 0.29, + 0.34, + 0.04, + -1.63, + -1.73, + 0.17, + 0.4), + se = c(0.37, + 0.68, + 0.12, + 0.14, + 0.04, + 0.05, + 0.09, + 0.12, + 0.10, + 0.12, + 0.07, + 0.08, + 0.02, + 0.03, + 0.07, + 0.08, + 0.07, + 0.08, + 0.07, + 0.08, + 0.08, + 0.22, + 0.03, + 0.04, + 0.4, + 0.9, + 0.07, + 0.19, + 0.04, + 0.07, + 0.09, + 0.23, + 0.12, + 0.19, + 0.08, + 0.14, + 0.02, + 0.04, + 0.07, + 0.13, + 0.08, + 0.14, + 0.08, + 0.14, + 0.06, + 0.11, + 0.03, + 0.08)) + +results <- results |> + mutate(low = coeff - 1.96*se, + hi = coeff + 1.96*se) + +results_no_int <- results |> + filter(variable != "intercept") + +ggplot(results_no_int, aes(x=variable, y=coeff, group=model, color=model)) + + geom_point(position=position_dodge(0.5), shape = "+", size = 2)+ + geom_errorbar(aes(ymin=low, ymax=hi), width=0.5, + position=position_dodge(0.5)) + + scale_y_continuous(name = "Coefficient estimate\n(with 95-percent confidence interval)") + + scale_x_discrete(name = "Variable") + + scale_color_manual(name = "Model nesting\nstructure", + values = c("black", "gray50")) + + geom_hline(yintercept = 0, lty = "dotted", size = 0.5) + + facet_wrap("alternative") + +# theme_minimal() + + theme(axis.text.x = element_text(angle = 90, vjust = 0.5, hjust=1)) + +ggsave("compare_nests.png", dpi = 600, width = 6, height = 6, units = "in")