My final project focuses on finding the distinctions between those who are obese and those who are not. The project will be split into three primary parts: lifestyle habits, family history, and physical activity. The obesity dataset will be used in this research because it contains a variety of characteristics, such as family history, physical activity levels, and other lifestyle-related behaviors, which makes it perfect for determining the main distinctions between those who are obese and those who are not.

Obesity is a chronic condition characterized by excessive body fat, impacting over 42% of adults in the United States, as per CDC data. It is linked to severe health risks such as heart disease, type 2 diabetes, and some cancers.

key sources:

Dataset is loaded

library(ggplot2)
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats   1.0.0     ✔ stringr   1.5.1
## ✔ lubridate 1.9.3     ✔ tibble    3.2.1
## ✔ purrr     1.0.2     ✔ tidyr     1.3.1
## ✔ readr     2.1.5
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(corrplot)
## Warning: package 'corrplot' was built under R version 4.4.2
## corrplot 0.95 loaded
library(car)
## Loading required package: carData
## 
## Attaching package: 'car'
## 
## The following object is masked from 'package:purrr':
## 
##     some
## 
## The following object is masked from 'package:dplyr':
## 
##     recode
obesity <- read.csv("C:/Users/ashir/Downloads/estimation+of+obesity+levels+based+on+eating+habits+and+physical+condition/ObesityDataSet_raw_and_data_sinthetic.csv")

# View the first few rows of the dataset
head(obesity)
##   Gender Age Height Weight family_history_with_overweight FAVC FCVC NCP
## 1 Female  21   1.62   64.0                            yes   no    2   3
## 2 Female  21   1.52   56.0                            yes   no    3   3
## 3   Male  23   1.80   77.0                            yes   no    2   3
## 4   Male  27   1.80   87.0                             no   no    3   3
## 5   Male  22   1.78   89.8                             no   no    2   1
## 6   Male  29   1.62   53.0                             no  yes    2   3
##        CAEC SMOKE CH2O SCC FAF TUE       CALC                MTRANS
## 1 Sometimes    no    2  no   0   1         no Public_Transportation
## 2 Sometimes   yes    3 yes   3   0  Sometimes Public_Transportation
## 3 Sometimes    no    2  no   2   1 Frequently Public_Transportation
## 4 Sometimes    no    2  no   2   0 Frequently               Walking
## 5 Sometimes    no    2  no   0   0  Sometimes Public_Transportation
## 6 Sometimes    no    2  no   0   0  Sometimes            Automobile
##            NObeyesdad
## 1       Normal_Weight
## 2       Normal_Weight
## 3       Normal_Weight
## 4  Overweight_Level_I
## 5 Overweight_Level_II
## 6       Normal_Weight
# Convert categorical variables to factors
categorical_vars <- c("family_history_with_overweight", "FAVC", "CAEC", 
                     "SMOKE", "SCC", "CALC", "MTRANS", "NObeyesdad")
obesity[categorical_vars] <- lapply(obesity[categorical_vars], as.factor)
 
# Create numeric BMI categories for regression
obesity_levels <- c("Insufficient_Weight" = 1, 
                   "Normal_Weight" = 2,
                   "Overweight_Level_I" = 3,
                   "Overweight_Level_II" = 4,
                   "Obesity_Type_I" = 5,
                   "Obesity_Type_II" = 6,
                   "Obesity_Type_III" = 7)
 
obesity$BMI_level <- as.numeric(factor(obesity$NObeyesdad, 
                                          levels = names(obesity_levels), 
                                          labels = obesity_levels))

Calculated BMI and added as new column

obesity$Weight <- as.numeric(as.character(obesity$Weight))
obesity$Height <- as.numeric(as.character(obesity$Height))

# Check for NA values
cat("NA in Weight:", sum(is.na(obesity$Weight_kg)), "\n")
## NA in Weight: 0
obesity <- na.omit(obesity)

# Calculate BMI
obesity$BMI <- obesity$Weight / (obesity$Height)

# Verify the calculation
head(obesity)
##   Gender Age Height Weight family_history_with_overweight FAVC FCVC NCP
## 1 Female  21   1.62   64.0                            yes   no    2   3
## 2 Female  21   1.52   56.0                            yes   no    3   3
## 3   Male  23   1.80   77.0                            yes   no    2   3
## 4   Male  27   1.80   87.0                             no   no    3   3
## 5   Male  22   1.78   89.8                             no   no    2   1
## 6   Male  29   1.62   53.0                             no  yes    2   3
##        CAEC SMOKE CH2O SCC FAF TUE       CALC                MTRANS
## 1 Sometimes    no    2  no   0   1         no Public_Transportation
## 2 Sometimes   yes    3 yes   3   0  Sometimes Public_Transportation
## 3 Sometimes    no    2  no   2   1 Frequently Public_Transportation
## 4 Sometimes    no    2  no   2   0 Frequently               Walking
## 5 Sometimes    no    2  no   0   0  Sometimes Public_Transportation
## 6 Sometimes    no    2  no   0   0  Sometimes            Automobile
##            NObeyesdad BMI_level      BMI
## 1       Normal_Weight         2 39.50617
## 2       Normal_Weight         2 36.84211
## 3       Normal_Weight         2 42.77778
## 4  Overweight_Level_I         3 48.33333
## 5 Overweight_Level_II         4 50.44944
## 6       Normal_Weight         2 32.71605

BMI Distribution

# Histogram for BMI
ggplot(obesity, aes(x = BMI)) +
  geom_histogram(binwidth = 2, fill = "blue", color = "black") +
  labs(title = "BMI Distribution", x = "BMI", y = "Count") +
  theme_minimal()

Insights

  • The BMI distribution shows a rather symmetrical trend with a rightward tail. This implies that although the majority of people have a modest BMI, some outliers have much higher numbers.
  • There are multiple peaks in the histogram, indicating a multimodal distribution.
  • A large number of individuals fall in the BMI range of 30–40 and 70–80, potentially indicating specific clusters of overweight or obese individuals.
  • The distribution suggests variability, with certain BMI ranges (e.g., 20–30) having significantly fewer individuals.
  • Outliers might be present at the extreme ends of the BMI scale.

Correlation Analysis

# Load required packages
library(ggplot2)
library(reshape2)
## Warning: package 'reshape2' was built under R version 4.4.2
## 
## Attaching package: 'reshape2'
## The following object is masked from 'package:tidyr':
## 
##     smiths
# Calculate correlations
cor_matrix <- cor(obesity %>% select_if(is.numeric))

# Melt the correlation matrix into long format
cor_matrix_melted <- melt(cor_matrix)

# Create heatmap with ggplot2
ggplot(data = cor_matrix_melted, aes(x = Var1, y = Var2, fill = value)) +
  geom_tile() +
  scale_fill_gradient2(low = "red", high = "green", mid = "white", midpoint = 0) +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1)) +
  labs(title = "Correlation Heatmap", x = "Variables", y = "Variables")

Insights

  • Strong Correlations: BMI and Weight exhibit a strong positive correlation (dark green), as expected. Height and Age show a high correlation, potentially due to natural growth patterns.
  • Negative Correlations: BMI and TUE (Time of Exercise) have a negative correlation, suggesting that higher exercise time may be associated with lower BMI.
  • The strong relationship between BMI and Weight indicates that weight significantly contributes to BMI variation.
  • The inverse relationship between BMI and exercise time highlights the importance of physical activity in maintaining a healthy BMI.
  • Variables with weak correlations might require further examination or exclusion from predictive models.

Conclusion from these 2 visualizations

The study reveals a high frequency of overweight in the dataset and confirms established findings that activity and weight are important factors influencing BMI. Predictive models can be improved and targeted health interventions can be created with these findings.

Exploratory Data Analysis

so we have 2 hypotheses which have to be tested here.

Hypotheses 1: Higher levels of physical activity are associated with lower levels of obesity.

library(ggplot2)

# Box plot for Physical Activity vs Obesity
ggplot(obesity, aes(x=FAF, y=NObeyesdad, fill=NObeyesdad)) +
  geom_boxplot() +
  labs(title="Box Plot of BMI by Physical Activity Level", 
       x="Physical Activity Level", y="Obesity levels") +
  theme_minimal() +
  theme(legend.position = "none") 

Insights

  • Insufficient Weight:
    • This group has a wide spread in physical activity, with some individuals engaging in lower levels of activity and others at higher levels.
    • The median physical activity level is slightly below 2, indicating moderate activity levels on average.
  • Normal Weight:
    • The distribution of physical activity is fairly consistent and slightly higher than Insufficient Weight.
    • The median value hovers around 2, suggesting regular activity among this group.
  • Overweight Levels I and II:
    • Both categories display reduced physical activity compared to Normal Weight.
    • The medians shift closer to 1.5, and the interquartile range narrows, showing that most individuals in this group fall into lower to moderate physical activity levels.
  • Obesity Types I, II, III: As obesity severity increases:
    • The median physical activity level drops further.
    • The interquartile ranges shrink, indicating less variability in activity levels. For Obesity_Type_III, most individuals show physical activity levels close to 1, suggesting predominantly low activity.

chi-squared test for hypothesis-1

# Create a contingency table
table_physical_activity <- table(obesity$FAF, obesity$NObeyesdad)

# View the contingency table
table_physical_activity
##           
##            Insufficient_Weight Normal_Weight Obesity_Type_I Obesity_Type_II
##   0                         34            80             81              28
##   9.6e-05                    0             0              0               0
##   0.000272                   0             0              0               0
##   0.000454                   0             0              0               0
##   0.001015                   0             0              0               0
##   0.001086                   0             0              1               0
##   0.001272                   0             0              0               0
##   0.001297                   0             0              0               0
##   0.00203                    0             0              1               0
##   0.00342                    0             0              0               0
##   0.003938                   0             0              1               0
##   0.005405                   0             0              1               0
##   0.005939                   0             0              0               0
##   0.006265                   0             0              0               0
##   0.00705                    0             0              0               0
##   0.008013                   0             0              0               0
##   0.008127                   0             0              0               0
##   0.008368                   0             0              1               0
##   0.010183                   0             0              0               0
##   0.011161                   0             0              0               0
##   0.011477                   0             0              1               0
##   0.011519                   0             0              1               0
##   0.01437                    0             0              0               0
##   0.01586                    0             0              0               0
##   0.01682                    0             0              0               0
##   0.017804                   0             0              0               0
##   0.019404                   0             0              0               0
##   0.02006                    0             0              0               0
##   0.02112                    0             0              0               0
##   0.022598                   0             0              1               0
##   0.022958                   0             0              0               0
##   0.023574                   1             0              0               0
##   0.025787                   0             0              0               0
##   0.026033                   0             0              0               0
##   0.026142                   0             0              1               0
##   0.027101                   0             0              0               0
##   0.027433                   1             0              0               0
##   0.028202                   1             0              0               0
##   0.029603                   0             0              0               1
##   0.029728                   0             0              0               0
##   0.030541                   0             0              0               0
##   0.033328                   1             0              0               0
##   0.033745                   0             0              0               0
##   0.03465                    0             0              0               0
##   0.035091                   0             0              1               0
##   0.035928                   0             0              0               0
##   0.038809                   0             0              0               0
##   0.039207                   0             0              0               0
##   0.043101                   0             0              0               0
##   0.043412                   1             0              0               0
##   0.043689                   0             0              0               0
##   0.045246                   0             0              0               0
##   0.04525                    0             0              0               0
##   0.045651                   0             0              0               0
##   0.046836                   0             0              0               0
##   0.047738                   0             0              0               0
##   0.05093                    0             0              0               0
##   0.051097                   0             0              0               0
##   0.054238                   0             0              0               1
##   0.057758                   0             0              1               0
##   0.061366                   0             0              0               0
##   0.06275                    0             0              1               0
##   0.062932                   1             0              0               0
##   0.063383                   0             0              0               0
##   0.065264                   0             0              1               0
##   0.06582                    0             0              0               0
##   0.067329                   0             0              0               0
##   0.067491                   0             0              1               0
##   0.067985                   0             0              0               0
##   0.069238                   0             0              0               0
##   0.069802                   1             0              0               0
##   0.07089                    0             0              0               0
##   0.07115                    0             0              0               0
##   0.072117                   0             0              0               0
##   0.073065                   0             0              0               1
##   0.075776                   0             0              0               0
##   0.083675                   0             0              0               0
##   0.085119                   0             0              0               0
##   0.085388                   0             0              0               0
##   0.090147                   0             0              0               0
##   0.090917                   0             0              0               0
##   0.092344                   0             0              0               0
##   0.093418                   0             0              0               1
##   0.094851                   0             0              0               0
##   0.094893                   0             0              0               0
##   0.095389                   0             0              0               0
##   0.095517                   0             0              0               0
##   0.097114                   0             0              0               0
##   0.098043                   0             0              0               0
##   0.10032                    0             0              0               0
##   0.101236                   0             0              0               0
##   0.10297                    1             0              0               0
##   0.104451                   0             0              0               0
##   0.104707                   0             0              1               0
##   0.107078                   1             0              0               0
##   0.107981                   1             0              0               0
##   0.108386                   0             0              0               0
##   0.108948                   1             0              0               0
##   0.109327                   0             0              0               0
##   0.110174                   0             0              0               0
##   0.110887                   0             0              0               0
##   0.112122                   0             0              0               0
##   0.112383                   0             0              0               0
##   0.11243                    0             0              0               1
##   0.112454                   0             0              1               0
##   0.114698                   0             0              0               0
##   0.115369                   0             0              0               0
##   0.115974                   1             0              0               0
##   0.118271                   1             0              0               0
##   0.11964                    0             0              0               0
##   0.119643                   1             0              0               0
##   0.120165                   0             0              1               0
##   0.121585                   0             0              0               0
##   0.127425                   1             0              0               0
##   0.128342                   0             0              1               0
##   0.128548                   0             0              0               1
##   0.129163                   0             0              0               0
##   0.129178                   0             0              0               0
##   0.129902                   0             0              0               0
##   0.130417                   0             0              1               0
##   0.131371                   0             0              0               1
##   0.132629                   0             0              0               0
##   0.133398                   0             0              1               0
##   0.139159                   0             0              0               0
##   0.139808                   1             0              0               0
##   0.143955                   0             0              0               0
##   0.144627                   1             0              0               0
##   0.14495                    1             0              0               0
##   0.145687                   0             0              0               1
##   0.146919                   0             0              0               0
##   0.148628                   0             0              0               0
##   0.15136                    0             0              0               0
##   0.152713                   0             0              0               0
##   0.155579                   0             0              0               0
##   0.159255                   0             0              0               0
##   0.162083                   0             0              0               0
##   0.162279                   0             0              0               0
##   0.165269                   0             0              0               1
##   0.165422                   0             0              0               0
##   0.167086                   0             0              0               0
##   0.167125                   0             0              0               0
##   0.167943                   0             0              0               1
##   0.170452                   0             0              0               0
##   0.17048                    0             0              0               0
##   0.174475                   0             0              0               1
##   0.174692                   1             0              0               0
##   0.1768                     0             0              0               1
##   0.178023                   0             0              0               0
##   0.178856                   0             0              0               1
##   0.178976                   0             0              0               0
##   0.180158                   0             0              0               0
##   0.180276                   0             0              1               0
##   0.181324                   0             0              0               1
##   0.181753                   0             0              1               0
##   0.182249                   0             0              0               1
##   0.184917                   0             0              0               0
##   0.189831                   0             0              0               0
##   0.189957                   0             0              0               0
##   0.190061                   0             0              0               0
##   0.192559                   0             0              1               0
##   0.194056                   0             0              0               0
##   0.194745                   1             0              0               0
##   0.196152                   1             0              0               0
##   0.197993                   0             0              0               0
##   0.201136                   1             0              0               0
##   0.202029                   0             0              0               1
##   0.204108                   0             0              0               0
##   0.206025                   1             0              0               0
##   0.206954                   0             0              0               1
##   0.209586                   0             0              0               0
##   0.210181                   0             0              0               1
##   0.210351                   0             0              0               0
##   0.215187                   0             0              1               0
##   0.216908                   0             0              0               1
##   0.217455                   0             0              0               0
##   0.218356                   0             0              0               1
##   0.220825                   0             0              0               0
##   0.224482                   0             0              0               0
##   0.227802                   1             0              0               0
##   0.227985                   1             0              0               0
##   0.228307                   0             0              0               0
##   0.228753                   0             0              0               0
##   0.232742                   0             0              0               0
##   0.233056                   0             0              0               1
##   0.233987                   0             0              0               1
##   0.234303                   0             0              0               0
##   0.23553                    0             0              0               0
##   0.236168                   0             0              0               1
##   0.244749                   0             0              1               0
##   0.245003                   0             0              1               0
##   0.245354                   0             0              0               1
##   0.24629                    0             0              0               0
##   0.246831                   0             0              0               0
##   0.248034                   0             0              1               0
##   0.249264                   0             0              1               0
##   0.25289                    1             0              0               0
##   0.256113                   0             0              1               0
##   0.256323                   0             0              1               0
##   0.259424                   0             0              0               0
##   0.259427                   0             0              0               0
##   0.260079                   1             0              0               0
##   0.261274                   0             0              0               0
##   0.262171                   0             0              0               0
##   0.264831                   0             0              0               0
##   0.268801                   0             0              1               0
##   0.271174                   0             0              0               0
##   0.274838                   0             0              0               0
##   0.279375                   0             0              0               0
##   0.281734                   1             0              0               0
##   0.281876                   0             0              0               0
##   0.282063                   0             0              0               0
##   0.285889                   0             0              0               0
##   0.288032                   1             0              1               0
##   0.291309                   1             0              0               0
##   0.292093                   0             0              1               0
##   0.294763                   0             0              0               0
##   0.295178                   0             0              1               0
##   0.300964                   0             0              0               0
##   0.303722                   0             0              0               0
##   0.305422                   0             0              0               0
##   0.312254                   0             0              1               0
##   0.312923                   0             0              0               0
##   0.31381                    0             0              0               0
##   0.317363                   0             0              1               0
##   0.319156                   0             0              0               0
##   0.320209                   0             0              0               0
##   0.322013                   0             0              1               0
##   0.324676                   0             0              0               0
##   0.324913                   0             0              0               0
##   0.325313                   0             0              0               1
##   0.325534                   0             0              0               0
##   0.327418                   0             0              0               1
##   0.32896                    0             0              0               0
##   0.334264                   0             0              0               0
##   0.334579                   0             0              0               0
##   0.336795                   0             0              0               0
##   0.336814                   0             0              0               0
##   0.340915                   0             0              0               0
##   0.344013                   0             0              1               0
##   0.345684                   1             0              0               0
##   0.348839                   0             0              0               1
##   0.349371                   0             0              1               0
##   0.350717                   0             0              0               1
##   0.354541                   0             0              1               0
##   0.356288                   0             0              0               1
##   0.358709                   0             0              0               1
##   0.359134                   0             0              1               0
##   0.36009                    0             0              0               0
##   0.360908                   0             0              0               0
##   0.362441                   0             0              0               0
##   0.368026                   0             0              0               1
##   0.371452                   0             0              0               0
##   0.371508                   0             0              0               1
##   0.373186                   1             0              0               0
##   0.378683                   0             0              0               0
##   0.380633                   0             0              1               0
##   0.382189                   0             0              0               0
##   0.387074                   0             0              0               0
##   0.388269                   0             0              1               0
##   0.38926                    0             0              0               0
##   0.389717                   0             0              1               0
##   0.390877                   0             0              0               0
##   0.390937                   0             0              0               0
##   0.393452                   0             0              0               1
##   0.402614                   0             0              1               0
##   0.408023                   0             0              0               0
##   0.413643                   0             0              1               0
##   0.417119                   1             0              0               0
##   0.417724                   0             0              0               0
##   0.418875                   1             0              0               0
##   0.425621                   0             0              0               1
##   0.42777                    1             0              0               0
##   0.427905                   0             0              0               0
##   0.428173                   0             0              0               1
##   0.428259                   0             0              0               1
##   0.432813                   0             0              1               0
##   0.432973                   0             0              0               0
##   0.444347                   0             0              0               0
##   0.445238                   0             0              0               0
##   0.451009                   0             0              0               0
##   0.451078                   0             0              0               0
##   0.454944                   0             0              0               1
##   0.455216                   0             0              1               0
##   0.458237                   0             0              0               0
##   0.458981                   0             0              1               0
##   0.462951                   0             0              0               0
##   0.463891                   0             0              0               0
##   0.463949                   1             0              0               0
##   0.467562                   0             0              0               0
##   0.477855                   0             0              0               1
##   0.478134                   0             0              1               0
##   0.478595                   0             0              0               1
##   0.479592                   0             0              0               0
##   0.480206                   0             0              0               0
##   0.480614                   1             0              0               0
##   0.481555                   0             0              0               0
##   0.482625                   0             0              0               1
##   0.485322                   0             0              0               1
##   0.486006                   1             0              0               0
##   0.497373                   0             0              0               0
##   0.501417                   0             0              0               0
##   0.503105                   0             0              0               1
##   0.503122                   0             0              0               0
##   0.503279                   0             0              0               0
##   0.508847                   0             0              0               0
##   0.512094                   1             0              0               0
##   0.514225                   0             0              0               1
##   0.520407                   2             0              0               0
##   0.520408                   1             0              0               0
##   0.520989                   0             0              1               0
##   0.523847                   0             0              0               0
##   0.525002                   0             0              0               0
##   0.527341                   0             0              0               0
##   0.529259                   0             0              0               0
##   0.530925                   0             0              0               0
##   0.533309                   1             0              0               0
##   0.539952                   0             0              0               0
##   0.540397                   0             0              0               0
##   0.544564                   0             0              1               0
##   0.544784                   1             0              0               0
##   0.545919                   0             0              0               1
##   0.545931                   1             0              0               0
##   0.546402                   0             0              0               0
##   0.547515                   0             0              0               0
##   0.548991                   1             0              0               0
##   0.55181                    0             0              0               0
##   0.552511                   0             0              1               0
##   0.553305                   0             0              0               0
##   0.554323                   0             0              0               0
##   0.554646                   0             0              0               1
##   0.55713                    0             0              0               0
##   0.562118                   0             0              0               0
##   0.565242                   0             0              0               1
##   0.56931                    0             0              1               0
##   0.571648                   0             0              1               0
##   0.577063                   0             0              0               0
##   0.578074                   0             0              1               0
##   0.58216                    0             0              1               0
##   0.582686                   0             0              0               1
##   0.584272                   0             0              0               1
##   0.584793                   0             0              1               0
##   0.588673                   0             0              0               0
##   0.592607                   0             0              0               1
##   0.597863                   0             0              0               1
##   0.598438                   0             0              0               0
##   0.598655                   0             0              0               1
##   0.600817                   1             0              0               0
##   0.603638                   0             0              1               0
##   0.604259                   0             0              0               0
##   0.6081                     0             0              0               1
##   0.611037                   1             0              0               0
##   0.614466                   0             0              1               0
##   0.614959                   0             0              0               1
##   0.615298                   0             0              0               1
##   0.616503                   0             0              0               0
##   0.618913                   1             0              0               0
##   0.619533                   1             0              0               0
##   0.6277                     0             0              0               0
##   0.630944                   1             0              0               0
##   0.63119                    0             0              0               0
##   0.631565                   0             0              1               0
##   0.632164                   0             0              0               0
##   0.632947                   0             0              1               0
##   0.641954                   0             0              0               1
##   0.64235                    0             0              0               0
##   0.647632                   0             0              0               1
##   0.647798                   0             0              0               0
##   0.650235                   0             0              1               0
##   0.651412                   1             0              0               0
##   0.652736                   0             0              0               1
##   0.654316                   0             0              1               0
##   0.656548                   0             0              0               1
##   0.658894                   1             0              0               0
##   0.662831                   0             0              0               0
##   0.663896                   0             0              0               0
##   0.665439                   0             0              0               1
##   0.668963                   0             0              0               1
##   0.669278                   0             0              1               0
##   0.674348                   0             0              0               0
##   0.675262                   0             0              0               0
##   0.675983                   0             0              0               0
##   0.678943                   0             0              0               0
##   0.679935                   0             0              0               0
##   0.680464                   1             0              0               0
##   0.68183                    0             0              0               1
##   0.684487                   0             0              0               1
##   0.684739                   1             0              0               0
##   0.684879                   1             0              0               0
##   0.689371                   0             0              0               1
##   0.690269                   0             0              0               1
##   0.691369                   0             0              0               1
##   0.692123                   0             0              1               0
##   0.693732                   0             0              0               1
##   0.694281                   0             0              0               0
##   0.699592                   0             0              0               0
##   0.702538                   0             0              0               0
##   0.702839                   0             0              0               0
##   0.704236                   0             0              0               1
##   0.706287                   0             0              0               0
##   0.706777                   0             0              0               1
##   0.712726                   0             0              0               1
##   0.729898                   0             0              0               0
##   0.732186                   0             0              1               0
##   0.732276                   0             0              0               0
##   0.736032                   0             0              0               0
##   0.739881                   0             0              0               1
##   0.740633                   0             0              0               0
##   0.742113                   0             0              1               0
##   0.74225                    0             0              0               0
##   0.743005                   0             0              1               0
##   0.743593                   0             0              1               0
##   0.747528                   0             0              0               0
##   0.750111                   0             0              0               0
##   0.752926                   0             0              0               0
##   0.753782                   0             0              0               0
##   0.754599                   0             0              0               0
##   0.754646                   1             0              0               0
##   0.756277                   0             0              0               1
##   0.759422                   0             0              0               0
##   0.763595                   0             0              0               1
##   0.766007                   0             0              0               1
##   0.767013                   0             0              1               0
##   0.769709                   0             0              0               1
##   0.769726                   1             0              0               0
##   0.770536                   0             0              0               0
##   0.779686                   0             0              0               0
##   0.780117                   0             0              0               0
##   0.782416                   0             0              1               0
##   0.783676                   1             0              0               0
##   0.783963                   0             0              0               0
##   0.784216                   0             0              0               0
##   0.786828                   0             0              0               0
##   0.788585                   0             0              1               0
##   0.788659                   0             0              0               0
##   0.791929                   1             0              0               0
##   0.792553                   0             0              0               0
##   0.792929                   0             0              0               0
##   0.793262                   0             0              0               1
##   0.793489                   0             0              0               0
##   0.794402                   1             0              0               0
##   0.79677                    0             0              0               1
##   0.797209                   0             0              0               1
##   0.800487                   0             0              0               1
##   0.806422                   0             0              0               0
##   0.807076                   0             0              0               0
##   0.80873                    0             0              0               0
##   0.80989                    0             0              0               0
##   0.813917                   0             0              0               0
##   0.81517                    0             0              0               0
##   0.815509                   0             0              0               0
##   0.819269                   1             0              0               0
##   0.819682                   1             0              0               0
##   0.821977                   1             0              0               0
##   0.822186                   0             0              0               1
##   0.826609                   0             0              0               0
##   0.82666                    0             0              0               0
##   0.827502                   0             0              1               0
##   0.827506                   0             0              0               0
##   0.833976                   1             0              0               0
##   0.835271                   0             0              0               1
##   0.838739                   0             0              0               1
##   0.839481                   0             0              0               1
##   0.843709                   0             0              0               0
##   0.849811                   0             0              0               1
##   0.850715                   0             0              0               0
##   0.851059                   0             0              1               0
##   0.852344                   0             0              0               1
##   0.852446                   0             0              1               0
##   0.854337                   1             0              0               0
##   0.854957                   0             0              0               1
##   0.8554                     0             0              0               0
##   0.855973                   0             0              0               0
##   0.858554                   0             0              0               1
##   0.863158                   0             0              0               1
##   0.866045                   1             0              0               0
##   0.868721                   0             0              0               0
##   0.870056                   0             0              0               1
##   0.870127                   0             0              0               0
##   0.874643                   0             0              0               0
##   0.87599                    0             0              0               0
##   0.876101                   0             0              1               0
##   0.877067                   0             0              0               0
##   0.877295                   0             0              1               0
##   0.87967                    1             0              0               0
##   0.880584                   0             0              0               0
##   0.882709                   0             0              0               1
##   0.883171                   0             0              0               1
##   0.883542                   0             0              0               1
##   0.884935                   0             0              1               0
##   0.885633                   0             0              0               0
##   0.886448                   0             0              1               0
##   0.886602                   0             0              0               0
##   0.886817                   0             0              0               1
##   0.887923                   0             0              0               0
##   0.889963                   0             0              0               0
##   0.891205                   0             0              0               0
##   0.891444                   0             0              1               0
##   0.893362                   0             0              0               0
##   0.897562                   0             0              0               1
##   0.897702                   0             0              0               0
##   0.899864                   0             0              1               0
##   0.901924                   0             0              0               1
##   0.902095                   1             0              0               0
##   0.902661                   0             0              0               0
##   0.902776                   0             0              0               1
##   0.903369                   0             0              1               0
##   0.906843                   0             0              0               1
##   0.908981                   0             0              0               1
##   0.912334                   0             0              0               0
##   0.915699                   0             0              0               0
##   0.916478                   0             0              0               1
##   0.917014                   0             0              0               1
##   0.917563                   0             0              1               0
##   0.919388                   0             0              0               1
##   0.920476                   0             0              0               0
##   0.921268                   0             0              0               0
##   0.922014                   0             0              0               0
##   0.922739                   0             0              1               0
##   0.923428                   0             0              0               1
##   0.925118                   0             0              0               0
##   0.925941                   0             0              0               1
##   0.926201                   0             0              0               0
##   0.92635                    0             0              0               0
##   0.926592                   0             0              0               0
##   0.932783                   0             0              0               1
##   0.932792                   0             0              0               0
##   0.932888                   0             0              0               0
##   0.933595                   0             0              0               0
##   0.934286                   0             0              0               0
##   0.935217                   0             0              0               0
##   0.93732                    0             0              0               1
##   0.94141                    0             0              0               1
##   0.941424                   0             0              0               1
##   0.94224                    0             0              0               0
##   0.943058                   0             0              0               0
##   0.943266                   0             0              0               0
##   0.944982                   0             0              0               0
##   0.945093                   1             0              0               0
##   0.94522                    0             0              0               1
##   0.946461                   0             0              1               0
##   0.94676                    0             0              0               1
##   0.946763                   0             0              0               1
##   0.94893                    0             0              0               0
##   0.94984                    0             0              0               0
##   0.949976                   0             0              0               0
##   0.952725                   0             0              0               0
##   0.9529                     0             0              1               0
##   0.954459                   0             0              0               0
##   0.955317                   0             0              0               1
##   0.958555                   0             0              0               1
##   0.966617                   0             0              0               1
##   0.966973                   0             0              0               0
##   0.967627                   0             0              1               0
##   0.970661                   0             0              0               0
##   0.973114                   0             0              0               0
##   0.973465                   0             0              1               0
##   0.973864                   0             0              0               0
##   0.975187                   0             0              1               0
##   0.975384                   0             0              0               1
##   0.976425                   0             0              0               1
##   0.977929                   0             0              0               0
##   0.977998                   0             0              0               0
##   0.97812                    0             0              0               0
##   0.978815                   0             0              1               0
##   0.979306                   0             0              0               1
##   0.979701                   1             0              0               0
##   0.981686                   0             0              1               0
##   0.982134                   0             0              0               1
##   0.98232                    0             0              1               0
##   0.985287                   0             0              0               0
##   0.985872                   0             0              0               0
##   0.986414                   0             0              0               0
##   0.987521                   0             0              0               1
##   0.987591                   0             0              1               0
##   0.989316                   0             0              0               0
##   0.989335                   0             0              0               0
##   0.990642                   0             0              1               0
##   0.992253                   0             0              0               1
##   0.992371                   0             0              0               1
##   0.992829                   0             0              0               1
##   0.99295                    1             0              0               0
##   0.993058                   1             0              0               0
##   0.994422                   0             0              0               1
##   0.994592                   0             0              0               0
##   0.995735                   1             0              0               0
##   0.997202                   0             0              0               0
##   0.997731                   0             0              0               0
##   0.998039                   0             0              0               0
##   0.998391                   1             0              0               0
##   1                          6            97             39               2
##   1.000227                   0             0              1               0
##   1.00109                    0             0              0               1
##   1.00183                    0             0              1               0
##   1.003294                   0             0              0               1
##   1.006884                   0             0              1               0
##   1.016042                   0             0              0               0
##   1.016254                   0             0              0               1
##   1.018158                   0             0              0               1
##   1.020525                   0             0              1               0
##   1.025438                   0             0              0               1
##   1.02569                    0             0              1               0
##   1.026452                   0             0              0               0
##   1.02975                    0             0              1               0
##   1.030199                   0             0              1               0
##   1.030526                   0             0              1               0
##   1.030752                   0             0              0               0
##   1.034031                   0             0              0               1
##   1.04268                    0             0              0               1
##   1.045107                   0             0              0               1
##   1.046463                   0             0              0               0
##   1.046878                   0             0              0               1
##   1.04729                    0             0              0               0
##   1.048507                   0             0              1               0
##   1.051889                   0             0              0               0
##   1.05545                    0             0              0               1
##   1.055854                   0             0              0               1
##   1.058378                   0             0              0               1
##   1.060349                   0             0              0               0
##   1.061743                   0             0              0               0
##   1.062011                   0             0              1               0
##   1.066101                   0             0              1               0
##   1.066169                   0             0              0               1
##   1.066241                   0             0              0               0
##   1.067817                   1             0              0               0
##   1.070331                   1             0              0               0
##   1.072318                   0             0              0               0
##   1.072662                   0             0              0               0
##   1.076248                   0             0              0               1
##   1.07672                    0             0              0               1
##   1.076729                   0             0              0               1
##   1.076926                   0             0              0               1
##   1.077469                   1             0              0               0
##   1.078074                   0             0              0               0
##   1.078719                   1             0              0               0
##   1.079524                   0             0              0               1
##   1.079934                   0             0              0               1
##   1.082236                   0             0              0               1
##   1.083572                   0             0              0               0
##   1.089061                   0             0              0               1
##   1.089344                   0             0              0               1
##   1.089891                   0             0              0               1
##   1.091474                   0             0              1               0
##   1.093679                   0             0              0               0
##   1.094035                   0             0              0               0
##   1.094839                   0             0              0               1
##   1.096556                   0             0              0               1
##   1.096818                   0             0              0               0
##   1.097905                   0             0              0               1
##   1.097983                   0             0              0               1
##   1.098862                   1             0              0               0
##   1.103088                   0             0              0               0
##   1.103209                   0             0              1               0
##   1.107543                   0             0              0               0
##   1.110215                   0             0              0               1
##   1.110868                   0             0              0               1
##   1.112504                   0             0              0               1
##   1.113169                   0             0              0               1
##   1.117311                   0             0              0               0
##   1.121038                   0             0              0               1
##   1.123931                   0             0              0               0
##   1.1293                     0             0              0               1
##   1.139107                   0             0              0               0
##   1.141708                   0             0              0               1
##   1.144076                   0             0              0               1
##   1.144683                   0             0              0               1
##   1.144876                   0             0              1               0
##   1.145752                   0             0              0               0
##   1.153775                   0             0              0               0
##   1.156024                   0             0              0               1
##   1.15804                    0             0              0               1
##   1.159598                   0             0              0               1
##   1.162519                   1             0              0               0
##   1.166064                   0             0              1               0
##   1.167856                   0             0              0               1
##   1.168368                   0             0              0               0
##   1.170537                   0             0              0               1
##   1.170823                   0             0              0               0
##   1.17116                    0             0              0               0
##   1.17177                    0             0              1               0
##   1.172641                   0             0              1               0
##   1.179592                   0             0              0               0
##   1.181811                   0             0              0               1
##   1.186013                   0             0              1               0
##   1.190465                   1             0              0               0
##   1.19102                    0             0              0               1
##   1.193486                   1             0              0               0
##   1.194519                   0             0              0               0
##   1.194898                   0             0              0               1
##   1.196368                   0             0              0               1
##   1.201403                   0             0              1               0
##   1.206059                   0             0              0               0
##   1.206121                   0             0              0               0
##   1.20758                    0             0              1               0
##   1.208142                   0             0              0               1
##   1.210736                   0             0              0               0
##   1.211048                   0             0              0               1
##   1.21718                    1             0              0               0
##   1.217993                   0             0              0               1
##   1.219827                   0             0              0               0
##   1.224743                   0             0              0               0
##   1.226019                   0             0              0               1
##   1.228136                   1             0              0               0
##   1.230219                   0             0              0               1
##   1.230441                   1             0              0               0
##   1.231031                   0             0              0               0
##   1.234483                   0             0              1               0
##   1.235675                   1             0              0               0
##   1.236114                   0             0              0               0
##   1.243567                   0             0              0               1
##   1.246223                   0             0              0               1
##   1.247505                   0             0              0               0
##   1.251665                   0             0              1               0
##   1.252472                   1             0              1               0
##   1.256115                   0             0              0               0
##   1.258504                   1             0              0               0
##   1.25955                    1             0              0               0
##   1.259613                   0             0              1               0
##   1.264257                   0             0              0               0
##   1.264616                   0             0              0               0
##   1.266739                   0             0              0               1
##   1.266866                   0             0              0               1
##   1.269169                   0             0              1               0
##   1.271651                   0             0              0               0
##   1.271667                   0             0              0               0
##   1.276552                   0             0              0               0
##   1.280191                   0             0              0               1
##   1.280924                   0             0              1               0
##   1.281165                   0             0              0               1
##   1.284798                   0             0              0               1
##   1.285976                   1             0              0               0
##   1.28775                    0             0              0               0
##   1.289421                   0             0              0               1
##   1.293396                   0             0              0               0
##   1.293665                   0             0              0               0
##   1.295697                   1             0              0               0
##   1.295759                   0             0              0               0
##   1.296535                   0             0              1               0
##   1.299469                   0             0              0               1
##   1.302507                   0             0              0               0
##   1.303976                   1             0              0               0
##   1.304291                   0             0              0               1
##   1.305633                   0             0              0               0
##   1.306476                   0             0              0               1
##   1.308852                   0             0              1               0
##   1.309304                   0             0              1               0
##   1.31257                    0             0              0               1
##   1.315045                   0             0              0               1
##   1.31817                    1             0              0               0
##   1.318743                   0             0              0               0
##   1.320065                   0             0              0               1
##   1.321624                   1             0              0               0
##   1.322558                   0             0              1               0
##   1.32417                    0             0              0               0
##   1.324805                   0             0              0               0
##   1.32534                    0             0              0               1
##   1.327193                   0             0              0               0
##   1.327833                   1             0              0               0
##   1.330519                   0             0              0               1
##   1.331526                   0             0              0               1
##   1.333435                   0             0              0               1
##   1.335857                   0             0              1               0
##   1.34139                    0             0              0               0
##   1.343875                   0             0              0               0
##   1.350001                   0             0              1               0
##   1.351996                   1             0              0               0
##   1.352558                   1             0              0               0
##   1.352663                   0             0              1               0
##   1.352973                   0             0              0               1
##   1.356468                   0             0              0               1
##   1.358185                   0             0              0               0
##   1.360635                   0             0              0               0
##   1.360994                   0             0              0               1
##   1.361533                   0             0              1               0
##   1.37467                    1             0              0               0
##   1.376217                   0             0              0               1
##   1.376229                   0             0              0               0
##   1.376534                   0             0              0               0
##   1.384607                   0             0              0               1
##   1.386151                   0             0              0               1
##   1.39016                    0             0              0               0
##   1.392026                   0             0              0               1
##   1.392406                   0             0              0               1
##   1.39302                    0             0              0               1
##   1.399183                   0             0              0               1
##   1.403872                   0             0              0               0
##   1.408177                   0             0              0               0
##   1.412357                   0             0              0               0
##   1.413239                   0             0              0               0
##   1.414209                   0             0              0               0
##   1.416076                   0             0              0               0
##   1.4164                     0             0              0               0
##   1.417035                   0             0              0               0
##   1.419473                   0             0              0               0
##   1.420675                   0             0              0               1
##   1.42237                    1             0              0               0
##   1.425712                   0             0              0               0
##   1.427037                   0             0              0               0
##   1.427233                   0             0              0               0
##   1.427413                   0             0              0               0
##   1.429256                   0             0              0               0
##   1.433151                   0             0              0               0
##   1.441791                   0             0              0               0
##   1.442485                   0             0              0               0
##   1.44287                    1             0              0               0
##   1.444382                   0             0              0               0
##   1.445148                   0             0              0               0
##   1.452467                   0             0              0               0
##   1.453042                   0             0              0               1
##   1.454129                   0             0              1               0
##   1.45473                    0             0              1               0
##   1.456933                   0             0              0               0
##   1.46046                    0             0              0               0
##   1.461005                   1             0              0               0
##   1.46361                    0             0              0               0
##   1.464204                   0             0              1               0
##   1.464674                   0             0              0               0
##   1.46525                    0             0              0               0
##   1.465909                   0             0              0               0
##   1.465931                   0             0              0               0
##   1.46782                    0             0              0               0
##   1.467863                   0             0              0               1
##   1.469928                   0             0              0               0
##   1.472172                   0             0              0               0
##   1.474937                   0             0              0               0
##   1.475772                   0             0              0               0
##   1.480919                   0             0              0               0
##   1.482411                   0             0              1               0
##   1.48372                    0             0              0               0
##   1.48524                    0             0              0               1
##   1.485978                   0             0              0               1
##   1.486289                   0             0              0               0
##   1.487987                   1             0              0               0
##   1.48809                    0             0              0               0
##   1.488843                   1             0              0               0
##   1.492967                   0             0              1               0
##   1.493018                   0             0              0               0
##   1.501647                   0             0              0               0
##   1.501754                   0             0              0               1
##   1.502711                   0             0              0               0
##   1.504003                   0             0              0               0
##   1.505775                   0             0              0               0
##   1.508897                   0             0              0               0
##   1.510398                   0             0              0               0
##   1.513029                   1             0              0               0
##   1.516147                   0             0              0               0
##   1.52001                    0             0              0               1
##   1.520818                   0             0              0               0
##   1.52184                    0             0              1               0
##   1.522399                   1             0              0               0
##   1.522429                   0             0              0               1
##   1.524405                   0             0              0               0
##   1.525165                   0             0              0               0
##   1.525384                   0             0              0               1
##   1.528968                   0             0              0               0
##   1.536555                   0             0              0               0
##   1.537639                   0             0              0               0
##   1.538922                   0             0              0               1
##   1.541072                   0             0              0               1
##   1.543386                   0             0              0               1
##   1.543961                   0             0              0               1
##   1.544632                   0             0              0               0
##   1.546179                   0             0              0               0
##   1.548953                   1             0              0               0
##   1.549693                   0             0              1               0
##   1.553734                   0             0              0               1
##   1.554817                   0             0              0               0
##   1.556155                   0             0              0               0
##   1.556709                   0             0              0               1
##   1.557737                   1             0              0               0
##   1.560261                   0             0              0               0
##   1.562213                   0             0              0               0
##   1.564618                   0             0              0               0
##   1.571865                   0             0              0               0
##   1.577824                   0             0              0               0
##   1.579431                   0             0              1               0
##   1.580263                   0             0              0               1
##   1.581242                   0             0              0               0
##   1.582428                   0             0              0               0
##   1.582675                   0             0              0               0
##   1.583832                   0             0              0               1
##   1.584716                   0             0              0               0
##   1.586525                   0             0              0               0
##   1.587406                   0             0              0               1
##   1.590255                   0             0              0               1
##   1.592494                   0             0              0               0
##   1.592795                   0             0              0               1
##   1.593183                   0             0              0               1
##   1.596576                   1             0              0               1
##   1.600431                   0             0              0               0
##   1.600536                   0             0              0               1
##   1.60195                    1             0              0               0
##   1.605983                   0             0              1               0
##   1.606109                   0             0              0               0
##   1.607953                   0             0              0               0
##   1.609801                   0             0              0               0
##   1.609938                   0             0              0               0
##   1.612248                   1             0              0               0
##   1.612741                   0             0              0               0
##   1.616882                   1             0              0               0
##   1.618512                   0             0              0               0
##   1.621733                   0             0              0               1
##   1.622055                   0             0              0               1
##   1.624981                   0             0              0               0
##   1.628637                   0             0              0               1
##   1.629432                   0             0              1               0
##   1.631912                   0             0              0               1
##   1.634134                   0             0              0               0
##   1.63581                    1             0              0               0
##   1.637368                   0             0              0               0
##   1.63812                    0             0              0               1
##   1.645532                   0             0              0               0
##   1.645654                   0             0              1               0
##   1.648883                   0             0              1               0
##   1.649299                   0             0              1               0
##   1.655488                   0             0              0               0
##   1.655993                   0             0              0               0
##   1.658698                   0             0              0               0
##   1.661556                   1             0              0               0
##   1.664722                   0             0              0               1
##   1.66639                    0             0              0               0
##   1.666965                   0             0              1               0
##   1.668961                   0             0              0               1
##   1.67036                    0             0              0               1
##   1.672639                   0             0              0               0
##   1.676269                   0             0              0               0
##   1.679935                   1             0              0               0
##   1.680844                   1             0              0               0
##   1.682271                   0             0              0               0
##   1.68249                    0             0              0               0
##   1.68291                    0             0              0               0
##   1.683497                   0             0              0               0
##   1.683957                   1             0              0               0
##   1.684582                   0             0              0               0
##   1.685369                   0             0              0               1
##   1.686229                   0             0              0               1
##   1.689525                   0             0              0               1
##   1.696294                   1             0              0               0
##   1.699056                   0             0              0               0
##   1.699181                   0             0              0               1
##   1.699592                   1             0              0               0
##   1.700889                   0             0              0               0
##   1.70464                    0             0              0               0
##   1.708971                   0             0              0               0
##   1.71807                    0             0              1               0
##   1.71836                    0             0              0               0
##   1.718543                   0             0              0               0
##   1.722053                   0             0              0               0
##   1.723934                   0             0              0               0
##   1.725931                   0             0              1               0
##   1.727114                   0             0              0               0
##   1.728332                   0             0              0               0
##   1.729987                   0             0              0               0
##   1.73209                    0             0              1               0
##   1.73234                    0             0              0               0
##   1.734424                   0             0              0               0
##   1.736538                   0             0              0               0
##   1.738267                   0             0              0               1
##   1.742453                   0             0              0               0
##   1.746583                   0             0              0               1
##   1.747347                   0             0              0               0
##   1.751656                   0             0              1               0
##   1.757724                   0             0              1               0
##   1.763277                   0             0              0               0
##   1.771754                   0             0              1               0
##   1.773304                   0             0              0               0
##   1.779646                   0             0              0               0
##   1.781589                   0             0              1               0
##   1.783138                   0             0              0               0
##   1.783858                   0             0              1               0
##   1.796779                   0             0              1               0
##   1.804157                   0             0              0               1
##   1.80674                    0             0              0               0
##   1.809745                   0             0              0               0
##   1.813318                   0             0              1               0
##   1.814869                   0             0              1               0
##   1.815768                   0             0              0               0
##   1.818052                   0             0              0               1
##   1.82434                    0             0              0               0
##   1.838881                   1             0              0               0
##   1.846666                   0             0              1               0
##   1.847802                   0             0              0               1
##   1.851404                   0             0              1               0
##   1.853425                   1             0              0               0
##   1.856119                   0             0              0               0
##   1.857351                   0             0              0               1
##   1.859667                   0             0              0               1
##   1.860765                   0             0              0               1
##   1.862235                   1             0              0               0
##   1.863258                   0             0              0               0
##   1.866023                   0             0              1               0
##   1.866839                   0             0              0               1
##   1.874662                   0             0              1               0
##   1.876051                   0             0              0               0
##   1.877369                   1             0              0               0
##   1.879818                   0             0              0               0
##   1.881761                   0             0              0               0
##   1.88452                    0             0              1               0
##   1.887012                   0             0              1               0
##   1.889937                   0             0              0               1
##   1.890907                   0             0              1               0
##   1.898889                   0             0              0               0
##   1.903182                   1             0              0               0
##   1.903338                   0             0              1               0
##   1.910432                   0             0              0               0
##   1.910577                   0             0              0               0
##   1.91108                    0             0              0               0
##   1.911096                   0             0              1               0
##   1.912981                   0             0              0               0
##   1.916751                   0             0              0               0
##   1.917014                   0             0              0               0
##   1.917383                   0             0              0               1
##   1.922234                   0             0              0               0
##   1.92628                    0             0              0               0
##   1.926381                   0             0              0               0
##   1.926592                   1             0              0               0
##   1.928275                   0             0              0               1
##   1.930033                   0             0              0               1
##   1.931173                   0             0              0               0
##   1.931829                   0             0              0               0
##   1.932386                   0             0              1               0
##   1.940182                   1             0              0               0
##   1.943743                   0             0              0               1
##   1.944728                   0             0              1               0
##   1.946907                   0             0              1               0
##   1.94907                    1             0              0               0
##   1.949667                   1             0              0               0
##   1.94984                    0             0              0               1
##   1.950374                   0             0              0               0
##   1.951027                   1             0              0               0
##   1.952427                   1             0              0               0
##   1.955992                   0             0              0               0
##   1.956278                   0             0              0               0
##   1.958694                   0             0              0               1
##   1.963379                   0             0              0               0
##   1.96582                    0             0              0               0
##   1.967234                   1             0              0               0
##   1.967973                   0             0              1               0
##   1.97073                    0             0              0               0
##   1.974656                   0             0              0               0
##   1.976341                   1             0              0               0
##   1.976427                   0             0              0               0
##   1.976582                   0             0              0               1
##   1.977918                   0             0              0               1
##   1.978631                   1             0              0               0
##   1.979355                   0             0              0               1
##   1.980401                   0             0              0               1
##   1.980738                   0             0              0               0
##   1.981154                   0             0              0               1
##   1.982379                   0             0              0               1
##   1.983265                   0             0              1               0
##   1.98448                    0             0              0               0
##   1.985536                   0             0              0               1
##   1.986646                   0             0              0               0
##   1.987296                   0             0              0               1
##   1.989171                   0             0              0               0
##   1.989316                   0             0              0               1
##   1.990317                   0             0              0               0
##   1.991565                   0             0              1               0
##   1.992719                   0             0              1               0
##   1.993666                   0             0              0               0
##   1.99507                    0             0              0               0
##   1.995582                   0             0              0               0
##   1.996487                   0             0              0               1
##   1.997529                   0             0              0               0
##   1.998047                   0             0              0               0
##   1.999631                   0             0              0               0
##   1.99975                    0             0              0               1
##   1.999773                   0             0              0               0
##   1.999836                   0             0              0               0
##   1.999886                   0             0              0               1
##   1.999897                   0             0              0               0
##   2                         64            69             12               5
##   2.000088                   1             0              0               0
##   2.000561                   0             0              1               0
##   2.000934                   1             0              0               0
##   2.00123                    0             0              1               0
##   2.002997                   1             0              0               0
##   2.005286                   0             0              1               0
##   2.008256                   1             0              0               0
##   2.009397                   1             0              0               0
##   2.011519                   1             0              0               0
##   2.011646                   1             0              0               0
##   2.013377                   1             0              0               0
##   2.022315                   0             0              0               0
##   2.026668                   1             0              0               0
##   2.038653                   1             0              0               0
##   2.040816                   0             0              0               0
##   2.044165                   0             0              0               0
##   2.05252                    0             0              1               0
##   2.052896                   0             0              1               0
##   2.060415                   0             0              0               0
##   2.063943                   0             0              0               0
##   2.075293                   1             0              0               0
##   2.077653                   1             0              0               0
##   2.079709                   0             0              0               0
##   2.08515                    0             0              1               0
##   2.091862                   0             0              1               0
##   2.094542                   0             0              0               0
##   2.11137                    0             0              1               0
##   2.113151                   1             0              0               0
##   2.113992                   0             0              1               0
##   2.119682                   0             0              0               0
##   2.146778                   0             0              1               0
##   2.148738                   0             0              0               0
##   2.16079                    0             0              0               0
##   2.164472                   0             0              0               0
##   2.165429                   0             0              1               0
##   2.172546                   0             0              0               0
##   2.177243                   0             0              0               0
##   2.20208                    1             0              0               0
##   2.206055                   1             0              0               0
##   2.206738                   1             0              0               0
##   2.207881                   0             0              0               0
##   2.21722                    0             0              0               0
##   2.21939                    0             0              1               0
##   2.230109                   0             0              1               0
##   2.230547                   0             0              1               0
##   2.232851                   0             0              1               0
##   2.236586                   0             0              1               0
##   2.2405                     0             0              1               0
##   2.240714                   1             0              0               0
##   2.242754                   0             0              0               0
##   2.269058                   0             0              0               0
##   2.270555                   0             0              0               0
##   2.274248                   0             0              0               0
##   2.287423                   0             0              0               0
##   2.300282                   0             0              0               0
##   2.306844                   1             0              0               0
##   2.315983                   0             0              0               0
##   2.318492                   0             0              0               0
##   2.328147                   1             0              0               0
##   2.349495                   1             0              0               0
##   2.352091                   0             0              1               0
##   2.358699                   0             0              0               0
##   2.359339                   0             0              1               0
##   2.392047                   0             0              1               0
##   2.405963                   0             0              0               0
##   2.407906                   1             0              0               0
##   2.429923                   0             0              1               0
##   2.432443                   1             0              0               0
##   2.433918                   0             0              0               0
##   2.458237                   1             0              0               0
##   2.460238                   1             0              0               0
##   2.462269                   0             0              1               0
##   2.491642                   0             0              1               0
##   2.492402                   0             0              1               0
##   2.511157                   1             0              0               0
##   2.536615                   0             0              0               0
##   2.539762                   1             0              0               0
##   2.545707                   0             0              1               0
##   2.545931                   0             0              0               0
##   2.57223                    0             0              0               0
##   2.595128                   1             0              0               0
##   2.614909                   0             0              1               0
##   2.627515                   0             0              0               0
##   2.64102                    0             0              1               0
##   2.641072                   0             0              0               0
##   2.667739                   0             0              0               0
##   2.669179                   0             0              1               0
##   2.685087                   0             0              0               0
##   2.690756                   0             0              0               0
##   2.697949                   1             0              0               0
##   2.698874                   0             0              1               0
##   2.707882                   0             0              0               0
##   2.70825                    0             0              0               0
##   2.710338                   0             0              1               0
##   2.721646                   0             0              0               0
##   2.7243                     0             0              0               0
##   2.762711                   0             0              0               0
##   2.784471                   1             0              0               0
##   2.787319                   0             0              1               0
##   2.805801                   0             0              0               0
##   2.819661                   0             0              1               0
##   2.830911                   1             0              0               0
##   2.834373                   0             0              0               0
##   2.847761                   0             0              0               0
##   2.870127                   1             0              0               0
##   2.876696                   0             0              0               0
##   2.877473                   0             0              0               0
##   2.878414                   0             0              0               0
##   2.89118                    0             0              1               0
##   2.891986                   0             0              1               0
##   2.892922                   0             0              0               0
##   2.931527                   0             0              0               0
##   2.936551                   0             0              0               0
##   2.939733                   0             0              0               0
##   2.971832                   0             0              0               0
##   2.998981                   0             0              1               0
##   2.999918                   0             0              1               0
##   3                          4            41             13               0
##           
##            Obesity_Type_III Overweight_Level_I Overweight_Level_II
##   0                      87                 40                  61
##   9.6e-05                 1                  0                   0
##   0.000272                1                  0                   0
##   0.000454                1                  0                   0
##   0.001015                1                  0                   0
##   0.001086                0                  0                   0
##   0.001272                1                  0                   0
##   0.001297                1                  0                   0
##   0.00203                 0                  0                   0
##   0.00342                 0                  1                   0
##   0.003938                0                  0                   0
##   0.005405                0                  0                   0
##   0.005939                1                  0                   0
##   0.006265                1                  0                   0
##   0.00705                 0                  1                   1
##   0.008013                1                  0                   0
##   0.008127                1                  0                   0
##   0.008368                0                  0                   0
##   0.010183                1                  0                   0
##   0.011161                1                  0                   0
##   0.011477                0                  0                   0
##   0.011519                0                  0                   0
##   0.01437                 1                  0                   0
##   0.01586                 2                  0                   0
##   0.01682                 1                  0                   0
##   0.017804                1                  0                   0
##   0.019404                1                  0                   0
##   0.02006                 1                  0                   0
##   0.02112                 0                  0                   1
##   0.022598                0                  0                   0
##   0.022958                0                  0                   1
##   0.023574                0                  0                   0
##   0.025787                1                  0                   0
##   0.026033                2                  0                   0
##   0.026142                0                  0                   0
##   0.027101                1                  0                   0
##   0.027433                0                  0                   0
##   0.028202                0                  0                   0
##   0.029603                0                  0                   0
##   0.029728                2                  0                   0
##   0.030541                1                  0                   0
##   0.033328                0                  0                   0
##   0.033745                0                  0                   1
##   0.03465                 1                  0                   0
##   0.035091                0                  0                   0
##   0.035928                1                  0                   0
##   0.038809                0                  0                   1
##   0.039207                0                  0                   1
##   0.043101                1                  0                   0
##   0.043412                0                  0                   0
##   0.043689                1                  0                   0
##   0.045246                1                  0                   0
##   0.04525                 1                  0                   0
##   0.045651                0                  1                   0
##   0.046836                0                  1                   0
##   0.047738                0                  0                   1
##   0.05093                 1                  0                   0
##   0.051097                1                  0                   0
##   0.054238                0                  0                   0
##   0.057758                0                  0                   0
##   0.061366                0                  1                   0
##   0.06275                 0                  0                   0
##   0.062932                0                  0                   0
##   0.063383                1                  0                   0
##   0.065264                0                  0                   0
##   0.06582                 1                  0                   0
##   0.067329                1                  0                   0
##   0.067491                0                  0                   0
##   0.067985                1                  0                   0
##   0.069238                1                  0                   0
##   0.069802                0                  0                   0
##   0.07089                 1                  0                   0
##   0.07115                 1                  0                   0
##   0.072117                0                  0                   1
##   0.073065                0                  0                   0
##   0.075776                1                  0                   0
##   0.083675                1                  0                   0
##   0.085119                1                  0                   0
##   0.085388                0                  1                   0
##   0.090147                0                  0                   1
##   0.090917                1                  0                   0
##   0.092344                0                  1                   0
##   0.093418                0                  0                   0
##   0.094851                1                  0                   0
##   0.094893                0                  1                   0
##   0.095389                0                  0                   1
##   0.095517                0                  1                   0
##   0.097114                1                  0                   0
##   0.098043                1                  0                   0
##   0.10032                 1                  0                   0
##   0.101236                0                  1                   0
##   0.10297                 0                  0                   0
##   0.104451                0                  1                   0
##   0.104707                0                  0                   0
##   0.107078                0                  0                   0
##   0.107981                0                  0                   0
##   0.108386                1                  0                   0
##   0.108948                0                  0                   0
##   0.109327                1                  0                   0
##   0.110174                0                  1                   1
##   0.110887                0                  1                   0
##   0.112122                1                  0                   0
##   0.112383                0                  0                   1
##   0.11243                 0                  0                   0
##   0.112454                0                  0                   0
##   0.114698                1                  0                   0
##   0.115369                1                  0                   0
##   0.115974                0                  0                   0
##   0.118271                0                  0                   0
##   0.11964                 0                  1                   0
##   0.119643                0                  0                   0
##   0.120165                0                  0                   0
##   0.121585                0                  1                   0
##   0.127425                0                  0                   0
##   0.128342                0                  0                   0
##   0.128548                0                  0                   0
##   0.129163                0                  1                   0
##   0.129178                1                  0                   0
##   0.129902                0                  1                   0
##   0.130417                0                  0                   0
##   0.131371                0                  0                   0
##   0.132629                0                  1                   0
##   0.133398                0                  0                   0
##   0.139159                1                  0                   0
##   0.139808                0                  0                   0
##   0.143955                2                  0                   0
##   0.144627                0                  0                   0
##   0.14495                 0                  0                   0
##   0.145687                0                  0                   0
##   0.146919                0                  0                   1
##   0.148628                0                  1                   0
##   0.15136                 0                  1                   0
##   0.152713                1                  0                   0
##   0.155579                0                  0                   1
##   0.159255                1                  0                   0
##   0.162083                1                  0                   0
##   0.162279                1                  0                   0
##   0.165269                0                  0                   0
##   0.165422                1                  0                   0
##   0.167086                1                  0                   0
##   0.167125                0                  1                   0
##   0.167943                0                  0                   0
##   0.170452                0                  1                   0
##   0.17048                 0                  0                   1
##   0.174475                0                  0                   0
##   0.174692                0                  0                   0
##   0.1768                  0                  0                   0
##   0.178023                0                  1                   0
##   0.178856                0                  0                   0
##   0.178976                0                  1                   0
##   0.180158                1                  0                   0
##   0.180276                0                  0                   0
##   0.181324                0                  0                   0
##   0.181753                0                  0                   0
##   0.182249                0                  0                   0
##   0.184917                0                  1                   0
##   0.189831                1                  0                   0
##   0.189957                0                  0                   1
##   0.190061                1                  0                   0
##   0.192559                0                  0                   0
##   0.194056                1                  0                   0
##   0.194745                0                  0                   0
##   0.196152                0                  0                   0
##   0.197993                1                  0                   0
##   0.201136                0                  0                   0
##   0.202029                0                  0                   0
##   0.204108                1                  0                   0
##   0.206025                0                  0                   0
##   0.206954                0                  0                   0
##   0.209586                1                  0                   0
##   0.210181                0                  0                   0
##   0.210351                2                  0                   0
##   0.215187                0                  0                   0
##   0.216908                0                  0                   0
##   0.217455                1                  0                   0
##   0.218356                0                  0                   0
##   0.220825                1                  0                   0
##   0.224482                1                  0                   0
##   0.227802                0                  0                   0
##   0.227985                0                  0                   0
##   0.228307                0                  1                   0
##   0.228753                0                  1                   0
##   0.232742                1                  0                   0
##   0.233056                0                  0                   0
##   0.233987                0                  0                   0
##   0.234303                1                  0                   0
##   0.23553                 0                  1                   0
##   0.236168                0                  0                   0
##   0.244749                0                  0                   0
##   0.245003                0                  0                   0
##   0.245354                0                  1                   0
##   0.24629                 1                  0                   0
##   0.246831                1                  0                   0
##   0.248034                0                  0                   0
##   0.249264                0                  0                   0
##   0.25289                 0                  0                   0
##   0.256113                0                  0                   0
##   0.256323                0                  0                   0
##   0.259424                1                  0                   0
##   0.259427                1                  0                   0
##   0.260079                0                  0                   0
##   0.261274                0                  1                   0
##   0.262171                0                  0                   1
##   0.264831                1                  0                   0
##   0.268801                0                  0                   0
##   0.271174                0                  1                   0
##   0.274838                0                  0                   1
##   0.279375                0                  0                   1
##   0.281734                0                  0                   0
##   0.281876                0                  0                   1
##   0.282063                1                  0                   0
##   0.285889                0                  0                   1
##   0.288032                0                  0                   0
##   0.291309                0                  0                   0
##   0.292093                0                  0                   0
##   0.294763                1                  0                   0
##   0.295178                0                  0                   0
##   0.300964                1                  0                   0
##   0.303722                0                  1                   0
##   0.305422                0                  0                   1
##   0.312254                0                  0                   0
##   0.312923                1                  0                   0
##   0.31381                 0                  0                   1
##   0.317363                0                  0                   0
##   0.319156                1                  0                   0
##   0.320209                0                  1                   0
##   0.322013                0                  0                   0
##   0.324676                0                  0                   1
##   0.324913                1                  0                   0
##   0.325313                0                  0                   0
##   0.325534                0                  0                   1
##   0.327418                0                  0                   0
##   0.32896                 0                  0                   1
##   0.334264                1                  0                   0
##   0.334579                0                  1                   0
##   0.336795                1                  0                   0
##   0.336814                0                  1                   0
##   0.340915                0                  0                   1
##   0.344013                0                  0                   0
##   0.345684                0                  1                   0
##   0.348839                0                  0                   0
##   0.349371                0                  0                   0
##   0.350717                0                  0                   0
##   0.354541                0                  0                   0
##   0.356288                0                  0                   0
##   0.358709                0                  0                   0
##   0.359134                0                  0                   0
##   0.36009                 1                  0                   0
##   0.360908                1                  0                   0
##   0.362441                0                  0                   1
##   0.368026                0                  0                   0
##   0.371452                0                  1                   0
##   0.371508                0                  0                   0
##   0.373186                0                  0                   0
##   0.378683                0                  1                   0
##   0.380633                0                  0                   0
##   0.382189                1                  0                   0
##   0.387074                1                  0                   0
##   0.388269                0                  0                   0
##   0.38926                 1                  0                   0
##   0.389717                0                  0                   0
##   0.390877                0                  0                   1
##   0.390937                1                  0                   0
##   0.393452                0                  0                   0
##   0.402614                0                  0                   0
##   0.408023                0                  0                   1
##   0.413643                0                  0                   0
##   0.417119                0                  0                   0
##   0.417724                0                  1                   0
##   0.418875                0                  0                   0
##   0.425621                0                  0                   0
##   0.42777                 0                  0                   0
##   0.427905                1                  0                   0
##   0.428173                0                  0                   0
##   0.428259                0                  0                   0
##   0.432813                0                  0                   0
##   0.432973                0                  0                   1
##   0.444347                0                  1                   0
##   0.445238                0                  1                   0
##   0.451009                0                  0                   1
##   0.451078                0                  0                   1
##   0.454944                0                  0                   0
##   0.455216                0                  0                   0
##   0.458237                0                  0                   1
##   0.458981                0                  0                   0
##   0.462951                1                  0                   0
##   0.463891                0                  0                   1
##   0.463949                0                  0                   0
##   0.467562                0                  0                   1
##   0.477855                0                  0                   0
##   0.478134                0                  0                   0
##   0.478595                0                  0                   0
##   0.479592                0                  1                   0
##   0.480206                0                  1                   0
##   0.480614                0                  0                   0
##   0.481555                1                  0                   0
##   0.482625                0                  0                   0
##   0.485322                0                  0                   0
##   0.486006                0                  0                   0
##   0.497373                0                  1                   0
##   0.501417                0                  0                   1
##   0.503105                0                  0                   0
##   0.503122                0                  0                   1
##   0.503279                0                  0                   1
##   0.508847                0                  1                   0
##   0.512094                0                  0                   0
##   0.514225                0                  0                   0
##   0.520407                0                  0                   0
##   0.520408                0                  0                   0
##   0.520989                0                  0                   0
##   0.523847                0                  1                   0
##   0.525002                0                  0                   1
##   0.527341                0                  0                   1
##   0.529259                0                  1                   0
##   0.530925                1                  0                   0
##   0.533309                0                  0                   0
##   0.539952                0                  1                   0
##   0.540397                0                  0                   1
##   0.544564                0                  0                   0
##   0.544784                0                  0                   0
##   0.545919                0                  0                   0
##   0.545931                0                  0                   0
##   0.546402                0                  0                   1
##   0.547515                0                  1                   0
##   0.548991                0                  0                   0
##   0.55181                 0                  0                   1
##   0.552511                0                  0                   0
##   0.553305                0                  1                   0
##   0.554323                1                  0                   0
##   0.554646                0                  0                   0
##   0.55713                 0                  1                   0
##   0.562118                0                  1                   0
##   0.565242                0                  0                   0
##   0.56931                 0                  0                   0
##   0.571648                0                  0                   0
##   0.577063                0                  1                   0
##   0.578074                0                  0                   0
##   0.58216                 0                  0                   0
##   0.582686                0                  0                   0
##   0.584272                0                  0                   0
##   0.584793                0                  0                   0
##   0.588673                0                  1                   0
##   0.592607                0                  0                   0
##   0.597863                0                  0                   0
##   0.598438                0                  0                   1
##   0.598655                0                  0                   0
##   0.600817                0                  0                   0
##   0.603638                0                  0                   0
##   0.604259                0                  0                   1
##   0.6081                  0                  0                   0
##   0.611037                0                  0                   0
##   0.614466                0                  0                   0
##   0.614959                0                  0                   0
##   0.615298                0                  0                   0
##   0.616503                1                  0                   0
##   0.618913                0                  0                   0
##   0.619533                0                  0                   0
##   0.6277                  1                  0                   0
##   0.630944                0                  0                   0
##   0.63119                 0                  1                   0
##   0.631565                0                  0                   0
##   0.632164                0                  0                   1
##   0.632947                0                  0                   0
##   0.641954                0                  0                   0
##   0.64235                 1                  0                   0
##   0.647632                0                  0                   0
##   0.647798                0                  0                   1
##   0.650235                0                  0                   0
##   0.651412                0                  0                   0
##   0.652736                0                  0                   0
##   0.654316                0                  0                   0
##   0.656548                0                  0                   0
##   0.658894                0                  0                   0
##   0.662831                0                  0                   1
##   0.663896                0                  1                   0
##   0.665439                0                  0                   0
##   0.668963                0                  0                   0
##   0.669278                0                  0                   0
##   0.674348                0                  0                   1
##   0.675262                0                  0                   1
##   0.675983                0                  1                   0
##   0.678943                0                  0                   1
##   0.679935                0                  1                   0
##   0.680464                0                  0                   0
##   0.68183                 0                  0                   0
##   0.684487                0                  0                   0
##   0.684739                0                  0                   0
##   0.684879                0                  0                   0
##   0.689371                0                  0                   0
##   0.690269                0                  0                   0
##   0.691369                0                  0                   0
##   0.692123                0                  0                   0
##   0.693732                0                  0                   0
##   0.694281                0                  1                   0
##   0.699592                0                  1                   0
##   0.702538                0                  0                   1
##   0.702839                0                  0                   1
##   0.704236                0                  0                   0
##   0.706287                0                  0                   1
##   0.706777                0                  0                   0
##   0.712726                0                  0                   0
##   0.729898                0                  1                   0
##   0.732186                0                  0                   0
##   0.732276                0                  1                   0
##   0.736032                0                  1                   0
##   0.739881                0                  0                   0
##   0.740633                0                  0                   1
##   0.742113                0                  0                   0
##   0.74225                 1                  0                   0
##   0.743005                0                  0                   0
##   0.743593                0                  0                   0
##   0.747528                0                  1                   0
##   0.750111                1                  0                   0
##   0.752926                0                  0                   1
##   0.753782                0                  1                   0
##   0.754599                0                  1                   0
##   0.754646                0                  0                   0
##   0.756277                0                  0                   0
##   0.759422                0                  1                   0
##   0.763595                0                  0                   0
##   0.766007                0                  0                   0
##   0.767013                0                  0                   0
##   0.769709                0                  0                   0
##   0.769726                0                  0                   0
##   0.770536                0                  1                   0
##   0.779686                0                  1                   0
##   0.780117                0                  1                   0
##   0.782416                0                  0                   0
##   0.783676                0                  0                   0
##   0.783963                0                  1                   0
##   0.784216                0                  1                   0
##   0.786828                1                  0                   0
##   0.788585                0                  0                   0
##   0.788659                0                  0                   1
##   0.791929                0                  0                   0
##   0.792553                1                  0                   0
##   0.792929                0                  1                   0
##   0.793262                0                  0                   0
##   0.793489                0                  1                   0
##   0.794402                0                  0                   0
##   0.79677                 0                  0                   0
##   0.797209                0                  0                   0
##   0.800487                0                  0                   0
##   0.806422                1                  0                   0
##   0.807076                0                  0                   1
##   0.80873                 0                  1                   0
##   0.80989                 0                  0                   1
##   0.813917                0                  0                   1
##   0.81517                 0                  1                   0
##   0.815509                0                  1                   0
##   0.819269                0                  0                   0
##   0.819682                0                  0                   0
##   0.821977                0                  0                   0
##   0.822186                0                  0                   0
##   0.826609                0                  0                   1
##   0.82666                 1                  0                   0
##   0.827502                0                  0                   0
##   0.827506                0                  1                   0
##   0.833976                0                  0                   0
##   0.835271                0                  0                   0
##   0.838739                0                  0                   0
##   0.839481                0                  0                   0
##   0.843709                0                  1                   0
##   0.849811                0                  0                   0
##   0.850715                1                  0                   0
##   0.851059                0                  0                   0
##   0.852344                0                  0                   0
##   0.852446                0                  0                   0
##   0.854337                0                  0                   0
##   0.854957                0                  0                   0
##   0.8554                  0                  0                   1
##   0.855973                0                  0                   1
##   0.858554                0                  0                   0
##   0.863158                0                  0                   0
##   0.866045                0                  0                   0
##   0.868721                0                  0                   1
##   0.870056                0                  0                   0
##   0.870127                0                  0                   1
##   0.874643                0                  1                   0
##   0.87599                 0                  0                   1
##   0.876101                0                  0                   0
##   0.877067                1                  0                   0
##   0.877295                0                  0                   0
##   0.87967                 0                  0                   0
##   0.880584                0                  0                   1
##   0.882709                0                  0                   0
##   0.883171                0                  0                   0
##   0.883542                0                  0                   0
##   0.884935                0                  0                   0
##   0.885633                0                  0                   1
##   0.886448                0                  0                   0
##   0.886602                1                  0                   0
##   0.886817                0                  0                   0
##   0.887923                0                  0                   1
##   0.889963                0                  0                   1
##   0.891205                0                  0                   1
##   0.891444                0                  0                   0
##   0.893362                0                  0                   1
##   0.897562                0                  0                   0
##   0.897702                0                  0                   1
##   0.899864                0                  0                   0
##   0.901924                0                  0                   0
##   0.902095                0                  0                   0
##   0.902661                0                  1                   0
##   0.902776                0                  0                   0
##   0.903369                0                  0                   0
##   0.906843                0                  0                   0
##   0.908981                0                  0                   0
##   0.912334                1                  0                   0
##   0.915699                0                  1                   0
##   0.916478                0                  0                   0
##   0.917014                0                  0                   0
##   0.917563                0                  0                   0
##   0.919388                0                  0                   0
##   0.920476                0                  1                   0
##   0.921268                0                  1                   0
##   0.922014                1                  0                   0
##   0.922739                0                  0                   0
##   0.923428                0                  0                   0
##   0.925118                0                  1                   0
##   0.925941                0                  0                   0
##   0.926201                0                  0                   1
##   0.92635                 0                  0                   1
##   0.926592                0                  1                   0
##   0.932783                0                  0                   0
##   0.932792                0                  0                   1
##   0.932888                0                  0                   1
##   0.933595                1                  0                   0
##   0.934286                0                  0                   1
##   0.935217                0                  0                   2
##   0.93732                 0                  0                   0
##   0.94141                 0                  0                   0
##   0.941424                0                  0                   0
##   0.94224                 0                  1                   0
##   0.943058                0                  1                   0
##   0.943266                0                  0                   1
##   0.944982                0                  1                   0
##   0.945093                0                  0                   0
##   0.94522                 0                  0                   0
##   0.946461                0                  0                   0
##   0.94676                 0                  0                   0
##   0.946763                0                  0                   0
##   0.94893                 0                  1                   0
##   0.94984                 0                  1                   0
##   0.949976                0                  0                   1
##   0.952725                1                  0                   0
##   0.9529                  0                  0                   0
##   0.954459                0                  0                   1
##   0.955317                0                  0                   0
##   0.958555                0                  0                   0
##   0.966617                0                  0                   0
##   0.966973                0                  0                   1
##   0.967627                0                  0                   0
##   0.970661                0                  0                   1
##   0.973114                0                  0                   1
##   0.973465                0                  0                   0
##   0.973864                1                  0                   0
##   0.975187                0                  0                   0
##   0.975384                0                  0                   0
##   0.976425                0                  0                   0
##   0.977929                0                  1                   0
##   0.977998                0                  1                   0
##   0.97812                 0                  1                   0
##   0.978815                0                  0                   0
##   0.979306                0                  0                   0
##   0.979701                0                  0                   0
##   0.981686                0                  0                   0
##   0.982134                0                  0                   0
##   0.98232                 0                  0                   0
##   0.985287                1                  0                   0
##   0.985872                0                  1                   0
##   0.986414                0                  0                   1
##   0.987521                0                  0                   0
##   0.987591                0                  0                   0
##   0.989316                0                  1                   0
##   0.989335                0                  1                   0
##   0.990642                0                  0                   0
##   0.992253                0                  0                   0
##   0.992371                0                  0                   0
##   0.992829                0                  0                   0
##   0.99295                 0                  0                   0
##   0.993058                0                  0                   0
##   0.994422                0                  0                   0
##   0.994592                0                  1                   0
##   0.995735                0                  0                   0
##   0.997202                0                  1                   0
##   0.997731                0                  1                   0
##   0.998039                0                  1                   0
##   0.998391                0                  0                   0
##   1                       0                 44                  46
##   1.000227                0                  0                   0
##   1.00109                 0                  0                   0
##   1.00183                 0                  0                   0
##   1.003294                0                  0                   0
##   1.006884                0                  0                   0
##   1.016042                0                  1                   0
##   1.016254                0                  0                   0
##   1.018158                0                  0                   0
##   1.020525                0                  0                   0
##   1.025438                0                  0                   0
##   1.02569                 0                  0                   0
##   1.026452                1                  0                   0
##   1.02975                 0                  0                   0
##   1.030199                0                  0                   0
##   1.030526                0                  0                   0
##   1.030752                0                  0                   1
##   1.034031                0                  0                   0
##   1.04268                 0                  0                   0
##   1.045107                0                  0                   0
##   1.046463                1                  0                   0
##   1.046878                0                  0                   0
##   1.04729                 0                  0                   1
##   1.048507                0                  0                   0
##   1.051889                1                  0                   0
##   1.05545                 0                  0                   0
##   1.055854                0                  0                   0
##   1.058378                0                  0                   0
##   1.060349                0                  0                   1
##   1.061743                0                  1                   0
##   1.062011                0                  0                   0
##   1.066101                0                  0                   0
##   1.066169                0                  0                   0
##   1.066241                0                  1                   0
##   1.067817                0                  1                   0
##   1.070331                0                  0                   0
##   1.072318                0                  0                   1
##   1.072662                0                  1                   0
##   1.076248                0                  0                   0
##   1.07672                 0                  0                   0
##   1.076729                0                  0                   0
##   1.076926                0                  0                   0
##   1.077469                0                  0                   0
##   1.078074                0                  1                   0
##   1.078719                0                  0                   0
##   1.079524                0                  0                   0
##   1.079934                0                  0                   0
##   1.082236                0                  0                   0
##   1.083572                0                  0                   1
##   1.089061                0                  0                   0
##   1.089344                0                  0                   0
##   1.089891                0                  0                   0
##   1.091474                0                  0                   0
##   1.093679                1                  0                   0
##   1.094035                1                  0                   0
##   1.094839                0                  0                   0
##   1.096556                0                  0                   0
##   1.096818                0                  1                   0
##   1.097905                0                  1                   0
##   1.097983                0                  0                   0
##   1.098862                0                  0                   0
##   1.103088                0                  0                   1
##   1.103209                0                  0                   0
##   1.107543                0                  1                   0
##   1.110215                0                  0                   0
##   1.110868                0                  0                   0
##   1.112504                0                  0                   0
##   1.113169                0                  0                   0
##   1.117311                0                  1                   0
##   1.121038                0                  0                   0
##   1.123931                0                  1                   0
##   1.1293                  0                  0                   0
##   1.139107                1                  0                   0
##   1.141708                0                  0                   0
##   1.144076                0                  0                   0
##   1.144683                0                  0                   0
##   1.144876                0                  0                   0
##   1.145752                0                  0                   1
##   1.153775                0                  1                   0
##   1.156024                0                  0                   0
##   1.15804                 0                  0                   0
##   1.159598                0                  0                   0
##   1.162519                0                  0                   0
##   1.166064                0                  0                   0
##   1.167856                0                  0                   0
##   1.168368                1                  0                   0
##   1.170537                0                  0                   0
##   1.170823                0                  0                   1
##   1.17116                 0                  1                   0
##   1.17177                 0                  0                   0
##   1.172641                0                  0                   0
##   1.179592                0                  1                   0
##   1.181811                0                  0                   0
##   1.186013                0                  0                   0
##   1.190465                0                  0                   0
##   1.19102                 0                  0                   0
##   1.193486                0                  0                   0
##   1.194519                0                  0                   1
##   1.194898                0                  0                   0
##   1.196368                0                  0                   0
##   1.201403                0                  0                   0
##   1.206059                1                  0                   0
##   1.206121                0                  1                   0
##   1.20758                 0                  0                   0
##   1.208142                0                  0                   0
##   1.210736                0                  0                   1
##   1.211048                0                  0                   0
##   1.21718                 0                  0                   0
##   1.217993                0                  0                   0
##   1.219827                0                  0                   1
##   1.224743                0                  1                   0
##   1.226019                0                  0                   0
##   1.228136                0                  1                   0
##   1.230219                0                  0                   0
##   1.230441                0                  0                   0
##   1.231031                1                  0                   0
##   1.234483                0                  0                   0
##   1.235675                0                  0                   0
##   1.236114                0                  1                   0
##   1.243567                0                  0                   0
##   1.246223                0                  0                   0
##   1.247505                1                  0                   0
##   1.251665                0                  0                   0
##   1.252472                0                  0                   0
##   1.256115                1                  0                   0
##   1.258504                0                  0                   0
##   1.25955                 0                  0                   0
##   1.259613                0                  0                   0
##   1.264257                0                  1                   0
##   1.264616                0                  1                   0
##   1.266739                0                  0                   0
##   1.266866                0                  0                   0
##   1.269169                0                  0                   0
##   1.271651                1                  0                   0
##   1.271667                0                  0                   1
##   1.276552                0                  0                   1
##   1.280191                0                  0                   0
##   1.280924                0                  0                   0
##   1.281165                0                  0                   0
##   1.284798                0                  0                   0
##   1.285976                0                  0                   0
##   1.28775                 0                  0                   1
##   1.289421                0                  0                   0
##   1.293396                0                  0                   1
##   1.293665                0                  1                   0
##   1.295697                0                  0                   0
##   1.295759                1                  0                   0
##   1.296535                0                  0                   0
##   1.299469                0                  0                   0
##   1.302507                1                  0                   0
##   1.303976                0                  0                   0
##   1.304291                0                  0                   0
##   1.305633                0                  1                   0
##   1.306476                0                  0                   0
##   1.308852                0                  0                   0
##   1.309304                0                  0                   0
##   1.31257                 0                  0                   0
##   1.315045                0                  0                   0
##   1.31817                 0                  0                   0
##   1.318743                1                  0                   0
##   1.320065                0                  0                   0
##   1.321624                0                  0                   0
##   1.322558                0                  0                   0
##   1.32417                 0                  0                   1
##   1.324805                1                  0                   0
##   1.32534                 0                  0                   0
##   1.327193                0                  0                   1
##   1.327833                0                  0                   0
##   1.330519                0                  0                   0
##   1.331526                0                  0                   0
##   1.333435                0                  0                   0
##   1.335857                0                  0                   0
##   1.34139                 1                  0                   0
##   1.343875                1                  0                   0
##   1.350001                0                  0                   0
##   1.351996                0                  0                   0
##   1.352558                0                  0                   0
##   1.352663                0                  0                   0
##   1.352973                0                  0                   0
##   1.356468                0                  0                   0
##   1.358185                0                  1                   0
##   1.360635                0                  1                   0
##   1.360994                0                  0                   0
##   1.361533                0                  0                   0
##   1.37467                 0                  0                   0
##   1.376217                0                  0                   0
##   1.376229                0                  1                   0
##   1.376534                1                  0                   0
##   1.384607                0                  0                   0
##   1.386151                0                  0                   0
##   1.39016                 0                  0                   1
##   1.392026                0                  0                   0
##   1.392406                0                  0                   0
##   1.39302                 0                  0                   0
##   1.399183                1                  0                   0
##   1.403872                0                  0                   1
##   1.408177                1                  0                   0
##   1.412357                1                  0                   0
##   1.413239                1                  0                   0
##   1.414209                1                  0                   0
##   1.416076                0                  0                   1
##   1.4164                  1                  0                   0
##   1.417035                0                  0                   1
##   1.419473                1                  0                   0
##   1.420675                0                  0                   0
##   1.42237                 0                  0                   0
##   1.425712                1                  0                   0
##   1.427037                1                  0                   0
##   1.427233                0                  0                   1
##   1.427413                1                  0                   0
##   1.429256                1                  0                   0
##   1.433151                1                  0                   0
##   1.441791                1                  0                   0
##   1.442485                0                  0                   1
##   1.44287                 0                  0                   0
##   1.444382                1                  0                   0
##   1.445148                1                  0                   0
##   1.452467                0                  0                   1
##   1.453042                0                  0                   0
##   1.454129                0                  0                   0
##   1.45473                 0                  0                   0
##   1.456933                1                  0                   0
##   1.46046                 1                  0                   0
##   1.461005                0                  0                   0
##   1.46361                 1                  0                   0
##   1.464204                0                  0                   0
##   1.464674                1                  0                   0
##   1.46525                 1                  0                   0
##   1.465909                1                  0                   0
##   1.465931                1                  0                   0
##   1.46782                 1                  0                   0
##   1.467863                0                  0                   0
##   1.469928                1                  0                   0
##   1.472172                0                  0                   1
##   1.474937                0                  0                   1
##   1.475772                0                  0                   1
##   1.480919                1                  0                   0
##   1.482411                0                  0                   0
##   1.48372                 1                  0                   0
##   1.48524                 0                  0                   0
##   1.485978                0                  0                   0
##   1.486289                1                  0                   0
##   1.487987                0                  0                   0
##   1.48809                 1                  0                   0
##   1.488843                0                  0                   0
##   1.492967                0                  0                   0
##   1.493018                1                  0                   0
##   1.501647                1                  0                   0
##   1.501754                0                  0                   0
##   1.502711                0                  1                   0
##   1.504003                0                  1                   0
##   1.505775                1                  0                   0
##   1.508897                1                  0                   0
##   1.510398                1                  0                   0
##   1.513029                0                  0                   0
##   1.516147                0                  0                   1
##   1.52001                 0                  0                   0
##   1.520818                1                  0                   0
##   1.52184                 0                  0                   0
##   1.522399                0                  0                   0
##   1.522429                0                  0                   0
##   1.524405                0                  0                   1
##   1.525165                1                  0                   0
##   1.525384                0                  0                   0
##   1.528968                0                  1                   0
##   1.536555                1                  0                   0
##   1.537639                1                  0                   0
##   1.538922                0                  0                   0
##   1.541072                1                  0                   0
##   1.543386                0                  0                   0
##   1.543961                0                  0                   0
##   1.544632                1                  0                   0
##   1.546179                1                  0                   0
##   1.548953                0                  0                   0
##   1.549693                0                  0                   0
##   1.553734                0                  0                   0
##   1.554817                0                  1                   0
##   1.556155                1                  0                   0
##   1.556709                0                  0                   0
##   1.557737                0                  0                   0
##   1.560261                1                  0                   0
##   1.562213                1                  0                   0
##   1.564618                1                  0                   0
##   1.571865                1                  0                   0
##   1.577824                1                  0                   0
##   1.579431                0                  0                   0
##   1.580263                0                  0                   0
##   1.581242                0                  1                   0
##   1.582428                0                  0                   1
##   1.582675                1                  0                   0
##   1.583832                0                  0                   0
##   1.584716                1                  0                   0
##   1.586525                1                  0                   0
##   1.587406                0                  0                   0
##   1.590255                0                  0                   0
##   1.592494                1                  0                   0
##   1.592795                0                  0                   0
##   1.593183                0                  0                   0
##   1.596576                0                  0                   0
##   1.600431                0                  0                   1
##   1.600536                0                  0                   0
##   1.60195                 0                  0                   0
##   1.605983                0                  0                   0
##   1.606109                1                  0                   0
##   1.607953                0                  1                   0
##   1.609801                0                  1                   0
##   1.609938                1                  0                   0
##   1.612248                0                  0                   0
##   1.612741                1                  0                   0
##   1.616882                0                  0                   0
##   1.618512                1                  0                   0
##   1.621733                0                  0                   0
##   1.622055                0                  0                   0
##   1.624981                1                  0                   0
##   1.628637                0                  0                   0
##   1.629432                0                  0                   0
##   1.631912                0                  0                   0
##   1.634134                0                  0                   1
##   1.63581                 0                  0                   0
##   1.637368                0                  0                   1
##   1.63812                 0                  0                   0
##   1.645532                1                  0                   0
##   1.645654                0                  0                   0
##   1.648883                0                  0                   0
##   1.649299                0                  0                   0
##   1.655488                0                  0                   1
##   1.655993                1                  0                   0
##   1.658698                0                  1                   0
##   1.661556                0                  0                   1
##   1.664722                0                  0                   0
##   1.66639                 0                  0                   1
##   1.666965                0                  0                   0
##   1.668961                0                  0                   0
##   1.67036                 0                  0                   0
##   1.672639                1                  0                   0
##   1.676269                1                  0                   0
##   1.679935                0                  0                   0
##   1.680844                0                  0                   0
##   1.682271                0                  1                   0
##   1.68249                 1                  0                   0
##   1.68291                 1                  0                   0
##   1.683497                1                  0                   0
##   1.683957                0                  0                   0
##   1.684582                1                  0                   0
##   1.685369                0                  0                   0
##   1.686229                0                  0                   0
##   1.689525                0                  0                   0
##   1.696294                0                  0                   0
##   1.699056                1                  0                   0
##   1.699181                0                  0                   0
##   1.699592                0                  0                   0
##   1.700889                1                  0                   0
##   1.70464                 1                  0                   0
##   1.708971                1                  0                   0
##   1.71807                 0                  0                   0
##   1.71836                 1                  0                   0
##   1.718543                1                  0                   0
##   1.722053                0                  1                   0
##   1.723934                1                  0                   0
##   1.725931                0                  0                   0
##   1.727114                0                  0                   1
##   1.728332                1                  0                   0
##   1.729987                0                  0                   1
##   1.73209                 0                  0                   0
##   1.73234                 0                  0                   1
##   1.734424                1                  0                   0
##   1.736538                0                  0                   1
##   1.738267                0                  0                   0
##   1.742453                1                  0                   0
##   1.746583                0                  0                   0
##   1.747347                0                  0                   1
##   1.751656                0                  0                   0
##   1.757724                0                  0                   0
##   1.763277                0                  1                   0
##   1.771754                0                  0                   0
##   1.773304                1                  0                   0
##   1.779646                0                  1                   0
##   1.781589                0                  0                   0
##   1.783138                1                  0                   0
##   1.783858                0                  0                   0
##   1.796779                0                  0                   0
##   1.804157                0                  0                   0
##   1.80674                 0                  0                   1
##   1.809745                0                  1                   0
##   1.813318                0                  0                   0
##   1.814869                0                  0                   0
##   1.815768                0                  1                   0
##   1.818052                0                  0                   0
##   1.82434                 0                  0                   1
##   1.838881                0                  0                   0
##   1.846666                0                  0                   0
##   1.847802                0                  0                   0
##   1.851404                0                  0                   0
##   1.853425                0                  0                   0
##   1.856119                0                  0                   1
##   1.857351                0                  0                   0
##   1.859667                0                  0                   0
##   1.860765                0                  0                   0
##   1.862235                0                  0                   0
##   1.863258                0                  0                   1
##   1.866023                0                  0                   0
##   1.866839                0                  0                   0
##   1.874662                0                  0                   0
##   1.876051                0                  0                   1
##   1.877369                0                  0                   0
##   1.879818                1                  0                   0
##   1.881761                1                  0                   0
##   1.88452                 0                  0                   0
##   1.887012                0                  0                   0
##   1.889937                0                  0                   0
##   1.890907                0                  0                   0
##   1.898889                0                  0                   1
##   1.903182                0                  0                   0
##   1.903338                0                  0                   0
##   1.910432                0                  1                   0
##   1.910577                0                  0                   1
##   1.91108                 0                  1                   0
##   1.911096                0                  0                   0
##   1.912981                0                  1                   0
##   1.916751                0                  0                   1
##   1.917014                1                  0                   0
##   1.917383                0                  0                   0
##   1.922234                0                  1                   0
##   1.92628                 1                  0                   0
##   1.926381                0                  0                   1
##   1.926592                0                  0                   0
##   1.928275                0                  0                   0
##   1.930033                0                  0                   0
##   1.931173                1                  0                   0
##   1.931829                0                  0                   1
##   1.932386                0                  0                   0
##   1.940182                0                  0                   0
##   1.943743                0                  0                   0
##   1.944728                0                  0                   0
##   1.946907                0                  0                   0
##   1.94907                 0                  0                   0
##   1.949667                0                  0                   0
##   1.94984                 0                  0                   0
##   1.950374                1                  0                   0
##   1.951027                0                  0                   0
##   1.952427                0                  0                   0
##   1.955992                0                  1                   0
##   1.956278                1                  0                   0
##   1.958694                0                  0                   0
##   1.963379                1                  0                   0
##   1.96582                 0                  0                   1
##   1.967234                0                  0                   0
##   1.967973                0                  0                   0
##   1.97073                 1                  0                   0
##   1.974656                0                  0                   1
##   1.976341                0                  0                   0
##   1.976427                1                  0                   0
##   1.976582                0                  0                   0
##   1.977918                0                  0                   0
##   1.978631                1                  0                   0
##   1.979355                0                  0                   0
##   1.980401                0                  0                   0
##   1.980738                1                  0                   0
##   1.981154                0                  0                   0
##   1.982379                0                  0                   0
##   1.983265                0                  0                   0
##   1.98448                 0                  0                   1
##   1.985536                0                  0                   0
##   1.986646                1                  0                   0
##   1.987296                0                  0                   0
##   1.989171                1                  0                   0
##   1.989316                0                  0                   0
##   1.990317                1                  0                   0
##   1.991565                0                  0                   0
##   1.992719                0                  0                   0
##   1.993666                0                  1                   0
##   1.99507                 1                  0                   0
##   1.995582                1                  0                   0
##   1.996487                0                  0                   0
##   1.997529                0                  0                   1
##   1.998047                1                  0                   0
##   1.999631                1                  0                   0
##   1.99975                 0                  0                   0
##   1.999773                1                  0                   0
##   1.999836                1                  0                   0
##   1.999886                0                  0                   0
##   1.999897                1                  0                   0
##   2                       1                 22                  10
##   2.000088                0                  0                   0
##   2.000561                0                  0                   0
##   2.000934                0                  0                   0
##   2.00123                 0                  0                   0
##   2.002997                0                  0                   0
##   2.005286                0                  0                   0
##   2.008256                0                  0                   0
##   2.009397                0                  0                   0
##   2.011519                0                  0                   0
##   2.011646                0                  0                   0
##   2.013377                0                  0                   0
##   2.022315                0                  1                   0
##   2.026668                0                  0                   0
##   2.038653                0                  0                   0
##   2.040816                0                  0                   1
##   2.044165                0                  1                   0
##   2.05252                 0                  0                   0
##   2.052896                0                  0                   0
##   2.060415                0                  1                   0
##   2.063943                0                  1                   0
##   2.075293                0                  0                   0
##   2.077653                0                  0                   0
##   2.079709                0                  0                   1
##   2.08515                 0                  0                   0
##   2.091862                0                  0                   0
##   2.094542                0                  1                   0
##   2.11137                 0                  0                   0
##   2.113151                0                  0                   0
##   2.113992                0                  0                   0
##   2.119682                0                  1                   0
##   2.146778                0                  0                   0
##   2.148738                0                  0                   1
##   2.16079                 0                  1                   0
##   2.164472                0                  0                   1
##   2.165429                0                  0                   0
##   2.172546                0                  1                   0
##   2.177243                0                  0                   1
##   2.20208                 0                  0                   0
##   2.206055                0                  0                   0
##   2.206738                0                  0                   0
##   2.207881                0                  1                   0
##   2.21722                 0                  0                   1
##   2.21939                 0                  0                   0
##   2.230109                0                  0                   0
##   2.230547                0                  0                   0
##   2.232851                0                  0                   0
##   2.236586                0                  0                   0
##   2.2405                  0                  0                   0
##   2.240714                0                  0                   0
##   2.242754                0                  0                   1
##   2.269058                0                  1                   0
##   2.270555                0                  0                   1
##   2.274248                0                  0                   1
##   2.287423                0                  1                   0
##   2.300282                0                  0                   1
##   2.306844                0                  0                   0
##   2.315983                0                  1                   0
##   2.318492                0                  1                   0
##   2.328147                0                  0                   0
##   2.349495                0                  0                   0
##   2.352091                0                  0                   0
##   2.358699                0                  0                   1
##   2.359339                0                  0                   0
##   2.392047                0                  0                   0
##   2.405963                0                  0                   1
##   2.407906                0                  0                   0
##   2.429923                0                  0                   0
##   2.432443                0                  0                   0
##   2.433918                0                  1                   0
##   2.458237                0                  0                   0
##   2.460238                0                  0                   0
##   2.462269                0                  0                   0
##   2.491642                0                  0                   0
##   2.492402                0                  0                   0
##   2.511157                0                  0                   0
##   2.536615                0                  0                   1
##   2.539762                0                  0                   0
##   2.545707                0                  0                   0
##   2.545931                0                  1                   0
##   2.57223                 0                  1                   0
##   2.595128                0                  0                   0
##   2.614909                0                  0                   0
##   2.627515                0                  0                   1
##   2.64102                 0                  0                   0
##   2.641072                0                  1                   0
##   2.667739                0                  0                   1
##   2.669179                0                  0                   0
##   2.685087                0                  1                   0
##   2.690756                0                  0                   1
##   2.697949                0                  0                   0
##   2.698874                0                  0                   0
##   2.707882                0                  1                   0
##   2.70825                 0                  0                   1
##   2.710338                0                  0                   0
##   2.721646                0                  0                   1
##   2.7243                  0                  1                   0
##   2.762711                0                  1                   0
##   2.784471                0                  0                   0
##   2.787319                0                  0                   0
##   2.805801                0                  0                   1
##   2.819661                0                  0                   0
##   2.830911                0                  0                   0
##   2.834373                0                  1                   0
##   2.847761                0                  0                   1
##   2.870127                0                  0                   0
##   2.876696                0                  1                   0
##   2.877473                0                  1                   0
##   2.878414                0                  1                   0
##   2.89118                 0                  0                   0
##   2.891986                0                  0                   0
##   2.892922                0                  1                   1
##   2.931527                0                  1                   0
##   2.936551                0                  0                   1
##   2.939733                0                  0                   1
##   2.971832                0                  1                   0
##   2.998981                0                  0                   0
##   2.999918                0                  0                   0
##   3                       0                 10                   7
# Perform the Chi-square test
chi_sq_test <- chisq.test(table_physical_activity)
## Warning in chisq.test(table_physical_activity): Chi-squared approximation may
## be incorrect
# View the test results
chi_sq_test
## 
##  Pearson's Chi-squared test
## 
## data:  table_physical_activity
## X-squared = 7678.3, df = 7134, p-value = 4.275e-06

Hypotheses 2: Individuals with a family history of obesity are more likely to be obese themselves.

# Create a contingency table for Family History and Obesity Levels
table_family_history_obesity <- table(obesity$family_history_with_overweight, obesity$NObeyesdad)

# Perform Chi-Square test
chi_square_result <- chisq.test(table_family_history_obesity)

# Display the test result
chi_square_result
## 
##  Pearson's Chi-squared test
## 
## data:  table_family_history_obesity
## X-squared = 621.98, df = 6, p-value < 2.2e-16
# Visualization
library(ggplot2)
ggplot(as.data.frame(table_family_history_obesity), aes(x = Var1, y = Freq, fill = Var2)) +
  geom_bar(stat = "identity", position = "dodge") +
  labs(title = "Family History and Obesity Levels", x = "Family History with Overweight", y = "Frequency") +
  scale_fill_brewer(palette = "Set1")

Insights

  • Family History (“yes”) Group: Obesity Type I (green) is the most frequent category, with the highest bar among all categories, indicating that individuals with a family history of being overweight are significantly more likely to fall into this obesity category. Obesity Type II (purple) and Obesity Type III (orange) also show high frequencies, highlighting that severe obesity is more prevalent among individuals with a family history. Overweight Levels I (yellow) and II (brown) show moderate frequency, further emphasizing that individuals with a family history tend to have higher body weights. Normal Weight (blue) is less frequent than all overweight and obesity categories, suggesting that maintaining normal weight is less common in this group.
  • Family History (“no”) Group: The distribution here is notably different from the “yes” group. Normal Weight (blue) is the most frequent category, indicating that individuals without a family history of being overweight are more likely to have a healthy weight. Insufficient Weight (red) also has a noticeable frequency, which contrasts with the “yes” group, where this category is rare. Severe obesity categories like Obesity Type II (purple) and Obesity Type III (orange) are almost negligible, reflecting the reduced prevalence of obesity in this group. Overweight Levels I and II (yellow and brown) are present but at significantly lower frequencies compared to the “yes” group.
  • General Trends: There is a strong association between family history of being overweight and higher levels of obesity. This could indicate a genetic or lifestyle influence. Individuals without a family history of being overweight are more likely to have normal or insufficient weight, suggesting a protective factor against obesity in this group.

Linear regression model

# Build the regression model
model <- lm(BMI_level ~ Age + Height + Weight + FCVC + NCP + CH2O + FAF + TUE +
            family_history_with_overweight + FAVC + CAEC + SMOKE + SCC + CALC + MTRANS,
           data = obesity)
 
# Model summary
summary(model)
## 
## Call:
## lm(formula = BMI_level ~ Age + Height + Weight + FCVC + NCP + 
##     CH2O + FAF + TUE + family_history_with_overweight + FAVC + 
##     CAEC + SMOKE + SCC + CALC + MTRANS, data = obesity)
## 
## Residuals:
##      Min       1Q   Median       3Q      Max 
## -2.19988 -0.26664  0.00545  0.27558  1.65665 
## 
## Coefficients:
##                                     Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        8.7878680  0.4989088  17.614  < 2e-16 ***
## Age                                0.0216445  0.0021093  10.262  < 2e-16 ***
## Height                            -7.1890208  0.1328661 -54.107  < 2e-16 ***
## Weight                             0.0758524  0.0005535 137.029  < 2e-16 ***
## FCVC                              -0.0163026  0.0189735  -0.859 0.390313    
## NCP                                0.0298228  0.0127952   2.331 0.019860 *  
## CH2O                              -0.0036785  0.0165400  -0.222 0.824022    
## FAF                               -0.0795688  0.0123792  -6.428 1.60e-10 ***
## TUE                               -0.0329602  0.0168000  -1.962 0.049905 *  
## family_history_with_overweightyes  0.2766560  0.0298100   9.281  < 2e-16 ***
## FAVCyes                            0.0378651  0.0321660   1.177 0.239259    
## CAECFrequently                    -0.1795771  0.0663742  -2.706 0.006875 ** 
## CAECno                            -0.0263665  0.0878912  -0.300 0.764215    
## CAECSometimes                      0.2135752  0.0615779   3.468 0.000534 ***
## SMOKEyes                          -0.0748620  0.0671943  -1.114 0.265359    
## SCCyes                            -0.0740481  0.0475170  -1.558 0.119302    
## CALCFrequently                     0.0273749  0.4405923   0.062 0.950464    
## CALCno                             0.0285001  0.4379239   0.065 0.948117    
## CALCSometimes                     -0.0850226  0.4381576  -0.194 0.846159    
## MTRANSBike                         0.0630842  0.1660370   0.380 0.704028    
## MTRANSMotorbike                    0.2230207  0.1334289   1.671 0.094781 .  
## MTRANSPublic_Transportation        0.2193844  0.0307639   7.131 1.37e-12 ***
## MTRANSWalking                      0.0692133  0.0656660   1.054 0.291996    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 0.4315 on 2088 degrees of freedom
## Multiple R-squared:  0.9532, Adjusted R-squared:  0.9527 
## F-statistic:  1935 on 22 and 2088 DF,  p-value: < 2.2e-16

Insights

Based on the regression analysis, here are the most important findings in plain language:

  • The strongest predictor of obesity is current weight, which makes intuitive sense and validates the model’s basic accuracy.

  • Physical activity level (FAF) is the second most important factor - people who exercise more tend to have lower obesity levels, even after controlling for other factors.

  • Family history plays a crucial role - people with a family history of overweight/obesity are more likely to have higher obesity levels.

  • Transportation choices matter - people who walk or bike tend to have lower obesity levels compared to those who primarily use cars.

  • Age shows a positive correlation - older individuals in the dataset tend to have slightly higher obesity levels.

Model Diagnostics

# Residual plots
par(mfrow = c(2,2))
plot(model)
## Warning: not plotting observations with leverage one:
##   27

## Key Diagnostic Findings:

  1. Linearity Assumption:
  1. Normality of Residuals:
  1. Homoscedasticity:
  1. Multicollinearity:
  1. Influential Points:

Supporting visualizations- Family History and Gender Impact on Obesity Levels

# Stacked bar chart for family history and gender
ggplot(obesity, aes(x = family_history_with_overweight, fill = Gender)) +
  geom_bar(position = "fill") +
  labs(title = "Obesity Levels by Family History and Gender",
       x = "Family History",
       y = "Proportion",
       fill = "Gender") +
  theme_minimal()

Insights

  • Gender Proportions Are Balanced: The distribution of males and females is similar within both groups: those with (“yes”) and without (“no”) a family history of obesity.

  • No Strong Differences Observed: Family history of obesity does not appear to disproportionately affect one gender over the other.

  • Focus on Proportions: The chart focuses on gender proportions rather than specific obesity levels or severity, limiting deeper insights into how family history affects actual obesity status.

Limitations

  • Self-reported data: Accuracy of data on diet, exercise, and family history may be compromised due to biases.
  • BMI limitations: BMI does not account for muscle mass or fat distribution.
  • Demographic limitations: The dataset may not represent all populations, as it is region-specific (Mexico, Peru, Colombia).

Conclusion

  • Key Findings: Physical activity, family history, and diet significantly influence obesity risk.
  • Actionable Insights: Focus on increasing physical activity and creating educational programs for high-risk groups.
  • Future Research: Include more diverse populations and consider alternative health indicators beyond BMI.

Recommendations

  • Increase Physical Activity: Encourage exercise through public health initiatives.
  • Target Families with Obesity History: Develop programs for high-risk families to educate and prevent obesity.
  • Promote Healthy Eating: Encourage vegetable consumption and reduce sedentary behavior.