Load data frame

library(dplyr)
library(scales)
library(ggplot2)
df   <- read.csv("data/train.csv", stringsAsFactors = F) %>% inner_join(read.csv("data/macro.csv", stringsAsFactors = F))

Dimensions

The data frame has 30,471 rows and 391 columns

Missing Values

Total number of missing values is 504,537 from 11,914,161 which is 4.23%

Missing values (Columns)

cloumns.with.missing.nas <- sapply(df, FUN = function(x){sum(is.na(x))})

missing.na.df <- data.frame(column  = cloumns.with.missing.nas %>% names(), 
                            num_NAs = as.integer(cloumns.with.missing.nas),
                            ratio   = as.integer(cloumns.with.missing.nas) / df %>% nrow(),
                            ratio_percent = (as.integer(cloumns.with.missing.nas) / df %>% nrow()) %>% percent()) %>%
                 filter(num_NAs > 0) %>%
                 arrange(-num_NAs)

missing.na.df %>% head()
##                                   column num_NAs     ratio ratio_percent
## 1      provision_retail_space_modern_sqm   29718 0.9752880         97.5%
## 2             provision_retail_space_sqm   24879 0.8164812         81.6%
## 3 load_of_teachers_preschool_per_teacher   16901 0.5546585         55.5%
## 4          theaters_viewers_per_1000_cap   16901 0.5546585         55.5%
## 5             museum_visitis_per_100_cap   16901 0.5546585         55.5%
## 6              students_reg_sports_share   16901 0.5546585         55.5%
if (nrow(missing.na.df) > 0)
{
  h <- ggplot(missing.na.df, aes(x = ratio, color = ratio))
  h <- h + geom_histogram(fill = "DarkGoldenrod", color = "black", binwidth = 0.01)
  h <- h + geom_rug(size = 1.2) + geom_density()
  h <- h + scale_color_gradient("Legend",low = "blue", high = "red")
  h <- h + theme(legend.position = "none",
                     strip.text.x      = element_text(family = "sans", face = "bold"),
                     plot.background   = element_rect(fill = "Gainsboro"),
                     panel.background  = element_rect(fill="White", color = "black"),
                     panel.border      = element_rect(fill=NA, color = "black"),
                     panel.grid.major  = element_blank(),
                     axis.text.y       = element_text(family = "sans", colour = "black", size = 15),
                     axis.text.x       = element_text(family = "sans", face = "bold", colour = "black", size = 15, color = "DarkGreen"),
                     axis.ticks = element_blank())
  h <- h + scale_x_continuous(labels = percent)
  h <- h + scale_y_continuous(labels = comma)
  h <- h + scale_size(range=c(1,3))
  h <- h + xlab("Percent with Missing values") + ylab("Number columns")
  h <- h + ggtitle("Distribution of columns with missing values")
  plot(h)
}

Missing values (Rows)

rows.with.missing.nas <- apply(df, 1, function(x) sum(is.na(x)))

missing.na.rows.df <- data.frame( 
                            num_NAs = rows.with.missing.nas,
                            ratio   = rows.with.missing.nas/ df %>% ncol(),
                            ratio_percent = (rows.with.missing.nas / df %>% ncol()) %>% percent()) %>%
                      filter(num_NAs > 0) %>%
                      arrange(-num_NAs)

missing.na.rows.df %>% head()
##   num_NAs     ratio ratio_percent
## 1      81 0.2071611         20.7%
## 2      81 0.2071611         20.7%
## 3      81 0.2071611         20.7%
## 4      81 0.2071611         20.7%
## 5      81 0.2071611         20.7%
## 6      81 0.2071611         20.7%
if (nrow(missing.na.rows.df) > 0)
{
  h <- ggplot(missing.na.rows.df, aes(x = ratio, color = ratio))
  h <- h + geom_histogram(fill = "DarkGoldenrod", color = "black", binwidth = 0.01)
  h <- h + geom_rug(size = 1.2) + geom_density()
  h <- h + scale_color_gradient("Legend",low = "blue", high = "red")
  h <- h + theme(legend.position = "none",
                     strip.text.x      = element_text(family = "sans", face = "bold"),
                     plot.background   = element_rect(fill = "Gainsboro"),
                     panel.background  = element_rect(fill="White", color = "black"),
                     panel.border      = element_rect(fill=NA, color = "black"),
                     panel.grid.major  = element_blank(),
                     axis.text.y       = element_text(family = "sans", colour = "black", size = 15),
                     axis.text.x       = element_text(family = "sans", face = "bold", colour = "black", size = 15, color = "DarkGreen"),
                     axis.ticks = element_blank())
  h <- h + scale_x_continuous(labels = percent)
  h <- h + scale_y_continuous(labels = comma)
  h <- h + scale_size(range=c(1,3))
  h <- h + xlab("Percent with Missing values") + ylab("Number rows")
  h <- h + ggtitle("Distribution of rows with missing values")
  plot(h)
}

Names

df %>% names()
##   [1] "id"                                        
##   [2] "timestamp"                                 
##   [3] "full_sq"                                   
##   [4] "life_sq"                                   
##   [5] "floor"                                     
##   [6] "max_floor"                                 
##   [7] "material"                                  
##   [8] "build_year"                                
##   [9] "num_room"                                  
##  [10] "kitch_sq"                                  
##  [11] "state"                                     
##  [12] "product_type"                              
##  [13] "sub_area"                                  
##  [14] "area_m"                                    
##  [15] "raion_popul"                               
##  [16] "green_zone_part"                           
##  [17] "indust_part"                               
##  [18] "children_preschool"                        
##  [19] "preschool_quota"                           
##  [20] "preschool_education_centers_raion"         
##  [21] "children_school"                           
##  [22] "school_quota"                              
##  [23] "school_education_centers_raion"            
##  [24] "school_education_centers_top_20_raion"     
##  [25] "hospital_beds_raion"                       
##  [26] "healthcare_centers_raion"                  
##  [27] "university_top_20_raion"                   
##  [28] "sport_objects_raion"                       
##  [29] "additional_education_raion"                
##  [30] "culture_objects_top_25"                    
##  [31] "culture_objects_top_25_raion"              
##  [32] "shopping_centers_raion"                    
##  [33] "office_raion"                              
##  [34] "thermal_power_plant_raion"                 
##  [35] "incineration_raion"                        
##  [36] "oil_chemistry_raion"                       
##  [37] "radiation_raion"                           
##  [38] "railroad_terminal_raion"                   
##  [39] "big_market_raion"                          
##  [40] "nuclear_reactor_raion"                     
##  [41] "detention_facility_raion"                  
##  [42] "full_all"                                  
##  [43] "male_f"                                    
##  [44] "female_f"                                  
##  [45] "young_all"                                 
##  [46] "young_male"                                
##  [47] "young_female"                              
##  [48] "work_all"                                  
##  [49] "work_male"                                 
##  [50] "work_female"                               
##  [51] "ekder_all"                                 
##  [52] "ekder_male"                                
##  [53] "ekder_female"                              
##  [54] "X0_6_all"                                  
##  [55] "X0_6_male"                                 
##  [56] "X0_6_female"                               
##  [57] "X7_14_all"                                 
##  [58] "X7_14_male"                                
##  [59] "X7_14_female"                              
##  [60] "X0_17_all"                                 
##  [61] "X0_17_male"                                
##  [62] "X0_17_female"                              
##  [63] "X16_29_all"                                
##  [64] "X16_29_male"                               
##  [65] "X16_29_female"                             
##  [66] "X0_13_all"                                 
##  [67] "X0_13_male"                                
##  [68] "X0_13_female"                              
##  [69] "raion_build_count_with_material_info"      
##  [70] "build_count_block"                         
##  [71] "build_count_wood"                          
##  [72] "build_count_frame"                         
##  [73] "build_count_brick"                         
##  [74] "build_count_monolith"                      
##  [75] "build_count_panel"                         
##  [76] "build_count_foam"                          
##  [77] "build_count_slag"                          
##  [78] "build_count_mix"                           
##  [79] "raion_build_count_with_builddate_info"     
##  [80] "build_count_before_1920"                   
##  [81] "build_count_1921.1945"                     
##  [82] "build_count_1946.1970"                     
##  [83] "build_count_1971.1995"                     
##  [84] "build_count_after_1995"                    
##  [85] "ID_metro"                                  
##  [86] "metro_min_avto"                            
##  [87] "metro_km_avto"                             
##  [88] "metro_min_walk"                            
##  [89] "metro_km_walk"                             
##  [90] "kindergarten_km"                           
##  [91] "school_km"                                 
##  [92] "park_km"                                   
##  [93] "green_zone_km"                             
##  [94] "industrial_km"                             
##  [95] "water_treatment_km"                        
##  [96] "cemetery_km"                               
##  [97] "incineration_km"                           
##  [98] "railroad_station_walk_km"                  
##  [99] "railroad_station_walk_min"                 
## [100] "ID_railroad_station_walk"                  
## [101] "railroad_station_avto_km"                  
## [102] "railroad_station_avto_min"                 
## [103] "ID_railroad_station_avto"                  
## [104] "public_transport_station_km"               
## [105] "public_transport_station_min_walk"         
## [106] "water_km"                                  
## [107] "water_1line"                               
## [108] "mkad_km"                                   
## [109] "ttk_km"                                    
## [110] "sadovoe_km"                                
## [111] "bulvar_ring_km"                            
## [112] "kremlin_km"                                
## [113] "big_road1_km"                              
## [114] "ID_big_road1"                              
## [115] "big_road1_1line"                           
## [116] "big_road2_km"                              
## [117] "ID_big_road2"                              
## [118] "railroad_km"                               
## [119] "railroad_1line"                            
## [120] "zd_vokzaly_avto_km"                        
## [121] "ID_railroad_terminal"                      
## [122] "bus_terminal_avto_km"                      
## [123] "ID_bus_terminal"                           
## [124] "oil_chemistry_km"                          
## [125] "nuclear_reactor_km"                        
## [126] "radiation_km"                              
## [127] "power_transmission_line_km"                
## [128] "thermal_power_plant_km"                    
## [129] "ts_km"                                     
## [130] "big_market_km"                             
## [131] "market_shop_km"                            
## [132] "fitness_km"                                
## [133] "swim_pool_km"                              
## [134] "ice_rink_km"                               
## [135] "stadium_km"                                
## [136] "basketball_km"                             
## [137] "hospice_morgue_km"                         
## [138] "detention_facility_km"                     
## [139] "public_healthcare_km"                      
## [140] "university_km"                             
## [141] "workplaces_km"                             
## [142] "shopping_centers_km"                       
## [143] "office_km"                                 
## [144] "additional_education_km"                   
## [145] "preschool_km"                              
## [146] "big_church_km"                             
## [147] "church_synagogue_km"                       
## [148] "mosque_km"                                 
## [149] "theater_km"                                
## [150] "museum_km"                                 
## [151] "exhibition_km"                             
## [152] "catering_km"                               
## [153] "ecology"                                   
## [154] "green_part_500"                            
## [155] "prom_part_500"                             
## [156] "office_count_500"                          
## [157] "office_sqm_500"                            
## [158] "trc_count_500"                             
## [159] "trc_sqm_500"                               
## [160] "cafe_count_500"                            
## [161] "cafe_sum_500_min_price_avg"                
## [162] "cafe_sum_500_max_price_avg"                
## [163] "cafe_avg_price_500"                        
## [164] "cafe_count_500_na_price"                   
## [165] "cafe_count_500_price_500"                  
## [166] "cafe_count_500_price_1000"                 
## [167] "cafe_count_500_price_1500"                 
## [168] "cafe_count_500_price_2500"                 
## [169] "cafe_count_500_price_4000"                 
## [170] "cafe_count_500_price_high"                 
## [171] "big_church_count_500"                      
## [172] "church_count_500"                          
## [173] "mosque_count_500"                          
## [174] "leisure_count_500"                         
## [175] "sport_count_500"                           
## [176] "market_count_500"                          
## [177] "green_part_1000"                           
## [178] "prom_part_1000"                            
## [179] "office_count_1000"                         
## [180] "office_sqm_1000"                           
## [181] "trc_count_1000"                            
## [182] "trc_sqm_1000"                              
## [183] "cafe_count_1000"                           
## [184] "cafe_sum_1000_min_price_avg"               
## [185] "cafe_sum_1000_max_price_avg"               
## [186] "cafe_avg_price_1000"                       
## [187] "cafe_count_1000_na_price"                  
## [188] "cafe_count_1000_price_500"                 
## [189] "cafe_count_1000_price_1000"                
## [190] "cafe_count_1000_price_1500"                
## [191] "cafe_count_1000_price_2500"                
## [192] "cafe_count_1000_price_4000"                
## [193] "cafe_count_1000_price_high"                
## [194] "big_church_count_1000"                     
## [195] "church_count_1000"                         
## [196] "mosque_count_1000"                         
## [197] "leisure_count_1000"                        
## [198] "sport_count_1000"                          
## [199] "market_count_1000"                         
## [200] "green_part_1500"                           
## [201] "prom_part_1500"                            
## [202] "office_count_1500"                         
## [203] "office_sqm_1500"                           
## [204] "trc_count_1500"                            
## [205] "trc_sqm_1500"                              
## [206] "cafe_count_1500"                           
## [207] "cafe_sum_1500_min_price_avg"               
## [208] "cafe_sum_1500_max_price_avg"               
## [209] "cafe_avg_price_1500"                       
## [210] "cafe_count_1500_na_price"                  
## [211] "cafe_count_1500_price_500"                 
## [212] "cafe_count_1500_price_1000"                
## [213] "cafe_count_1500_price_1500"                
## [214] "cafe_count_1500_price_2500"                
## [215] "cafe_count_1500_price_4000"                
## [216] "cafe_count_1500_price_high"                
## [217] "big_church_count_1500"                     
## [218] "church_count_1500"                         
## [219] "mosque_count_1500"                         
## [220] "leisure_count_1500"                        
## [221] "sport_count_1500"                          
## [222] "market_count_1500"                         
## [223] "green_part_2000"                           
## [224] "prom_part_2000"                            
## [225] "office_count_2000"                         
## [226] "office_sqm_2000"                           
## [227] "trc_count_2000"                            
## [228] "trc_sqm_2000"                              
## [229] "cafe_count_2000"                           
## [230] "cafe_sum_2000_min_price_avg"               
## [231] "cafe_sum_2000_max_price_avg"               
## [232] "cafe_avg_price_2000"                       
## [233] "cafe_count_2000_na_price"                  
## [234] "cafe_count_2000_price_500"                 
## [235] "cafe_count_2000_price_1000"                
## [236] "cafe_count_2000_price_1500"                
## [237] "cafe_count_2000_price_2500"                
## [238] "cafe_count_2000_price_4000"                
## [239] "cafe_count_2000_price_high"                
## [240] "big_church_count_2000"                     
## [241] "church_count_2000"                         
## [242] "mosque_count_2000"                         
## [243] "leisure_count_2000"                        
## [244] "sport_count_2000"                          
## [245] "market_count_2000"                         
## [246] "green_part_3000"                           
## [247] "prom_part_3000"                            
## [248] "office_count_3000"                         
## [249] "office_sqm_3000"                           
## [250] "trc_count_3000"                            
## [251] "trc_sqm_3000"                              
## [252] "cafe_count_3000"                           
## [253] "cafe_sum_3000_min_price_avg"               
## [254] "cafe_sum_3000_max_price_avg"               
## [255] "cafe_avg_price_3000"                       
## [256] "cafe_count_3000_na_price"                  
## [257] "cafe_count_3000_price_500"                 
## [258] "cafe_count_3000_price_1000"                
## [259] "cafe_count_3000_price_1500"                
## [260] "cafe_count_3000_price_2500"                
## [261] "cafe_count_3000_price_4000"                
## [262] "cafe_count_3000_price_high"                
## [263] "big_church_count_3000"                     
## [264] "church_count_3000"                         
## [265] "mosque_count_3000"                         
## [266] "leisure_count_3000"                        
## [267] "sport_count_3000"                          
## [268] "market_count_3000"                         
## [269] "green_part_5000"                           
## [270] "prom_part_5000"                            
## [271] "office_count_5000"                         
## [272] "office_sqm_5000"                           
## [273] "trc_count_5000"                            
## [274] "trc_sqm_5000"                              
## [275] "cafe_count_5000"                           
## [276] "cafe_sum_5000_min_price_avg"               
## [277] "cafe_sum_5000_max_price_avg"               
## [278] "cafe_avg_price_5000"                       
## [279] "cafe_count_5000_na_price"                  
## [280] "cafe_count_5000_price_500"                 
## [281] "cafe_count_5000_price_1000"                
## [282] "cafe_count_5000_price_1500"                
## [283] "cafe_count_5000_price_2500"                
## [284] "cafe_count_5000_price_4000"                
## [285] "cafe_count_5000_price_high"                
## [286] "big_church_count_5000"                     
## [287] "church_count_5000"                         
## [288] "mosque_count_5000"                         
## [289] "leisure_count_5000"                        
## [290] "sport_count_5000"                          
## [291] "market_count_5000"                         
## [292] "price_doc"                                 
## [293] "oil_urals"                                 
## [294] "gdp_quart"                                 
## [295] "gdp_quart_growth"                          
## [296] "cpi"                                       
## [297] "ppi"                                       
## [298] "gdp_deflator"                              
## [299] "balance_trade"                             
## [300] "balance_trade_growth"                      
## [301] "usdrub"                                    
## [302] "eurrub"                                    
## [303] "brent"                                     
## [304] "net_capital_export"                        
## [305] "gdp_annual"                                
## [306] "gdp_annual_growth"                         
## [307] "average_provision_of_build_contract"       
## [308] "average_provision_of_build_contract_moscow"
## [309] "rts"                                       
## [310] "micex"                                     
## [311] "micex_rgbi_tr"                             
## [312] "micex_cbi_tr"                              
## [313] "deposits_value"                            
## [314] "deposits_growth"                           
## [315] "deposits_rate"                             
## [316] "mortgage_value"                            
## [317] "mortgage_growth"                           
## [318] "mortgage_rate"                             
## [319] "grp"                                       
## [320] "grp_growth"                                
## [321] "income_per_cap"                            
## [322] "real_dispos_income_per_cap_growth"         
## [323] "salary"                                    
## [324] "salary_growth"                             
## [325] "fixed_basket"                              
## [326] "retail_trade_turnover"                     
## [327] "retail_trade_turnover_per_cap"             
## [328] "retail_trade_turnover_growth"              
## [329] "labor_force"                               
## [330] "unemployment"                              
## [331] "employment"                                
## [332] "invest_fixed_capital_per_cap"              
## [333] "invest_fixed_assets"                       
## [334] "profitable_enterpr_share"                  
## [335] "unprofitable_enterpr_share"                
## [336] "share_own_revenues"                        
## [337] "overdue_wages_per_cap"                     
## [338] "fin_res_per_cap"                           
## [339] "marriages_per_1000_cap"                    
## [340] "divorce_rate"                              
## [341] "construction_value"                        
## [342] "invest_fixed_assets_phys"                  
## [343] "pop_natural_increase"                      
## [344] "pop_migration"                             
## [345] "pop_total_inc"                             
## [346] "childbirth"                                
## [347] "mortality"                                 
## [348] "housing_fund_sqm"                          
## [349] "lodging_sqm_per_cap"                       
## [350] "water_pipes_share"                         
## [351] "baths_share"                               
## [352] "sewerage_share"                            
## [353] "gas_share"                                 
## [354] "hot_water_share"                           
## [355] "electric_stove_share"                      
## [356] "heating_share"                             
## [357] "old_house_share"                           
## [358] "average_life_exp"                          
## [359] "infant_mortarity_per_1000_cap"             
## [360] "perinatal_mort_per_1000_cap"               
## [361] "incidence_population"                      
## [362] "rent_price_4.room_bus"                     
## [363] "rent_price_3room_bus"                      
## [364] "rent_price_2room_bus"                      
## [365] "rent_price_1room_bus"                      
## [366] "rent_price_3room_eco"                      
## [367] "rent_price_2room_eco"                      
## [368] "rent_price_1room_eco"                      
## [369] "load_of_teachers_preschool_per_teacher"    
## [370] "child_on_acc_pre_school"                   
## [371] "load_of_teachers_school_per_teacher"       
## [372] "students_state_oneshift"                   
## [373] "modern_education_share"                    
## [374] "old_education_build_share"                 
## [375] "provision_doctors"                         
## [376] "provision_nurse"                           
## [377] "load_on_doctors"                           
## [378] "power_clinics"                             
## [379] "hospital_beds_available_per_cap"           
## [380] "hospital_bed_occupancy_per_year"           
## [381] "provision_retail_space_sqm"                
## [382] "provision_retail_space_modern_sqm"         
## [383] "turnover_catering_per_cap"                 
## [384] "theaters_viewers_per_1000_cap"             
## [385] "seats_theather_rfmin_per_100000_cap"       
## [386] "museum_visitis_per_100_cap"                
## [387] "bandwidth_sports"                          
## [388] "population_reg_sports_share"               
## [389] "students_reg_sports_share"                 
## [390] "apartment_build"                           
## [391] "apartment_fund_sqm"

Tail

df %>% tail()
##          id  timestamp full_sq life_sq floor max_floor material build_year
## 30466 30468 2015-06-30      52      NA    13        17        1         NA
## 30467 30469 2015-06-30      44      27     7         9        1       1975
## 30468 30470 2015-06-30      86      59     3         9        2       1935
## 30469 30471 2015-06-30      45      NA    10        20        1         NA
## 30470 30472 2015-06-30      64      32     5        15        1       2003
## 30471 30473 2015-06-30      43      28     1         9        1       1968
##       num_room kitch_sq state  product_type             sub_area   area_m
## 30466        2        1     1 OwnerOccupier             Tverskoe  7307411
## 30467        2        6     3    Investment             Otradnoe 10053052
## 30468        4       10     3    Investment             Tverskoe  7307411
## 30469        1        1     1 OwnerOccupier Poselenie Vnukovskoe 25536297
## 30470        2       11     2    Investment         Obruchevskoe  6050065
## 30471        2        6     2    Investment          Novogireevo  4395333
##       raion_popul green_zone_part  indust_part children_preschool
## 30466       75377      0.06544431 0.0000781528               4237
## 30467      175518      0.09627020 0.3003225180               9753
## 30468       75377      0.06544431 0.0000781528               4237
## 30469        4001      0.49631528 0.0071223170                275
## 30470       78616      0.16752567 0.0934425640               4215
## 30471       94561      0.06375521 0.0386929870               6120
##       preschool_quota preschool_education_centers_raion children_school
## 30466            1874                                 4            6398
## 30467            5088                                 4           10311
## 30468            1874                                 4            6398
## 30469              NA                                 0             264
## 30470            2372                                 6            4635
## 30471            2215                                 4            6533
##       school_quota school_education_centers_raion
## 30466         6772                              4
## 30467        12721                              4
## 30468         6772                              4
## 30469           NA                              0
## 30470         6083                              8
## 30471         5824                              4
##       school_education_centers_top_20_raion hospital_beds_raion
## 30466                                     1                1046
## 30467                                     0                  NA
## 30468                                     1                1046
## 30469                                     0                  NA
## 30470                                     0                3300
## 30471                                     0                1015
##       healthcare_centers_raion university_top_20_raion sport_objects_raion
## 30466                        3                       2                  29
## 30467                        1                       0                  10
## 30468                        3                       2                  29
## 30469                        0                       0                   0
## 30470                        2                       1                  11
## 30471                        2                       0                   7
##       additional_education_raion culture_objects_top_25
## 30466                         16                    yes
## 30467                          3                     no
## 30468                         16                    yes
## 30469                          0                     no
## 30470                          1                     no
## 30471                          1                     no
##       culture_objects_top_25_raion shopping_centers_raion office_raion
## 30466                           10                     23          141
## 30467                            0                      9            6
## 30468                           10                     23          141
## 30469                            0                      1            0
## 30470                            0                      4            5
## 30471                            0                      5            1
##       thermal_power_plant_raion incineration_raion oil_chemistry_raion
## 30466                        no                 no                  no
## 30467                        no                yes                  no
## 30468                        no                 no                  no
## 30469                        no                 no                  no
## 30470                        no                 no                  no
## 30471                        no                 no                  no
##       radiation_raion railroad_terminal_raion big_market_raion
## 30466             yes                     yes               no
## 30467             yes                      no               no
## 30468             yes                     yes               no
## 30469              no                      no               no
## 30470             yes                      no               no
## 30471             yes                      no               no
##       nuclear_reactor_raion detention_facility_raion full_all male_f
## 30466                    no                      yes   116742  52836
## 30467                    no                       no    61396  27916
## 30468                    no                      yes   116742  52836
## 30469                    no                       no    17790   8350
## 30470                    no                       no    83844  36656
## 30471                    no                       no    72131  34296
##       female_f young_all young_male young_female work_all work_male
## 30466    63906     11272       5470         5802    43921     21901
## 30467    33480     21400      11094        10306   112133     59089
## 30468    63906     11272       5470         5802    43921     21901
## 30469     9443       574        297          277     2566      1356
## 30470    47188      9414       4815         4599    51445     25003
## 30471    37835     13523       6724         6799    56908     27219
##       work_female ekder_all ekder_male ekder_female X0_6_all X0_6_male
## 30466       22020     20184       6644        13540     4237      2079
## 30467       53044     41985      12703        29282     9753      5044
## 30468       22020     20184       6644        13540     4237      2079
## 30469        1211       861        244          617      275       143
## 30470       26442     17757       5579        12178     4215      2161
## 30471       29689     24130       7105        17025     6120      3096
##       X0_6_female X7_14_all X7_14_male X7_14_female X0_17_all X0_17_male
## 30466        2158      6398       3094         3304     12508       6065
## 30467        4709     10311       5335         4976     23849      12412
## 30468        2158      6398       3094         3304     12508       6065
## 30469         133       264        136          128       646        336
## 30470        2054      4635       2364         2271     10896       5572
## 30471        3024      6533       3192         3341     14994       7422
##       X0_17_female X16_29_all X16_29_male X16_29_female X0_13_all
## 30466         6443      23480       11491         11989      9955
## 30467        11437      11588        5359          6229     18732
## 30468         6443      23480       11491         11989      9955
## 30469          311       3796        2035          1762       506
## 30470         5324      15835        7398          8437      8301
## 30471         7572      17070        7717          9353     11903
##       X0_13_male X0_13_female raion_build_count_with_material_info
## 30466       4835         5120                                  651
## 30467       9663         9069                                  282
## 30468       4835         5120                                  651
## 30469        261          245                                   NA
## 30470       4219         4082                                  185
## 30471       5928         5975                                  304
##       build_count_block build_count_wood build_count_frame
## 30466                19               27                 4
## 30467                35                0                 0
## 30468                19               27                 4
## 30469                NA               NA                NA
## 30470                38                0                 0
## 30471               108                2                 0
##       build_count_brick build_count_monolith build_count_panel
## 30466               529                   25                41
## 30467                20                    5               222
## 30468               529                   25                41
## 30469                NA                   NA                NA
## 30470                 4                    9               134
## 30471               105                    4                85
##       build_count_foam build_count_slag build_count_mix
## 30466                0                5               1
## 30467                0                0               0
## 30468                0                5               1
## 30469               NA               NA              NA
## 30470                0                0               0
## 30471                0                0               0
##       raion_build_count_with_builddate_info build_count_before_1920
## 30466                                   650                     263
## 30467                                   282                       0
## 30468                                   650                     263
## 30469                                    NA                      NA
## 30470                                   186                       0
## 30471                                   303                       1
##       build_count_1921.1945 build_count_1946.1970 build_count_1971.1995
## 30466                   105                   154                    71
## 30467                     0                    14                   246
## 30468                   105                   154                    71
## 30469                    NA                    NA                    NA
## 30470                     0                    84                    36
## 30471                     2                   220                    66
##       build_count_after_1995 ID_metro metro_min_avto metro_km_avto
## 30466                     57      120       1.482746     1.0365678
## 30467                     22       24       1.384021     0.6590019
## 30468                     57      187       1.060577     0.7812174
## 30469                     NA       21       2.152792     1.7222333
## 30470                     66       65       3.377814     2.0473123
## 30471                     14       49       0.584636     0.4546496
##       metro_min_walk metro_km_walk kindergarten_km school_km   park_km
## 30466      13.459068     1.1215890      1.04896162 0.2697164 0.2842998
## 30467       8.158093     0.6798411      0.13264522 0.3498993 1.9725272
## 30468       9.374609     0.7812174      0.27625601 0.3626805 1.0364520
## 30469      20.666800     1.7222333      0.89788857 1.2342345 4.5665955
## 30470      24.567748     2.0473123      0.20301993 0.1306671 1.7725056
## 30471       5.455795     0.4546496      0.09361918 0.3789499 0.8487662
##       green_zone_km industrial_km water_treatment_km cemetery_km
## 30466     0.1890892     2.6408029           10.37804    4.242627
## 30467     0.1398135     0.7028530           22.74632    1.933090
## 30468     0.2718610     0.4730195           13.86782    1.336968
## 30469     0.4272477     0.3536418           16.78463    2.250137
## 30470     0.2275471     2.3977227           11.39752    3.216746
## 30471     0.5596988     0.4551937           10.45101    1.791075
##       incineration_km railroad_station_walk_km railroad_station_walk_min
## 30466       12.180740                3.3787169                  40.54460
## 30467        1.870053                3.1471611                  37.76593
## 30468        8.928301                0.9022267                  10.82672
## 30469       19.149190                3.7356657                  44.82799
## 30470        9.815678                6.8958617                  82.75034
## 30471        8.334879                2.0377545                  24.45305
##       ID_railroad_station_walk railroad_station_avto_km
## 30466                        5                 4.060430
## 30467                        1                 3.217988
## 30468                       83                 1.726532
## 30469                       24                 3.735666
## 30470                       33                 8.059414
## 30471                       31                 2.037754
##       railroad_station_avto_min ID_railroad_station_avto
## 30466                  5.143798                       32
## 30467                  5.300256                        1
## 30468                  2.242220                       83
## 30469                  4.782323                       24
## 30470                  9.128624                      105
## 30471                  3.604917                       31
##       public_transport_station_km public_transport_station_min_walk
## 30466                  0.32603485                          3.912418
## 30467                  0.09325843                          1.119101
## 30468                  0.09071199                          1.088544
## 30469                  0.63001355                          7.560163
## 30470                  0.26152751                          3.138330
## 30471                  0.25015115                          3.001814
##        water_km water_1line   mkad_km    ttk_km sadovoe_km bulvar_ring_km
## 30466 0.5248394          no 13.917815  4.081283   2.185333      0.5069192
## 30467 0.9792182          no  3.762408  8.361875  10.543724     11.1185771
## 30468 1.0635331          no 13.100989  1.238732   1.203215      1.8748682
## 30469 0.3944222          no  7.123215 17.148737  19.868997     21.0385612
## 30470 0.7385393          no  2.327138  8.940313  11.752036     12.8725353
## 30471 0.5185095          no  1.920884  6.809408   9.675169     10.2286342
##        kremlin_km big_road1_km ID_big_road1 big_road1_1line big_road2_km
## 30466  0.07289655    4.0812826            4              no     4.273395
## 30467 12.59929249    3.0960572            5              no     3.762408
## 30468  3.26928433    1.2387316            4              no     1.245704
## 30469 21.90579236    2.8080767           13              no     3.688405
## 30470 13.62256910    0.9606083           16              no     2.174001
## 30471 11.81261352    1.9208845            1              no     2.089230
##       ID_big_road2 railroad_km railroad_1line zd_vokzaly_avto_km
## 30466           34   2.5660444             no           4.060430
## 30467            1   1.1376027             no          11.396447
## 30468           34   0.3773679             no           1.010437
## 30469           27   1.7272233             no          25.699461
## 30470           51   4.8980472             no          15.303338
## 30471           10   0.7349489             no          12.243439
##       ID_railroad_terminal bus_terminal_avto_km ID_bus_terminal
## 30466                   32             3.983721              13
## 30467                  101            15.454302               4
## 30468                   83             4.173555               5
## 30469                   50            17.366661               8
## 30470                   32             5.458660               8
## 30471                    5             5.645123               3
##       oil_chemistry_km nuclear_reactor_km radiation_km
## 30466         8.750185           6.663317    0.8900007
## 30467        15.994941           4.993393    2.3711484
## 30468        10.988510           7.537125    1.7112710
## 30469        29.968660          17.397666    9.0369422
## 30470        19.591574           8.011139    0.7186794
## 30471         3.261652          14.359141    0.9993654
##       power_transmission_line_km thermal_power_plant_km    ts_km
## 30466                   5.444976               4.308531 3.757130
## 30467                   2.046756               6.668360 1.833401
## 30468                   3.295494               5.408912 3.215552
## 30469                   5.506770              10.102328 3.729416
## 30470                   1.971656               6.417997 3.781523
## 30471                   1.832979               5.239948 1.415294
##       big_market_km market_shop_km fitness_km swim_pool_km ice_rink_km
## 30466      7.836658      1.0928965 0.26971642    1.4210995   0.5018559
## 30467      8.820934      0.8122535 0.06343179    2.1902167   0.7207362
## 30468     12.102735      1.8256425 0.39883095    1.1339049   2.8962801
## 30469     15.546028      6.4337938 1.51955304    2.5216906   2.7158502
## 30470      2.515959      2.7111990 0.41281268    0.6312799   2.6306737
## 30471     14.028112      1.9024314 0.81900120    2.3707894   1.6847642
##       stadium_km basketball_km hospice_morgue_km detention_facility_km
## 30466   4.018205     1.1715061         0.6156576              3.939382
## 30467   6.769773     3.4702805         3.8179879              4.589571
## 30468   2.965732     1.9128733         0.9517540              0.416625
## 30469  13.898607     8.3552851         7.4014232             25.084813
## 30470   2.374106     2.2105005         1.6250639             24.788893
## 30471   3.641656     0.8125113         0.6339015              8.868202
##       public_healthcare_km university_km workplaces_km shopping_centers_km
## 30466            2.6081621      2.180440     1.0915065           0.1073595
## 30467            1.7867634      2.236806     1.4425761           0.3258852
## 30468            1.6630185      0.672662     0.7968508           0.5400028
## 30469            2.0529083     12.893684     9.4790926           1.8065703
## 30470            2.3280961      1.982450     2.3404295           1.1086716
## 30471            0.9648284      2.731394     3.0651006           0.2246014
##        office_km additional_education_km preschool_km big_church_km
## 30466 0.18219427              0.00000000    0.2697164     0.1818966
## 30467 1.10357927              0.16771803    0.3498993     1.2350657
## 30468 0.06998575              0.08655219    0.3626805     0.8503850
## 30469 4.33845327              1.33907848    1.2342345     1.1925432
## 30470 1.20479846              1.34001729    0.1306671     1.6440526
## 30471 2.10826505              0.82581115    0.3789499     0.4805308
##       church_synagogue_km mosque_km theater_km museum_km exhibition_km
## 30466           0.1846815  1.827838  2.3703848 0.6952508      1.184340
## 30467           0.6123595  1.558875  7.4821653 4.8367869      4.877876
## 30468           0.3100206  2.226056  0.7784276 1.4501079      3.543784
## 30469           1.1866213 12.652956 13.4595933 9.8907578      4.555385
## 30470           0.4760209  2.748055  2.0881925 4.1197064      1.800186
## 30471           0.8673318  8.987913  0.6887065 0.1278673      2.477068
##       catering_km      ecology green_part_500 prom_part_500
## 30466  0.10775908    excellent          12.24          0.00
## 30467  0.05537671         good           3.38          0.00
## 30468  0.00747553         poor           5.64          0.80
## 30469  0.06650271      no data           3.33          3.70
## 30470  0.13456589 satisfactory          14.85          0.00
## 30471  0.18283134         poor           0.00          1.26
##       office_count_500 office_sqm_500 trc_count_500 trc_sqm_500
## 30466               10         131844             6      467600
## 30467                0              0             2       41970
## 30468               14         392972             0           0
## 30469                0              0             0           0
## 30470                0              0             0           0
## 30471                0              0             3        6906
##       cafe_count_500 cafe_sum_500_min_price_avg cafe_sum_500_max_price_avg
## 30466             71                     954.84                    1564.52
## 30467              8                     614.29                    1071.43
## 30468             34                     777.42                    1322.58
## 30469              2                    1000.00                    1750.00
## 30470              3                    1000.00                    1500.00
## 30471              4                     400.00                     750.00
##       cafe_avg_price_500 cafe_count_500_na_price cafe_count_500_price_500
## 30466            1259.68                       9                       19
## 30467             842.86                       1                        1
## 30468            1050.00                       3                        7
## 30469            1375.00                       0                        0
## 30470            1250.00                       0                        0
## 30471             575.00                       0                        2
##       cafe_count_500_price_1000 cafe_count_500_price_1500
## 30466                        11                        13
## 30467                         4                         2
## 30468                        11                         6
## 30469                         1                         0
## 30470                         0                         3
## 30471                         2                         0
##       cafe_count_500_price_2500 cafe_count_500_price_4000
## 30466                        14                         4
## 30467                         0                         0
## 30468                         7                         0
## 30469                         1                         0
## 30470                         0                         0
## 30471                         0                         0
##       cafe_count_500_price_high big_church_count_500 church_count_500
## 30466                         1                    8               15
## 30467                         0                    0                0
## 30468                         0                    0                1
## 30469                         0                    0                0
## 30470                         0                    0                1
## 30471                         0                    1                0
##       mosque_count_500 leisure_count_500 sport_count_500 market_count_500
## 30466                0                 0               9                1
## 30467                0                 0               1                0
## 30468                0                 1               1                0
## 30469                0                 0               0                0
## 30470                0                 0               3                0
## 30471                0                 4               0                0
##       green_part_1000 prom_part_1000 office_count_1000 office_sqm_1000
## 30466            7.51           0.00                47          649057
## 30467           10.51           7.72                 0               0
## 30468            1.84          11.58                56         1143488
## 30469           36.66           2.92                 0               0
## 30470           23.65           0.00                 0               0
## 30471            3.46           5.41                 0               0
##       trc_count_1000 trc_sqm_1000 cafe_count_1000
## 30466             20       842476             316
## 30467              3        79970              20
## 30468              5        89090             160
## 30469              0            0               2
## 30470              0            0              13
## 30471              4        25106              11
##       cafe_sum_1000_min_price_avg cafe_sum_1000_max_price_avg
## 30466                      914.53                     1500.00
## 30467                      666.67                     1138.89
## 30468                      699.35                     1183.01
## 30469                     1000.00                     1750.00
## 30470                      753.85                     1269.23
## 30471                      581.82                     1045.45
##       cafe_avg_price_1000 cafe_count_1000_na_price
## 30466             1207.26                       20
## 30467              902.78                        2
## 30468              941.18                        7
## 30469             1375.00                        0
## 30470             1011.54                        0
## 30471              813.64                        0
##       cafe_count_1000_price_500 cafe_count_1000_price_1000
## 30466                        94                         56
## 30467                         5                          7
## 30468                        50                         51
## 30469                         0                          1
## 30470                         1                          6
## 30471                         3                          6
##       cafe_count_1000_price_1500 cafe_count_1000_price_2500
## 30466                         68                         50
## 30467                          4                          2
## 30468                         30                         20
## 30469                          0                          1
## 30470                          5                          1
## 30471                          1                          1
##       cafe_count_1000_price_4000 cafe_count_1000_price_high
## 30466                         27                          1
## 30467                          0                          0
## 30468                          1                          1
## 30469                          0                          0
## 30470                          0                          0
## 30471                          0                          0
##       big_church_count_1000 church_count_1000 mosque_count_1000
## 30466                    16                35                 0
## 30467                     0                 1                 0
## 30468                     2                 8                 0
## 30469                     0                 0                 0
## 30470                     0                 5                 0
## 30471                     2                 1                 0
##       leisure_count_1000 sport_count_1000 market_count_1000
## 30466                 11               16                 1
## 30467                  0                3                 1
## 30468                  1                8                 0
## 30469                  0                0                 0
## 30470                  0               10                 0
## 30471                  4                3                 0
##       green_part_1500 prom_part_1500 office_count_1500 office_sqm_1500
## 30466            5.70           0.00               120         1259653
## 30467            8.81          10.02                 5          217042
## 30468            2.55           8.69               105         1815698
## 30469           43.85           1.55                 0               0
## 30470           32.98           0.00                 1           37800
## 30471           19.95           2.41                 0               0
##       trc_count_1500 trc_sqm_1500 cafe_count_1500
## 30466             25      1075476             643
## 30467              6       109230              28
## 30468              7       121090             292
## 30469              0            0               3
## 30470              1        28800              42
## 30471              5        39106              17
##       cafe_sum_1500_min_price_avg cafe_sum_1500_max_price_avg
## 30466                      899.17                     1476.03
## 30467                      646.15                     1115.38
## 30468                      762.18                     1269.09
## 30469                      833.33                     1500.00
## 30470                      646.34                     1097.56
## 30471                      600.00                     1058.82
##       cafe_avg_price_1500 cafe_count_1500_na_price
## 30466             1187.60                       38
## 30467              880.77                        2
## 30468             1015.64                       17
## 30469             1166.67                        0
## 30470              871.95                        1
## 30471              829.41                        0
##       cafe_count_1500_price_500 cafe_count_1500_price_1000
## 30466                       165                        143
## 30467                         6                         12
## 30468                        87                         77
## 30469                         0                          2
## 30470                        15                         13
## 30471                         4                          9
##       cafe_count_1500_price_1500 cafe_count_1500_price_2500
## 30466                        160                         87
## 30467                          6                          2
## 30468                         65                         38
## 30469                          0                          1
## 30470                          8                          5
## 30471                          3                          1
##       cafe_count_1500_price_4000 cafe_count_1500_price_high
## 30466                         45                          5
## 30467                          0                          0
## 30468                          6                          2
## 30469                          0                          0
## 30470                          0                          0
## 30471                          0                          0
##       big_church_count_1500 church_count_1500 mosque_count_1500
## 30466                    44                66                 0
## 30467                     2                 2                 0
## 30468                     2                13                 0
## 30469                     1                 1                 0
## 30470                     0                 6                 0
## 30471                     2                 1                 0
##       leisure_count_1500 sport_count_1500 market_count_1500
## 30466                 20               25                 2
## 30467                  0               11                 2
## 30468                  6               16                 1
## 30469                  0                0                 0
## 30470                  0               15                 0
## 30471                  4                6                 1
##       green_part_2000 prom_part_2000 office_count_2000 office_sqm_2000
## 30466            6.05           0.00               232         2210580
## 30467            9.93          18.89                 6          224342
## 30468            5.95           7.80               152         2186592
## 30469           38.61           3.12                 0               0
## 30470           32.00           0.00                 2          107800
## 30471           23.49           1.35                 0               0
##       trc_count_2000 trc_sqm_2000 cafe_count_2000
## 30466             34      1240332            1058
## 30467             14       357757              43
## 30468             10       145077             444
## 30469              2        22000               7
## 30470             10       136296              67
## 30471              5        39106              26
##       cafe_sum_2000_min_price_avg cafe_sum_2000_max_price_avg
## 30466                      891.63                     1468.75
## 30467                      635.90                     1102.56
## 30468                      796.39                     1321.69
## 30469                      757.14                     1285.71
## 30470                      704.69                     1195.31
## 30471                      538.46                      942.31
##       cafe_avg_price_2000 cafe_count_2000_na_price
## 30466             1180.19                       66
## 30467              869.23                        4
## 30468             1059.04                       29
## 30469             1021.43                        0
## 30470              950.00                        3
## 30471              740.38                        0
##       cafe_count_2000_price_500 cafe_count_2000_price_1000
## 30466                       255                        257
## 30467                        11                         18
## 30468                       125                        115
## 30469                         1                          3
## 30470                        17                         23
## 30471                        10                         11
##       cafe_count_2000_price_1500 cafe_count_2000_price_2500
## 30466                        257                        150
## 30467                          7                          2
## 30468                        100                         58
## 30469                          2                          1
## 30470                         15                          9
## 30471                          4                          1
##       cafe_count_2000_price_4000 cafe_count_2000_price_high
## 30466                         63                         10
## 30467                          1                          0
## 30468                         13                          4
## 30469                          0                          0
## 30470                          0                          0
## 30471                          0                          0
##       big_church_count_2000 church_count_2000 mosque_count_2000
## 30466                    67               104                 1
## 30467                     2                 5                 1
## 30468                     9                28                 0
## 30469                     1                 2                 0
## 30470                     1                12                 0
## 30471                     2                 3                 0
##       leisure_count_2000 sport_count_2000 market_count_2000
## 30466                 47               42                 2
## 30467                  0               15                 3
## 30468                 17               36                 2
## 30469                  0                3                 0
## 30470                  2               18                 2
## 30471                  5               12                 2
##       green_part_3000 prom_part_3000 office_count_3000 office_sqm_3000
## 30466            6.96           0.99               486         5082992
## 30467           13.14          21.25                17          410183
## 30468            6.52          11.35               299         4208928
## 30469           41.64           2.11                 0               0
## 30470           30.31           1.47                15          473168
## 30471           28.52           3.87                 6          155237
##       trc_count_3000 trc_sqm_3000 cafe_count_3000
## 30466             54      1702619            1815
## 30467             22       745130              79
## 30468             28       845372            1039
## 30469              2        22000               9
## 30470             25       481350             115
## 30471             13       545023              47
##       cafe_sum_3000_min_price_avg cafe_sum_3000_max_price_avg
## 30466                      882.31                     1453.00
## 30467                      647.89                     1112.68
## 30468                      895.84                     1476.65
## 30469                      700.00                     1222.22
## 30470                      681.48                     1152.78
## 30471                      595.65                     1054.35
##       cafe_avg_price_3000 cafe_count_3000_na_price
## 30466             1167.66                      113
## 30467              880.28                        8
## 30468             1186.24                       54
## 30469              961.11                        0
## 30470              917.13                        7
## 30471              825.00                        1
##       cafe_count_3000_price_500 cafe_count_3000_price_1000
## 30466                       449                        432
## 30467                        20                         30
## 30468                       268                        258
## 30469                         1                          5
## 30470                        32                         37
## 30471                        13                         24
##       cafe_count_3000_price_1500 cafe_count_3000_price_2500
## 30466                        446                        255
## 30467                         15                          5
## 30468                        230                        155
## 30469                          2                          1
## 30470                         26                         13
## 30471                          6                          2
##       cafe_count_3000_price_4000 cafe_count_3000_price_high
## 30466                        105                         15
## 30467                          1                          0
## 30468                         57                         17
## 30469                          0                          0
## 30470                          0                          0
## 30471                          1                          0
##       big_church_count_3000 church_count_3000 mosque_count_3000
## 30466                    94               162                 2
## 30467                     5                12                 1
## 30468                    35                62                 1
## 30469                     1                 4                 0
## 30470                     2                17                 1
## 30471                     3                 7                 0
##       leisure_count_3000 sport_count_3000 market_count_3000
## 30466                 85               88                 6
## 30467                  0               29                 3
## 30468                 48               80                 4
## 30469                  0                6                 0
## 30470                  2               33                 4
## 30471                  7               26                 4
##       green_part_5000 prom_part_5000 office_count_5000 office_sqm_5000
## 30466            6.80           5.73               774         9997846
## 30467           15.52          17.24                44          838601
## 30468            8.29          12.85               617         9949843
## 30469           35.62           6.96                 1          117300
## 30470           30.36           9.33                39         1225712
## 30471           25.10          10.16                15          351244
##       trc_count_5000 trc_sqm_5000 cafe_count_5000
## 30466            101      3346565            2625
## 30467             53      2548292             207
## 30468             90      4345915            2197
## 30469              4       201300              20
## 30470             45      1464521             230
## 30471             22       646575              93
##       cafe_sum_5000_min_price_avg cafe_sum_5000_max_price_avg
## 30466                      880.53                     1451.32
## 30467                      689.95                     1156.08
## 30468                      887.43                     1462.88
## 30469                      747.37                     1263.16
## 30470                      703.20                     1182.65
## 30471                      664.44                     1127.78
##       cafe_avg_price_5000 cafe_count_5000_na_price
## 30466             1165.93                      170
## 30467              923.02                       18
## 30468             1175.16                      136
## 30469             1005.26                        1
## 30470              942.92                       11
## 30471              896.11                        3
##       cafe_count_5000_price_500 cafe_count_5000_price_1000
## 30466                       639                        642
## 30467                        63                         59
## 30468                       550                        535
## 30469                         4                          8
## 30470                        60                         77
## 30471                        26                         35
##       cafe_count_5000_price_1500 cafe_count_5000_price_2500
## 30466                        636                        371
## 30467                         47                         15
## 30468                        511                        313
## 30469                          5                          1
## 30470                         58                         22
## 30471                         22                          5
##       cafe_count_5000_price_4000 cafe_count_5000_price_high
## 30466                        141                         26
## 30467                          5                          0
## 30468                        128                         24
## 30469                          1                          0
## 30470                          1                          1
## 30471                          2                          0
##       big_church_count_5000 church_count_5000 mosque_count_5000
## 30466                   150               249                 2
## 30467                    15                26                 1
## 30468                    98               182                 1
## 30469                     2                12                 0
## 30470                     6                31                 1
## 30471                     7                16                 0
##       leisure_count_5000 sport_count_5000 market_count_5000 price_doc
## 30466                105              203                13   6750554
## 30467                  2               84                 6   7400000
## 30468                 82              171                15  25000000
## 30469                  1               11                 1   6970959
## 30470                  4               65                 7  13500000
## 30471                  9               54                10   5600000
##       oil_urals gdp_quart gdp_quart_growth   cpi   ppi gdp_deflator
## 30466   61.4105   18209.7             -2.8 489.5 568.9      123.661
## 30467   61.4105   18209.7             -2.8 489.5 568.9      123.661
## 30468   61.4105   18209.7             -2.8 489.5 568.9      123.661
## 30469   61.4105   18209.7             -2.8 489.5 568.9      123.661
## 30470   61.4105   18209.7             -2.8 489.5 568.9      123.661
## 30471   61.4105   18209.7             -2.8 489.5 568.9      123.661
##       balance_trade balance_trade_growth  usdrub  eurrub brent
## 30466        16.416                 32.9 55.2655 61.6334 63.59
## 30467        16.416                 32.9 55.2655 61.6334 63.59
## 30468        16.416                 32.9 55.2655 61.6334 63.59
## 30469        16.416                 32.9 55.2655 61.6334 63.59
## 30470        16.416                 32.9 55.2655 61.6334 63.59
## 30471        16.416                 32.9 55.2655 61.6334 63.59
##       net_capital_export gdp_annual gdp_annual_growth
## 30466         -0.1782961    77945.1       0.007065151
## 30467         -0.1782961    77945.1       0.007065151
## 30468         -0.1782961    77945.1       0.007065151
## 30469         -0.1782961    77945.1       0.007065151
## 30470         -0.1782961    77945.1       0.007065151
## 30471         -0.1782961    77945.1       0.007065151
##       average_provision_of_build_contract
## 30466                                5.99
## 30467                                5.99
## 30468                                5.99
## 30469                                5.99
## 30470                                5.99
## 30471                                5.99
##       average_provision_of_build_contract_moscow    rts   micex
## 30466                                       7.13 939.93 1654.55
## 30467                                       7.13 939.93 1654.55
## 30468                                       7.13 939.93 1654.55
## 30469                                       7.13 939.93 1654.55
## 30470                                       7.13 939.93 1654.55
## 30471                                       7.13 939.93 1654.55
##       micex_rgbi_tr micex_cbi_tr deposits_value deposits_growth
## 30466        118.48        267.7       19383170       0.0130849
## 30467        118.48        267.7       19383170       0.0130849
## 30468        118.48        267.7       19383170       0.0130849
## 30469        118.48        267.7       19383170       0.0130849
## 30470        118.48        267.7       19383170       0.0130849
## 30471        118.48        267.7       19383170       0.0130849
##       deposits_rate mortgage_value mortgage_growth mortgage_rate grp
## 30466          9.39         371332      -0.4088604         13.46  NA
## 30467          9.39         371332      -0.4088604         13.46  NA
## 30468          9.39         371332      -0.4088604         13.46  NA
## 30469          9.39         371332      -0.4088604         13.46  NA
## 30470          9.39         371332      -0.4088604         13.46  NA
## 30471          9.39         371332      -0.4088604         13.46  NA
##       grp_growth income_per_cap real_dispos_income_per_cap_growth salary
## 30466         NA          60050                                NA  64310
## 30467         NA          60050                                NA  64310
## 30468         NA          60050                                NA  64310
## 30469         NA          60050                                NA  64310
## 30470         NA          60050                                NA  64310
## 30471         NA          60050                                NA  64310
##       salary_growth fixed_basket retail_trade_turnover
## 30466    0.05067965     18720.65              4310.107
## 30467    0.05067965     18720.65              4310.107
## 30468    0.05067965     18720.65              4310.107
## 30469    0.05067965     18720.65              4310.107
## 30470    0.05067965     18720.65              4310.107
## 30471    0.05067965     18720.65              4310.107
##       retail_trade_turnover_per_cap retail_trade_turnover_growth
## 30466                      351.4478                         82.8
## 30467                      351.4478                         82.8
## 30468                      351.4478                         82.8
## 30469                      351.4478                         82.8
## 30470                      351.4478                         82.8
## 30471                      351.4478                         82.8
##       labor_force unemployment employment invest_fixed_capital_per_cap
## 30466     7067.47   0.01770829  0.7335983                       131403
## 30467     7067.47   0.01770829  0.7335983                       131403
## 30468     7067.47   0.01770829  0.7335983                       131403
## 30469     7067.47   0.01770829  0.7335983                       131403
## 30470     7067.47   0.01770829  0.7335983                       131403
## 30471     7067.47   0.01770829  0.7335983                       131403
##       invest_fixed_assets profitable_enterpr_share
## 30466            1611.512                       NA
## 30467            1611.512                       NA
## 30468            1611.512                       NA
## 30469            1611.512                       NA
## 30470            1611.512                       NA
## 30471            1611.512                       NA
##       unprofitable_enterpr_share share_own_revenues overdue_wages_per_cap
## 30466                         NA                 NA                    NA
## 30467                         NA                 NA                    NA
## 30468                         NA                 NA                    NA
## 30469                         NA                 NA                    NA
## 30470                         NA                 NA                    NA
## 30471                         NA                 NA                    NA
##       fin_res_per_cap marriages_per_1000_cap divorce_rate
## 30466              NA                     NA           NA
## 30467              NA                     NA           NA
## 30468              NA                     NA           NA
## 30469              NA                     NA           NA
## 30470              NA                     NA           NA
## 30471              NA                     NA           NA
##       construction_value invest_fixed_assets_phys pop_natural_increase
## 30466                 NA                       NA                 1.66
## 30467                 NA                       NA                 1.66
## 30468                 NA                       NA                 1.66
## 30469                 NA                       NA                 1.66
## 30470                 NA                       NA                 1.66
## 30471                 NA                       NA                 1.66
##       pop_migration pop_total_inc childbirth mortality housing_fund_sqm
## 30466            NA            NA      11.55      9.89               NA
## 30467            NA            NA      11.55      9.89               NA
## 30468            NA            NA      11.55      9.89               NA
## 30469            NA            NA      11.55      9.89               NA
## 30470            NA            NA      11.55      9.89               NA
## 30471            NA            NA      11.55      9.89               NA
##       lodging_sqm_per_cap water_pipes_share baths_share sewerage_share
## 30466                  NA                NA          NA             NA
## 30467                  NA                NA          NA             NA
## 30468                  NA                NA          NA             NA
## 30469                  NA                NA          NA             NA
## 30470                  NA                NA          NA             NA
## 30471                  NA                NA          NA             NA
##       gas_share hot_water_share electric_stove_share heating_share
## 30466        NA              NA                   NA            NA
## 30467        NA              NA                   NA            NA
## 30468        NA              NA                   NA            NA
## 30469        NA              NA                   NA            NA
## 30470        NA              NA                   NA            NA
## 30471        NA              NA                   NA            NA
##       old_house_share average_life_exp infant_mortarity_per_1000_cap
## 30466              NA            76.77                            NA
## 30467              NA            76.77                            NA
## 30468              NA            76.77                            NA
## 30469              NA            76.77                            NA
## 30470              NA            76.77                            NA
## 30471              NA            76.77                            NA
##       perinatal_mort_per_1000_cap incidence_population
## 30466                          NA                   NA
## 30467                          NA                   NA
## 30468                          NA                   NA
## 30469                          NA                   NA
## 30470                          NA                   NA
## 30471                          NA                   NA
##       rent_price_4.room_bus rent_price_3room_bus rent_price_2room_bus
## 30466                167.37               138.14                72.24
## 30467                167.37               138.14                72.24
## 30468                167.37               138.14                72.24
## 30469                167.37               138.14                72.24
## 30470                167.37               138.14                72.24
## 30471                167.37               138.14                72.24
##       rent_price_1room_bus rent_price_3room_eco rent_price_2room_eco
## 30466                50.93                49.01                38.91
## 30467                50.93                49.01                38.91
## 30468                50.93                49.01                38.91
## 30469                50.93                49.01                38.91
## 30470                50.93                49.01                38.91
## 30471                50.93                49.01                38.91
##       rent_price_1room_eco load_of_teachers_preschool_per_teacher
## 30466                30.29                                     NA
## 30467                30.29                                     NA
## 30468                30.29                                     NA
## 30469                30.29                                     NA
## 30470                30.29                                     NA
## 30471                30.29                                     NA
##       child_on_acc_pre_school load_of_teachers_school_per_teacher
## 30466                    <NA>                            1573.651
## 30467                    <NA>                            1573.651
## 30468                    <NA>                            1573.651
## 30469                    <NA>                            1573.651
## 30470                    <NA>                            1573.651
## 30471                    <NA>                            1573.651
##       students_state_oneshift modern_education_share
## 30466                 97.8484                95,4918
## 30467                 97.8484                95,4918
## 30468                 97.8484                95,4918
## 30469                 97.8484                95,4918
## 30470                 97.8484                95,4918
## 30471                 97.8484                95,4918
##       old_education_build_share provision_doctors provision_nurse
## 30466                    8,2517                NA            90.8
## 30467                    8,2517                NA            90.8
## 30468                    8,2517                NA            90.8
## 30469                    8,2517                NA            90.8
## 30470                    8,2517                NA            90.8
## 30471                    8,2517                NA            90.8
##       load_on_doctors power_clinics hospital_beds_available_per_cap
## 30466         6899.93            NA                              NA
## 30467         6899.93            NA                              NA
## 30468         6899.93            NA                              NA
## 30469         6899.93            NA                              NA
## 30470         6899.93            NA                              NA
## 30471         6899.93            NA                              NA
##       hospital_bed_occupancy_per_year provision_retail_space_sqm
## 30466                              NA                         NA
## 30467                              NA                         NA
## 30468                              NA                         NA
## 30469                              NA                         NA
## 30470                              NA                         NA
## 30471                              NA                         NA
##       provision_retail_space_modern_sqm turnover_catering_per_cap
## 30466                                NA                     10805
## 30467                                NA                     10805
## 30468                                NA                     10805
## 30469                                NA                     10805
## 30470                                NA                     10805
## 30471                                NA                     10805
##       theaters_viewers_per_1000_cap seats_theather_rfmin_per_100000_cap
## 30466                            NA                             0.45888
## 30467                            NA                             0.45888
## 30468                            NA                             0.45888
## 30469                            NA                             0.45888
## 30470                            NA                             0.45888
## 30471                            NA                             0.45888
##       museum_visitis_per_100_cap bandwidth_sports
## 30466                         NA           463938
## 30467                         NA           463938
## 30468                         NA           463938
## 30469                         NA           463938
## 30470                         NA           463938
## 30471                         NA           463938
##       population_reg_sports_share students_reg_sports_share
## 30466                          NA                        NA
## 30467                          NA                        NA
## 30468                          NA                        NA
## 30469                          NA                        NA
## 30470                          NA                        NA
## 30471                          NA                        NA
##       apartment_build apartment_fund_sqm
## 30466              NA           234576.9
## 30467              NA           234576.9
## 30468              NA           234576.9
## 30469              NA           234576.9
## 30470              NA           234576.9
## 30471              NA           234576.9

Structure

df %>% str()
## 'data.frame':    30471 obs. of  391 variables:
##  $ id                                        : int  1 2 3 4 5 6 7 8 9 10 ...
##  $ timestamp                                 : chr  "2011-08-20" "2011-08-23" "2011-08-27" "2011-09-01" ...
##  $ full_sq                                   : int  43 34 43 89 77 67 25 44 42 36 ...
##  $ life_sq                                   : int  27 19 29 50 77 46 14 44 27 21 ...
##  $ floor                                     : int  4 3 2 9 4 14 10 5 5 9 ...
##  $ max_floor                                 : int  NA NA NA NA NA NA NA NA NA NA ...
##  $ material                                  : int  NA NA NA NA NA NA NA NA NA NA ...
##  $ build_year                                : int  NA NA NA NA NA NA NA NA NA NA ...
##  $ num_room                                  : int  NA NA NA NA NA NA NA NA NA NA ...
##  $ kitch_sq                                  : int  NA NA NA NA NA NA NA NA NA NA ...
##  $ state                                     : int  NA NA NA NA NA NA NA NA NA NA ...
##  $ product_type                              : chr  "Investment" "Investment" "Investment" "Investment" ...
##  $ sub_area                                  : chr  "Bibirevo" "Nagatinskij Zaton" "Tekstil'shhiki" "Mitino" ...
##  $ area_m                                    : num  6407578 9589337 4808270 12583536 8398461 ...
##  $ raion_popul                               : int  155572 115352 101708 178473 108171 43795 57405 155572 96959 142462 ...
##  $ green_zone_part                           : num  0.1897 0.3726 0.1126 0.1947 0.0152 ...
##  $ indust_part                               : num  0.00007 0.04964 0.11854 0.06975 0.03732 ...
##  $ children_preschool                        : int  9576 6880 5879 13087 5706 2418 2459 9576 6507 9347 ...
##  $ preschool_quota                           : int  5001 3119 1463 6839 3240 852 933 5001 3272 4050 ...
##  $ preschool_education_centers_raion         : int  5 5 4 9 7 2 5 5 4 7 ...
##  $ children_school                           : int  10309 7759 6207 13670 6748 2514 2810 10309 6566 9292 ...
##  $ school_quota                              : int  11065 6237 5580 17063 7770 2012 5050 11065 8751 11234 ...
##  $ school_education_centers_raion            : int  5 8 7 10 9 3 5 5 6 8 ...
##  $ school_education_centers_top_20_raion     : int  0 0 0 0 0 0 0 0 0 0 ...
##  $ hospital_beds_raion                       : int  240 229 1183 NA 562 NA 4849 240 1894 2620 ...
##  $ healthcare_centers_raion                  : int  1 1 1 1 4 0 3 1 4 0 ...
##  $ university_top_20_raion                   : int  0 0 0 0 2 0 0 0 0 0 ...
##  $ sport_objects_raion                       : int  7 6 5 17 25 7 17 7 7 5 ...
##  $ additional_education_raion                : int  3 1 1 6 2 0 6 3 6 2 ...
##  $ culture_objects_top_25                    : chr  "no" "yes" "no" "no" ...
##  $ culture_objects_top_25_raion              : int  0 1 0 0 0 0 0 0 0 0 ...
##  $ shopping_centers_raion                    : int  16 3 0 11 10 6 6 16 0 3 ...
##  $ office_raion                              : int  1 0 1 4 93 19 9 1 7 3 ...
##  $ thermal_power_plant_raion                 : chr  "no" "no" "no" "no" ...
##  $ incineration_raion                        : chr  "no" "no" "no" "no" ...
##  $ oil_chemistry_raion                       : chr  "no" "no" "no" "no" ...
##  $ radiation_raion                           : chr  "no" "no" "yes" "no" ...
##  $ railroad_terminal_raion                   : chr  "no" "no" "no" "no" ...
##  $ big_market_raion                          : chr  "no" "no" "no" "no" ...
##  $ nuclear_reactor_raion                     : chr  "no" "no" "no" "no" ...
##  $ detention_facility_raion                  : chr  "no" "no" "no" "no" ...
##  $ full_all                                  : int  86206 76284 101982 21155 28179 19940 85956 86206 78810 78507 ...
##  $ male_f                                    : int  40477 34200 46076 9828 13522 9400 40724 40477 36091 37052 ...
##  $ female_f                                  : int  45729 42084 55906 11327 14657 10540 45232 45729 42719 41455 ...
##  $ young_all                                 : int  21154 15727 13028 28563 13368 5291 5682 21154 13901 19784 ...
##  $ young_male                                : int  11007 7925 6835 14680 7159 2744 2925 11007 7344 10339 ...
##  $ young_female                              : int  10147 7802 6193 13883 6209 2547 2757 10147 6557 9445 ...
##  $ work_all                                  : int  98207 70194 63388 120381 68043 29660 35003 98207 59120 85551 ...
##  $ work_male                                 : int  52277 35622 31813 60040 34236 15793 17490 52277 29664 43352 ...
##  $ work_female                               : int  45930 34572 31575 60341 33807 13867 17513 45930 29456 42199 ...
##  $ ekder_all                                 : int  36211 29431 25292 29529 26760 8844 16720 36211 23938 37127 ...
##  $ ekder_male                                : int  10580 9266 7609 9083 8563 2608 5351 10580 6980 11024 ...
##  $ ekder_female                              : int  25631 20165 17683 20446 18197 6236 11369 25631 16958 26103 ...
##  $ X0_6_all                                  : int  9576 6880 5879 13087 5706 2418 2459 9576 6507 9347 ...
##  $ X0_6_male                                 : int  4899 3466 3095 6645 2982 1224 1241 4899 3456 4806 ...
##  $ X0_6_female                               : int  4677 3414 2784 6442 2724 1194 1218 4677 3051 4541 ...
##  $ X7_14_all                                 : int  10309 7759 6207 13670 6748 2514 2810 10309 6566 9292 ...
##  $ X7_14_male                                : int  5463 3909 3269 7126 3664 1328 1472 5463 3453 4919 ...
##  $ X7_14_female                              : int  4846 3850 2938 6544 3084 1186 1338 4846 3113 4373 ...
##  $ X0_17_all                                 : int  23603 17700 14884 32063 15237 5866 6510 23603 15510 22071 ...
##  $ X0_17_male                                : int  12286 8998 7821 16513 8113 3035 3345 12286 8201 11484 ...
##  $ X0_17_female                              : int  11317 8702 7063 15550 7124 2831 3165 11317 7309 10587 ...
##  $ X16_29_all                                : int  17508 15164 19401 3292 5164 4851 19445 17508 17662 15929 ...
##  $ X16_29_male                               : int  9425 7571 9045 1450 2583 2329 10085 9425 8488 8541 ...
##  $ X16_29_female                             : int  8083 7593 10356 1842 2581 2522 9360 8083 9174 7388 ...
##  $ X0_13_all                                 : int  18654 13729 11252 24934 11631 4632 4884 18654 12269 17469 ...
##  $ X0_13_male                                : int  9709 6929 5916 12782 6223 2399 2507 9709 6487 9082 ...
##  $ X0_13_female                              : int  8945 6800 5336 12152 5408 2233 2377 8945 5782 8387 ...
##  $ raion_build_count_with_material_info      : int  211 245 330 458 746 188 217 211 390 737 ...
##  $ build_count_block                         : int  25 83 59 9 48 24 23 25 101 68 ...
##  $ build_count_wood                          : int  0 1 0 51 0 0 1 0 2 204 ...
##  $ build_count_frame                         : int  0 0 0 12 0 0 0 0 0 14 ...
##  $ build_count_brick                         : int  0 67 206 124 643 147 139 0 216 237 ...
##  $ build_count_monolith                      : int  2 4 4 50 16 2 12 2 11 21 ...
##  $ build_count_panel                         : int  184 90 60 201 35 15 41 184 60 180 ...
##  $ build_count_foam                          : int  0 0 0 0 0 0 0 0 0 2 ...
##  $ build_count_slag                          : int  0 0 1 9 3 0 0 0 0 10 ...
##  $ build_count_mix                           : int  0 0 0 2 1 0 1 0 0 1 ...
##  $ raion_build_count_with_builddate_info     : int  211 244 330 459 746 188 216 211 390 738 ...
##  $ build_count_before_1920                   : int  0 1 1 13 371 0 11 0 1 47 ...
##  $ build_count_1921.1945                     : int  0 1 0 24 114 5 38 0 9 88 ...
##  $ build_count_1946.1970                     : int  0 143 246 40 146 152 90 0 290 413 ...
##  $ build_count_1971.1995                     : int  206 84 63 130 62 25 58 206 39 94 ...
##  $ build_count_after_1995                    : int  5 15 20 252 53 6 19 5 51 96 ...
##  $ ID_metro                                  : int  1 2 3 4 5 6 7 8 9 10 ...
##  $ metro_min_avto                            : num  2.59 0.937 2.121 1.489 1.257 ...
##  $ metro_km_avto                             : num  1.131 0.647 1.638 0.985 0.877 ...
##  $ metro_min_walk                            : num  13.58 7.62 17.35 11.57 8.27 ...
##  $ metro_km_walk                             : num  1.131 0.635 1.446 0.964 0.689 ...
##  $ kindergarten_km                           : num  0.1457 0.1478 0.0491 0.1794 0.2479 ...
##  $ school_km                                 : num  0.178 0.273 0.158 0.236 0.377 ...
##  $ park_km                                   : num  2.1586 0.5507 0.3748 0.0781 0.2583 ...
##  $ green_zone_km                             : num  0.601 0.0653 0.4532 0.1061 0.2362 ...
##  $ industrial_km                             : num  1.081 0.966 0.939 0.451 0.393 ...
##  $ water_treatment_km                        : num  23.68 1.32 4.91 15.62 10.68 ...
##  $ cemetery_km                               : num  1.8 4.66 3.38 2.02 2.94 ...
##  $ incineration_km                           : num  3.63 8.65 12 14.32 11.9 ...
##  $ railroad_station_walk_km                  : num  5.42 3.412 1.278 4.291 0.854 ...
##  $ railroad_station_walk_min                 : num  65 40.9 15.3 51.5 10.2 ...
##   [list output truncated]

Summary

df %>% summary()
##        id         timestamp            full_sq           life_sq      
##  Min.   :    1   Length:30471       Min.   :   0.00   Min.   :   0.0  
##  1st Qu.: 7620   Class :character   1st Qu.:  38.00   1st Qu.:  20.0  
##  Median :15238   Mode  :character   Median :  49.00   Median :  30.0  
##  Mean   :15238                      Mean   :  54.21   Mean   :  34.4  
##  3rd Qu.:22856                      3rd Qu.:  63.00   3rd Qu.:  43.0  
##  Max.   :30473                      Max.   :5326.00   Max.   :7478.0  
##                                                       NA's   :6383    
##      floor          max_floor         material       build_year      
##  Min.   : 0.000   Min.   :  0.00   Min.   :1.000   Min.   :       0  
##  1st Qu.: 3.000   1st Qu.:  9.00   1st Qu.:1.000   1st Qu.:    1967  
##  Median : 6.500   Median : 12.00   Median :1.000   Median :    1979  
##  Mean   : 7.671   Mean   : 12.56   Mean   :1.827   Mean   :    3068  
##  3rd Qu.:11.000   3rd Qu.: 17.00   3rd Qu.:2.000   3rd Qu.:    2005  
##  Max.   :77.000   Max.   :117.00   Max.   :6.000   Max.   :20052009  
##  NA's   :167      NA's   :9572     NA's   :9572    NA's   :13605     
##     num_room        kitch_sq            state        product_type      
##  Min.   : 0.00   Min.   :   0.000   Min.   : 1.000   Length:30471      
##  1st Qu.: 1.00   1st Qu.:   1.000   1st Qu.: 1.000   Class :character  
##  Median : 2.00   Median :   6.000   Median : 2.000   Mode  :character  
##  Mean   : 1.91   Mean   :   6.399   Mean   : 2.107                     
##  3rd Qu.: 2.00   3rd Qu.:   9.000   3rd Qu.: 3.000                     
##  Max.   :19.00   Max.   :2014.000   Max.   :33.000                     
##  NA's   :9572    NA's   :9572       NA's   :13559                      
##    sub_area             area_m           raion_popul    
##  Length:30471       Min.   :  2081628   Min.   :  2546  
##  Class :character   1st Qu.:  7307411   1st Qu.: 21819  
##  Mode  :character   Median : 10508030   Median : 83502  
##                     Mean   : 17657051   Mean   : 84056  
##                     3rd Qu.: 18036437   3rd Qu.:122862  
##                     Max.   :206071809   Max.   :247469  
##                                                         
##  green_zone_part     indust_part      children_preschool preschool_quota
##  Min.   :0.001879   Min.   :0.00000   Min.   :  175      Min.   :    0  
##  1st Qu.:0.063755   1st Qu.:0.01951   1st Qu.: 1706      1st Qu.: 1874  
##  Median :0.167526   Median :0.07216   Median : 4857      Median : 2854  
##  Mean   :0.218922   Mean   :0.11887   Mean   : 5140      Mean   : 3271  
##  3rd Qu.:0.336177   3rd Qu.:0.19578   3rd Qu.: 7103      3rd Qu.: 4050  
##  Max.   :0.852923   Max.   :0.52187   Max.   :19223      Max.   :11926  
##                                                          NA's   :6688   
##  preschool_education_centers_raion children_school  school_quota  
##  Min.   : 0.000                    Min.   :  168   Min.   : 1012  
##  1st Qu.: 2.000                    1st Qu.: 1564   1st Qu.: 5782  
##  Median : 4.000                    Median : 5261   Median : 7377  
##  Mean   : 4.065                    Mean   : 5354   Mean   : 8325  
##  3rd Qu.: 6.000                    3rd Qu.: 7227   3rd Qu.: 9891  
##  Max.   :13.000                    Max.   :19083   Max.   :24750  
##                                                    NA's   :6685   
##  school_education_centers_raion school_education_centers_top_20_raion
##  Min.   : 0.000                 Min.   :0.0000                       
##  1st Qu.: 2.000                 1st Qu.:0.0000                       
##  Median : 5.000                 Median :0.0000                       
##  Mean   : 4.705                 Mean   :0.1097                       
##  3rd Qu.: 7.000                 3rd Qu.:0.0000                       
##  Max.   :14.000                 Max.   :2.0000                       
##                                                                      
##  hospital_beds_raion healthcare_centers_raion university_top_20_raion
##  Min.   :   0        Min.   :0.000            Min.   :0.0000         
##  1st Qu.: 520        1st Qu.:0.000            1st Qu.:0.0000         
##  Median : 990        Median :1.000            Median :0.0000         
##  Mean   :1191        Mean   :1.321            Mean   :0.1383         
##  3rd Qu.:1786        3rd Qu.:2.000            3rd Qu.:0.0000         
##  Max.   :4849        Max.   :6.000            Max.   :3.0000         
##  NA's   :14441                                                       
##  sport_objects_raion additional_education_raion culture_objects_top_25
##  Min.   : 0.000      Min.   : 0.000             Length:30471          
##  1st Qu.: 1.000      1st Qu.: 1.000             Class :character      
##  Median : 5.000      Median : 2.000             Mode  :character      
##  Mean   : 6.635      Mean   : 2.896                                   
##  3rd Qu.:10.000      3rd Qu.: 4.000                                   
##  Max.   :29.000      Max.   :16.000                                   
##                                                                       
##  culture_objects_top_25_raion shopping_centers_raion  office_raion    
##  Min.   : 0.0000              Min.   : 0.000         Min.   :  0.000  
##  1st Qu.: 0.0000              1st Qu.: 1.000         1st Qu.:  0.000  
##  Median : 0.0000              Median : 3.000         Median :  2.000  
##  Mean   : 0.2867              Mean   : 4.201         Mean   :  8.253  
##  3rd Qu.: 0.0000              3rd Qu.: 6.000         3rd Qu.:  5.000  
##  Max.   :10.0000              Max.   :23.000         Max.   :141.000  
##                                                                       
##  thermal_power_plant_raion incineration_raion oil_chemistry_raion
##  Length:30471              Length:30471       Length:30471       
##  Class :character          Class :character   Class :character   
##  Mode  :character          Mode  :character   Mode  :character   
##                                                                  
##                                                                  
##                                                                  
##                                                                  
##  radiation_raion    railroad_terminal_raion big_market_raion  
##  Length:30471       Length:30471            Length:30471      
##  Class :character   Class :character        Class :character  
##  Mode  :character   Mode  :character        Mode  :character  
##                                                               
##                                                               
##                                                               
##                                                               
##  nuclear_reactor_raion detention_facility_raion    full_all      
##  Length:30471          Length:30471             Min.   :   2546  
##  Class :character      Class :character         1st Qu.:  28179  
##  Mode  :character      Mode  :character         Median :  85219  
##                                                 Mean   : 146306  
##                                                 3rd Qu.: 125111  
##                                                 Max.   :1716730  
##                                                                  
##      male_f          female_f        young_all       young_male   
##  Min.   :  1208   Min.   :  1341   Min.   :  365   Min.   :  189  
##  1st Qu.: 13522   1st Qu.: 15031   1st Qu.: 3459   1st Qu.: 1782  
##  Median : 39261   Median : 45729   Median :10988   Median : 5470  
##  Mean   : 67208   Mean   : 79099   Mean   :11179   Mean   : 5724  
##  3rd Qu.: 58226   3rd Qu.: 67872   3rd Qu.:14906   3rd Qu.: 7597  
##  Max.   :774585   Max.   :942145   Max.   :40692   Max.   :20977  
##                                                                   
##   young_female      work_all        work_male      work_female   
##  Min.   :  177   Min.   :  1633   Min.   :  863   Min.   :  771  
##  1st Qu.: 1677   1st Qu.: 13996   1st Qu.: 7394   1st Qu.: 6661  
##  Median : 5333   Median : 52030   Median :26382   Median :26092  
##  Mean   : 5455   Mean   : 53668   Mean   :27254   Mean   :26414  
##  3rd Qu.: 7617   3rd Qu.: 77612   3rd Qu.:38841   3rd Qu.:37942  
##  Max.   :19715   Max.   :161290   Max.   :79622   Max.   :81668  
##                                                                  
##    ekder_all       ekder_male     ekder_female      X0_6_all    
##  Min.   :  548   Min.   :  156   Min.   :  393   Min.   :  175  
##  1st Qu.: 4695   1st Qu.: 1331   1st Qu.: 3365   1st Qu.: 1706  
##  Median :20036   Median : 6180   Median :13540   Median : 4857  
##  Mean   :19210   Mean   : 5812   Mean   :13398   Mean   : 5140  
##  3rd Qu.:29172   3rd Qu.: 8563   3rd Qu.:20165   3rd Qu.: 7103  
##  Max.   :57086   Max.   :19275   Max.   :37811   Max.   :19223  
##                                                                 
##    X0_6_male     X0_6_female     X7_14_all       X7_14_male  
##  Min.   :  91   Min.   :  85   Min.   :  168   Min.   :  87  
##  1st Qu.: 862   1st Qu.: 844   1st Qu.: 1564   1st Qu.: 821  
##  Median :2435   Median :2390   Median : 5261   Median :2693  
##  Mean   :2631   Mean   :2509   Mean   : 5354   Mean   :2743  
##  3rd Qu.:3523   3rd Qu.:3455   3rd Qu.: 7227   3rd Qu.:3585  
##  Max.   :9987   Max.   :9236   Max.   :19083   Max.   :9761  
##                                                              
##   X7_14_female    X0_17_all       X0_17_male     X0_17_female  
##  Min.   :  82   Min.   :  411   Min.   :  214   Min.   :  198  
##  1st Qu.: 743   1st Qu.: 3831   1st Qu.: 1973   1st Qu.: 1858  
##  Median :2535   Median :12508   Median : 6085   Median : 6185  
##  Mean   :2611   Mean   :12541   Mean   : 6423   Mean   : 6118  
##  3rd Qu.:3534   3rd Qu.:16727   3rd Qu.: 8599   3rd Qu.: 8549  
##  Max.   :9322   Max.   :45170   Max.   :23233   Max.   :21937  
##                                                                
##    X16_29_all      X16_29_male     X16_29_female      X0_13_all    
##  Min.   :   575   Min.   :   308   Min.   :   253   Min.   :  322  
##  1st Qu.:  5829   1st Qu.:  2955   1st Qu.:  2874   1st Qu.: 3112  
##  Median : 17864   Median :  8896   Median :  9353   Median : 9633  
##  Mean   : 31316   Mean   : 15369   Mean   : 15947   Mean   : 9841  
##  3rd Qu.: 27194   3rd Qu.: 13683   3rd Qu.: 14184   3rd Qu.:13121  
##  Max.   :367659   Max.   :172958   Max.   :194701   Max.   :36035  
##                                                                    
##    X0_13_male     X0_13_female   raion_build_count_with_material_info
##  Min.   :  166   Min.   :  156   Min.   :   1.0                      
##  1st Qu.: 1600   1st Qu.: 1512   1st Qu.: 180.0                      
##  Median : 4835   Median : 4667   Median : 273.0                      
##  Mean   : 5037   Mean   : 4804   Mean   : 328.7                      
##  3rd Qu.: 6684   3rd Qu.: 6699   3rd Qu.: 400.0                      
##  Max.   :18574   Max.   :17461   Max.   :1681.0                      
##                                  NA's   :4991                        
##  build_count_block build_count_wood build_count_frame build_count_brick
##  Min.   :  0.0     Min.   :  0.00   Min.   : 0.000    Min.   :  0      
##  1st Qu.: 13.0     1st Qu.:  0.00   1st Qu.: 0.000    1st Qu.: 10      
##  Median : 42.0     Median :  0.00   Median : 0.000    Median : 67      
##  Mean   : 50.3     Mean   : 40.85   Mean   : 4.955    Mean   :108      
##  3rd Qu.: 72.0     3rd Qu.:  7.00   3rd Qu.: 1.000    3rd Qu.:156      
##  Max.   :223.0     Max.   :793.00   Max.   :97.000    Max.   :664      
##  NA's   :4991      NA's   :4991     NA's   :4991      NA's   :4991     
##  build_count_monolith build_count_panel build_count_foam build_count_slag
##  Min.   :  0.00       Min.   :  0.0     Min.   : 0.000   Min.   : 0.000  
##  1st Qu.:  2.00       1st Qu.: 35.0     1st Qu.: 0.000   1st Qu.: 0.000  
##  Median :  6.00       Median : 92.0     Median : 0.000   Median : 0.000  
##  Mean   : 12.04       Mean   :107.2     Mean   : 0.166   Mean   : 4.492  
##  3rd Qu.: 13.00       3rd Qu.:157.0     3rd Qu.: 0.000   3rd Qu.: 2.000  
##  Max.   :127.00       Max.   :431.0     Max.   :11.000   Max.   :84.000  
##  NA's   :4991         NA's   :4991      NA's   :4991     NA's   :4991    
##  build_count_mix raion_build_count_with_builddate_info
##  Min.   :0.000   Min.   :   1.0                       
##  1st Qu.:0.000   1st Qu.: 178.0                       
##  Median :0.000   Median : 271.0                       
##  Mean   :0.573   Mean   : 328.3                       
##  3rd Qu.:0.000   3rd Qu.: 400.0                       
##  Max.   :9.000   Max.   :1680.0                       
##  NA's   :4991    NA's   :4991                         
##  build_count_before_1920 build_count_1921.1945 build_count_1946.1970
##  Min.   :  0.0           Min.   :  0.00        Min.   :  0.0        
##  1st Qu.:  0.0           1st Qu.:  0.00        1st Qu.: 14.0        
##  Median :  0.0           Median :  2.00        Median :135.0        
##  Mean   : 18.9           Mean   : 26.72        Mean   :141.4        
##  3rd Qu.:  3.0           3rd Qu.: 20.00        3rd Qu.:216.0        
##  Max.   :371.0           Max.   :382.00        Max.   :845.0        
##  NA's   :4991            NA's   :4991          NA's   :4991         
##  build_count_1971.1995 build_count_after_1995    ID_metro     
##  Min.   :  0.00        Min.   :  0.00         Min.   :  1.00  
##  1st Qu.: 37.00        1st Qu.: 14.00         1st Qu.: 27.00  
##  Median : 71.00        Median : 24.00         Median : 53.00  
##  Mean   : 80.13        Mean   : 61.15         Mean   : 72.48  
##  3rd Qu.:111.00        3rd Qu.: 57.00         3rd Qu.:108.00  
##  Max.   :246.00        Max.   :799.00         Max.   :223.00  
##  NA's   :4991          NA's   :4991                           
##  metro_min_avto   metro_km_avto    metro_min_walk   metro_km_walk   
##  Min.   : 0.000   Min.   : 0.000   Min.   :  0.00   Min.   : 0.000  
##  1st Qu.: 1.721   1st Qu.: 1.037   1st Qu.: 11.48   1st Qu.: 0.957  
##  Median : 2.803   Median : 1.784   Median : 20.45   Median : 1.704  
##  Mean   : 4.961   Mean   : 3.701   Mean   : 42.74   Mean   : 3.561  
##  3rd Qu.: 4.832   3rd Qu.: 3.777   3rd Qu.: 45.32   3rd Qu.: 3.777  
##  Max.   :61.438   Max.   :74.906   Max.   :711.22   Max.   :59.268  
##                                    NA's   :25       NA's   :25      
##  kindergarten_km      school_km          park_km         green_zone_km   
##  Min.   : 0.00047   Min.   : 0.0000   Min.   : 0.00374   Min.   :0.0000  
##  1st Qu.: 0.19995   1st Qu.: 0.2697   1st Qu.: 0.97330   1st Qu.:0.1010  
##  Median : 0.35376   Median : 0.4749   Median : 1.80389   Median :0.2143  
##  Mean   : 0.98168   Mean   : 1.3240   Mean   : 3.09994   Mean   :0.3005  
##  3rd Qu.: 0.97142   3rd Qu.: 0.8865   3rd Qu.: 3.40479   3rd Qu.:0.4155  
##  Max.   :29.08577   Max.   :47.3947   Max.   :47.35154   Max.   :1.9824  
##                                                                          
##  industrial_km     water_treatment_km  cemetery_km     incineration_km  
##  Min.   : 0.0000   Min.   : 0.2741    Min.   : 0.000   Min.   : 0.1981  
##  1st Qu.: 0.2883   1st Qu.: 5.3046    1st Qu.: 1.335   1st Qu.: 6.2219  
##  Median : 0.5765   Median :10.3780    Median : 1.969   Median :10.3242  
##  Mean   : 0.7688   Mean   :11.1676    Mean   : 2.315   Mean   :10.8846  
##  3rd Qu.: 1.0411   3rd Qu.:16.7914    3rd Qu.: 3.089   3rd Qu.:13.3938  
##  Max.   :14.0482   Max.   :47.5912    Max.   :15.779   Max.   :58.6320  
##                                                                         
##  railroad_station_walk_km railroad_station_walk_min
##  Min.   : 0.02815         Min.   :  0.3378         
##  1st Qu.: 1.93138         1st Qu.: 23.1765         
##  Median : 3.23554         Median : 38.8265         
##  Mean   : 4.38694         Mean   : 52.6433         
##  3rd Qu.: 5.14764         3rd Qu.: 61.7717         
##  Max.   :24.65304         Max.   :295.8365         
##  NA's   :25               NA's   :25               
##  ID_railroad_station_walk railroad_station_avto_km
##  Min.   :  1.00           Min.   : 0.02815        
##  1st Qu.: 18.00           1st Qu.: 2.11686        
##  Median : 33.00           Median : 3.42832        
##  Mean   : 38.86           Mean   : 4.58728        
##  3rd Qu.: 53.00           3rd Qu.: 5.39143        
##  Max.   :133.00           Max.   :24.65398        
##  NA's   :25                                       
##  railroad_station_avto_min ID_railroad_station_avto
##  Min.   : 0.03519          Min.   :  1.00          
##  1st Qu.: 3.23550          1st Qu.: 19.00          
##  Median : 4.94456          Median : 34.00          
##  Mean   : 6.08661          Mean   : 45.71          
##  3rd Qu.: 7.30357          3rd Qu.: 73.00          
##  Max.   :38.69192          Max.   :138.00          
##                                                    
##  public_transport_station_km public_transport_station_min_walk
##  Min.   : 0.002804           Min.   :  0.03365                
##  1st Qu.: 0.101312           1st Qu.:  1.21575                
##  Median : 0.160275           Median :  1.92330                
##  Mean   : 0.414136           Mean   :  4.96963                
##  3rd Qu.: 0.278403           3rd Qu.:  3.34084                
##  Max.   :17.413002           Max.   :208.95602                
##                                                               
##     water_km        water_1line           mkad_km        
##  Min.   :0.006707   Length:30471       Min.   : 0.01363  
##  1st Qu.:0.339637   Class :character   1st Qu.: 2.63340  
##  Median :0.621221   Mode  :character   Median : 5.46751  
##  Mean   :0.690947                      Mean   : 6.27476  
##  3rd Qu.:0.963865                      3rd Qu.: 8.18475  
##  Max.   :2.827709                      Max.   :53.27783  
##                                                          
##      ttk_km           sadovoe_km       bulvar_ring_km    
##  Min.   : 0.00193   Min.   : 0.00036   Min.   : 0.00195  
##  1st Qu.: 5.33984   1st Qu.: 8.34634   1st Qu.: 9.25666  
##  Median : 9.84263   Median :12.74871   Median :13.61148  
##  Mean   :11.31815   Mean   :14.05672   Mean   :15.02334  
##  3rd Qu.:15.67545   3rd Qu.:18.71662   3rd Qu.:19.94519  
##  Max.   :66.03320   Max.   :68.85305   Max.   :69.98487  
##                                                          
##    kremlin_km       big_road1_km       ID_big_road1   big_road1_1line   
##  Min.   : 0.0729   Min.   :0.000364   Min.   : 1.00   Length:30471      
##  1st Qu.:10.4605   1st Qu.:0.779029   1st Qu.: 2.00   Class :character  
##  Median :14.8792   Median :1.724121   Median :10.00   Mode  :character  
##  Mean   :16.0448   Mean   :1.881276   Mean   :11.52                     
##  3rd Qu.:20.6668   3rd Qu.:2.806196   3rd Qu.:14.00                     
##  Max.   :70.7388   Max.   :6.995416   Max.   :48.00                     
##                                                                         
##   big_road2_km        ID_big_road2    railroad_km       
##  Min.   : 0.001935   Min.   : 1.00   Min.   : 0.002299  
##  1st Qu.: 2.103387   1st Qu.: 4.00   1st Qu.: 0.655010  
##  Median : 3.211969   Median :21.00   Median : 1.238357  
##  Mean   : 3.396649   Mean   :22.41   Mean   : 1.889380  
##  3rd Qu.: 4.316292   3rd Qu.:38.00   3rd Qu.: 2.520431  
##  Max.   :13.798346   Max.   :58.00   Max.   :17.387119  
##                                                         
##  railroad_1line     zd_vokzaly_avto_km ID_railroad_terminal
##  Length:30471       Min.   : 0.1367    Min.   :  5.00      
##  Class :character   1st Qu.: 9.9924    1st Qu.: 32.00      
##  Mode  :character   Median :14.7576    Median : 50.00      
##                     Mean   :17.2148    Mean   : 51.67      
##                     3rd Qu.:24.0612    3rd Qu.: 83.00      
##                     Max.   :91.2151    Max.   :121.00      
##                                                            
##  bus_terminal_avto_km ID_bus_terminal  oil_chemistry_km 
##  Min.   : 0.06203     Min.   : 1.000   Min.   : 0.5107  
##  1st Qu.: 5.21375     1st Qu.: 3.000   1st Qu.: 8.7207  
##  Median : 7.45445     Median : 8.000   Median :16.6985  
##  Mean   : 9.99245     Mean   : 6.696   Mean   :17.4016  
##  3rd Qu.:13.28391     3rd Qu.: 9.000   3rd Qu.:23.4245  
##  Max.   :74.79611     Max.   :14.000   Max.   :70.4134  
##                                                         
##  nuclear_reactor_km  radiation_km      power_transmission_line_km
##  Min.   : 0.3098    Min.   : 0.00466   Min.   : 0.03027          
##  1st Qu.: 5.2378    1st Qu.: 1.23185   1st Qu.: 0.97624          
##  Median : 8.9653    Median : 2.43516   Median : 1.89572          
##  Mean   :10.9453    Mean   : 4.41078   Mean   : 3.49223          
##  3rd Qu.:16.3725    3rd Qu.: 4.68705   3rd Qu.: 4.92655          
##  Max.   :64.2570    Max.   :53.89016   Max.   :43.32437          
##                                                                  
##  thermal_power_plant_km     ts_km        big_market_km    
##  Min.   : 0.4006        Min.   : 0.000   Min.   : 0.6614  
##  1st Qu.: 3.7704        1st Qu.: 2.057   1st Qu.: 7.5296  
##  Median : 5.8924        Median : 3.972   Median :11.9104  
##  Mean   : 7.3401        Mean   : 4.931   Mean   :13.2839  
##  3rd Qu.: 9.8187        3rd Qu.: 5.552   3rd Qu.:16.5602  
##  Max.   :56.8561        Max.   :54.081   Max.   :59.5016  
##                                                           
##  market_shop_km       fitness_km       swim_pool_km     ice_rink_km    
##  Min.   : 0.00385   Min.   : 0.0000   Min.   : 0.000   Min.   : 0.000  
##  1st Qu.: 1.54363   1st Qu.: 0.3612   1st Qu.: 1.709   1st Qu.: 3.044  
##  Median : 2.92742   Median : 0.6563   Median : 2.877   Median : 5.547  
##  Mean   : 3.95888   Mean   : 1.1546   Mean   : 4.232   Mean   : 6.124  
##  3rd Qu.: 5.48542   3rd Qu.: 1.3340   3rd Qu.: 5.370   3rd Qu.: 7.957  
##  Max.   :41.10365   Max.   :26.6525   Max.   :53.359   Max.   :46.037  
##                                                                        
##    stadium_km      basketball_km      hospice_morgue_km 
##  Min.   : 0.1148   Min.   : 0.00546   Min.   : 0.00252  
##  1st Qu.: 4.0182   1st Qu.: 1.30823   1st Qu.: 1.11816  
##  Median : 6.9692   Median : 2.87799   Median : 1.89568  
##  Mean   : 9.4367   Mean   : 4.78764   Mean   : 2.64649  
##  3rd Qu.:13.5918   3rd Qu.: 6.36452   3rd Qu.: 3.29732  
##  Max.   :83.3985   Max.   :56.70379   Max.   :43.69464  
##                                                         
##  detention_facility_km public_healthcare_km university_km     
##  Min.   : 0.04123      Min.   : 0.000       Min.   : 0.00031  
##  1st Qu.: 5.66966      1st Qu.: 1.279       1st Qu.: 2.20119  
##  Median :11.31144      Median : 2.342       Median : 4.33758  
##  Mean   :14.55110      Mean   : 3.357       Mean   : 6.85589  
##  3rd Qu.:24.88321      3rd Qu.: 3.984       3rd Qu.: 9.38027  
##  Max.   :89.37137      Max.   :76.055       Max.   :84.86215  
##                                                               
##  workplaces_km    shopping_centers_km   office_km      
##  Min.   : 0.000   Min.   : 0.0000     Min.   : 0.0000  
##  1st Qu.: 1.017   1st Qu.: 0.4838     1st Qu.: 0.5552  
##  Median : 2.032   Median : 0.8396     Median : 1.0530  
##  Mean   : 3.927   Mean   : 1.5058     Mean   : 2.0110  
##  3rd Qu.: 5.416   3rd Qu.: 1.5495     3rd Qu.: 3.0467  
##  Max.   :55.278   Max.   :26.2595     Max.   :18.9589  
##                                                        
##  additional_education_km  preschool_km     big_church_km     
##  Min.   : 0.0000         Min.   : 0.0000   Min.   : 0.00407  
##  1st Qu.: 0.4748         1st Qu.: 0.2851   1st Qu.: 0.86047  
##  Median : 0.8990         Median : 0.4930   Median : 1.49079  
##  Mean   : 1.3285         Mean   : 1.3452   Mean   : 2.33005  
##  3rd Qu.: 1.5711         3rd Qu.: 0.9363   3rd Qu.: 2.92226  
##  Max.   :24.2682         Max.   :47.3947   Max.   :45.66906  
##                                                              
##  church_synagogue_km   mosque_km          theater_km      
##  Min.   : 0.0000     Min.   : 0.00554   Min.   : 0.02679  
##  1st Qu.: 0.5325     1st Qu.: 3.76607   1st Qu.: 4.22525  
##  Median : 0.8600     Median : 6.54356   Median : 8.61201  
##  Mean   : 0.9720     Mean   : 7.73924   Mean   : 9.63807  
##  3rd Qu.: 1.2485     3rd Qu.:10.04705   3rd Qu.:13.45959  
##  Max.   :15.6157     Max.   :44.84983   Max.   :87.60069  
##                                                           
##    museum_km       exhibition_km       catering_km       
##  Min.   : 0.0079   Min.   : 0.00895   Min.   : 0.000357  
##  1st Qu.: 2.8794   1st Qu.: 2.24379   1st Qu.: 0.208621  
##  Median : 5.6435   Median : 4.10665   Median : 0.412701  
##  Mean   : 7.0632   Mean   : 5.55226   Mean   : 0.687988  
##  3rd Qu.:10.3286   3rd Qu.: 6.96870   3rd Qu.: 0.841418  
##  Max.   :59.2032   Max.   :54.43124   Max.   :12.162697  
##                                                          
##    ecology          green_part_500   prom_part_500    office_count_500 
##  Length:30471       Min.   :  0.00   Min.   : 0.000   Min.   : 0.0000  
##  Class :character   1st Qu.:  1.48   1st Qu.: 0.000   1st Qu.: 0.0000  
##  Mode  :character   Median :  8.38   Median : 0.000   Median : 0.0000  
##                     Mean   : 13.38   Mean   : 5.718   Mean   : 0.7409  
##                     3rd Qu.: 19.92   3rd Qu.: 5.760   3rd Qu.: 0.0000  
##                     Max.   :100.00   Max.   :98.770   Max.   :34.0000  
##                                                                        
##  office_sqm_500   trc_count_500     trc_sqm_500      cafe_count_500   
##  Min.   :     0   Min.   :0.0000   Min.   :      0   Min.   :  0.000  
##  1st Qu.:     0   1st Qu.:0.0000   1st Qu.:      0   1st Qu.:  0.000  
##  Median :     0   Median :0.0000   Median :      0   Median :  1.000  
##  Mean   : 13983   Mean   :0.5584   Mean   :  21797   Mean   :  3.872  
##  3rd Qu.:     0   3rd Qu.:1.0000   3rd Qu.:    120   3rd Qu.:  3.000  
##  Max.   :611015   Max.   :8.0000   Max.   :1500000   Max.   :120.000  
##                                                                       
##  cafe_sum_500_min_price_avg cafe_sum_500_max_price_avg cafe_avg_price_500
##  Min.   : 300.0             Min.   : 500               Min.   : 400.0    
##  1st Qu.: 500.0             1st Qu.:1000               1st Qu.: 750.0    
##  Median : 666.7             Median :1167               Median : 916.7    
##  Mean   : 741.3             Mean   :1247               Mean   : 994.2    
##  3rd Qu.: 954.8             3rd Qu.:1500               3rd Qu.:1250.0    
##  Max.   :4000.0             Max.   :6000               Max.   :5000.0    
##  NA's   :13281              NA's   :13281              NA's   :13281     
##  cafe_count_500_na_price cafe_count_500_price_500
##  Min.   : 0.0000         Min.   : 0.0000         
##  1st Qu.: 0.0000         1st Qu.: 0.0000         
##  Median : 0.0000         Median : 0.0000         
##  Mean   : 0.3433         Mean   : 0.9937         
##  3rd Qu.: 0.0000         3rd Qu.: 1.0000         
##  Max.   :13.0000         Max.   :33.0000         
##                                                  
##  cafe_count_500_price_1000 cafe_count_500_price_1500
##  Min.   : 0.0000           Min.   : 0.0000          
##  1st Qu.: 0.0000           1st Qu.: 0.0000          
##  Median : 0.0000           Median : 0.0000          
##  Mean   : 0.9801           Mean   : 0.8438          
##  3rd Qu.: 1.0000           3rd Qu.: 1.0000          
##  Max.   :39.0000           Max.   :29.0000          
##                                                     
##  cafe_count_500_price_2500 cafe_count_500_price_4000
##  Min.   : 0.0000           Min.   : 0.0000          
##  1st Qu.: 0.0000           1st Qu.: 0.0000          
##  Median : 0.0000           Median : 0.0000          
##  Mean   : 0.5429           Mean   : 0.1386          
##  3rd Qu.: 0.0000           3rd Qu.: 0.0000          
##  Max.   :22.0000           Max.   :14.0000          
##                                                     
##  cafe_count_500_price_high big_church_count_500 church_count_500 
##  Min.   :0.00000           Min.   : 0.0000      Min.   : 0.0000  
##  1st Qu.:0.00000           1st Qu.: 0.0000      1st Qu.: 0.0000  
##  Median :0.00000           Median : 0.0000      Median : 0.0000  
##  Mean   :0.02941           Mean   : 0.2864      Mean   : 0.5828  
##  3rd Qu.:0.00000           3rd Qu.: 0.0000      3rd Qu.: 0.0000  
##  Max.   :3.00000           Max.   :11.0000      Max.   :17.0000  
##                                                                  
##  mosque_count_500  leisure_count_500 sport_count_500   market_count_500
##  Min.   :0.00000   Min.   :0.00000   Min.   : 0.0000   Min.   :0.0000  
##  1st Qu.:0.00000   1st Qu.:0.00000   1st Qu.: 0.0000   1st Qu.:0.0000  
##  Median :0.00000   Median :0.00000   Median : 0.0000   Median :0.0000  
##  Mean   :0.00489   Mean   :0.07059   Mean   : 0.9145   Mean   :0.1239  
##  3rd Qu.:0.00000   3rd Qu.:0.00000   3rd Qu.: 1.0000   3rd Qu.:0.0000  
##  Max.   :1.00000   Max.   :9.00000   Max.   :11.0000   Max.   :4.0000  
##                                                                        
##  green_part_1000  prom_part_1000   office_count_1000 office_sqm_1000  
##  Min.   :  0.00   Min.   : 0.000   Min.   : 0.000    Min.   :      0  
##  1st Qu.:  6.31   1st Qu.: 0.000   1st Qu.: 0.000    1st Qu.:      0  
##  Median : 13.04   Median : 4.020   Median : 0.000    Median :      0  
##  Mean   : 16.96   Mean   : 8.783   Mean   : 3.092    Mean   :  62267  
##  3rd Qu.: 24.18   3rd Qu.:12.620   3rd Qu.: 2.000    3rd Qu.:  54500  
##  Max.   :100.00   Max.   :72.200   Max.   :91.000    Max.   :2244723  
##                                                                       
##  trc_count_1000    trc_sqm_1000     cafe_count_1000 
##  Min.   : 0.000   Min.   :      0   Min.   :  0.00  
##  1st Qu.: 0.000   1st Qu.:      0   1st Qu.:  1.00  
##  Median : 1.000   Median :   7800   Median :  4.00  
##  Mean   : 1.978   Mean   :  65881   Mean   : 15.41  
##  3rd Qu.: 3.000   3rd Qu.:  67183   3rd Qu.: 11.00  
##  Max.   :20.000   Max.   :1500000   Max.   :449.00  
##                                                     
##  cafe_sum_1000_min_price_avg cafe_sum_1000_max_price_avg
##  Min.   : 300.0              Min.   : 500               
##  1st Qu.: 543.2              1st Qu.:1000               
##  Median : 669.2              Median :1143               
##  Mean   : 710.9              Mean   :1207               
##  3rd Qu.: 839.3              3rd Qu.:1400               
##  Max.   :2500.0              Max.   :4000               
##  NA's   :6524                NA's   :6524               
##  cafe_avg_price_1000 cafe_count_1000_na_price cafe_count_1000_price_500
##  Min.   : 400.0      Min.   : 0.000           Min.   :  0.000          
##  1st Qu.: 750.0      1st Qu.: 0.000           1st Qu.:  0.000          
##  Median : 912.5      Median : 0.000           Median :  1.000          
##  Mean   : 958.8      Mean   : 1.022           Mean   :  4.145          
##  3rd Qu.:1120.0      3rd Qu.: 1.000           3rd Qu.:  3.000          
##  Max.   :3250.0      Max.   :28.000           Max.   :112.000          
##  NA's   :6524                                                          
##  cafe_count_1000_price_1000 cafe_count_1000_price_1500
##  Min.   :  0.000            Min.   :  0.000           
##  1st Qu.:  0.000            1st Qu.:  0.000           
##  Median :  1.000            Median :  1.000           
##  Mean   :  3.942            Mean   :  3.524           
##  3rd Qu.:  4.000            3rd Qu.:  3.000           
##  Max.   :107.000            Max.   :104.000           
##                                                       
##  cafe_count_1000_price_2500 cafe_count_1000_price_4000
##  Min.   : 0.000             Min.   : 0.0000           
##  1st Qu.: 0.000             1st Qu.: 0.0000           
##  Median : 0.000             Median : 0.0000           
##  Mean   : 1.951             Mean   : 0.7687           
##  3rd Qu.: 1.000             3rd Qu.: 0.0000           
##  Max.   :79.000             Max.   :40.0000           
##                                                       
##  cafe_count_1000_price_high big_church_count_1000 church_count_1000
##  Min.   :0.00000            Min.   : 0.0000       Min.   : 0.000   
##  1st Qu.:0.00000            1st Qu.: 0.0000       1st Qu.: 0.000   
##  Median :0.00000            Median : 0.0000       Median : 1.000   
##  Mean   :0.06016            Mean   : 0.8108       Mean   : 1.822   
##  3rd Qu.:0.00000            3rd Qu.: 1.0000       3rd Qu.: 1.000   
##  Max.   :7.00000            Max.   :27.0000       Max.   :38.000   
##                                                                    
##  mosque_count_1000 leisure_count_1000 sport_count_1000 market_count_1000
##  Min.   :0.00000   Min.   : 0.0000    Min.   : 0.000   Min.   :0.0000   
##  1st Qu.:0.00000   1st Qu.: 0.0000    1st Qu.: 0.000   1st Qu.:0.0000   
##  Median :0.00000   Median : 0.0000    Median : 2.000   Median :0.0000   
##  Mean   :0.01917   Mean   : 0.4693    Mean   : 2.913   Mean   :0.3802   
##  3rd Qu.:0.00000   3rd Qu.: 0.0000    3rd Qu.: 4.000   3rd Qu.:1.0000   
##  Max.   :1.00000   Max.   :30.0000    Max.   :25.000   Max.   :6.0000   
##                                                                         
##  green_part_1500 prom_part_1500  office_count_1500 office_sqm_1500  
##  Min.   : 0.00   Min.   : 0.00   Min.   :  0.000   Min.   :      0  
##  1st Qu.: 8.47   1st Qu.: 1.52   1st Qu.:  0.000   1st Qu.:      0  
##  Median :14.95   Median : 7.82   Median :  1.000   Median :  16650  
##  Mean   :19.20   Mean   :10.60   Mean   :  7.314   Mean   : 140371  
##  3rd Qu.:26.69   3rd Qu.:15.34   3rd Qu.:  4.000   3rd Qu.: 117300  
##  Max.   :90.41   Max.   :63.00   Max.   :173.000   Max.   :2908344  
##                                                                     
##  trc_count_1500    trc_sqm_1500     cafe_count_1500 
##  Min.   : 0.000   Min.   :      0   Min.   :  0.00  
##  1st Qu.: 0.000   1st Qu.:      0   1st Qu.:  2.00  
##  Median : 3.000   Median :  49410   Median : 10.00  
##  Mean   : 3.726   Mean   : 127715   Mean   : 32.46  
##  3rd Qu.: 5.000   3rd Qu.: 154590   3rd Qu.: 23.00  
##  Max.   :27.000   Max.   :1533000   Max.   :784.00  
##                                                     
##  cafe_sum_1500_min_price_avg cafe_sum_1500_max_price_avg
##  Min.   : 300.0              Min.   : 500               
##  1st Qu.: 585.7              1st Qu.:1000               
##  Median : 692.3              Median :1167               
##  Mean   : 714.1              Mean   :1206               
##  3rd Qu.: 821.4              3rd Qu.:1367               
##  Max.   :2500.0              Max.   :4000               
##  NA's   :4199                NA's   :4199               
##  cafe_avg_price_1500 cafe_count_1500_na_price cafe_count_1500_price_500
##  Min.   : 400.0      Min.   : 0.000           Min.   :  0.00           
##  1st Qu.: 795.0      1st Qu.: 0.000           1st Qu.:  0.00           
##  Median : 926.3      Median : 1.000           Median :  2.00           
##  Mean   : 960.0      Mean   : 2.106           Mean   :  8.23           
##  3rd Qu.:1093.8      3rd Qu.: 2.000           3rd Qu.:  6.00           
##  Max.   :3250.0      Max.   :54.000           Max.   :195.00           
##  NA's   :4199                                                          
##  cafe_count_1500_price_1000 cafe_count_1500_price_1500
##  Min.   :  0.000            Min.   :  0.000           
##  1st Qu.:  1.000            1st Qu.:  0.000           
##  Median :  3.000            Median :  2.000           
##  Mean   :  8.765            Mean   :  7.881           
##  3rd Qu.:  8.000            3rd Qu.:  6.000           
##  Max.   :177.000            Max.   :183.000           
##                                                       
##  cafe_count_1500_price_2500 cafe_count_1500_price_4000
##  Min.   :  0.000            Min.   : 0.000            
##  1st Qu.:  0.000            1st Qu.: 0.000            
##  Median :  1.000            Median : 0.000            
##  Mean   :  3.831            Mean   : 1.455            
##  3rd Qu.:  2.000            3rd Qu.: 0.000            
##  Max.   :127.000            Max.   :58.000            
##                                                       
##  cafe_count_1500_price_high big_church_count_1500 church_count_1500
##  Min.   : 0.0000            Min.   : 0.000        Min.   : 0.000   
##  1st Qu.: 0.0000            1st Qu.: 0.000        1st Qu.: 1.000   
##  Median : 0.0000            Median : 1.000        Median : 1.000   
##  Mean   : 0.1937            Mean   : 1.968        Mean   : 3.664   
##  3rd Qu.: 0.0000            3rd Qu.: 1.000        3rd Qu.: 3.000   
##  Max.   :12.0000            Max.   :44.000        Max.   :75.000   
##                                                                    
##  mosque_count_1500 leisure_count_1500 sport_count_1500 market_count_1500
##  Min.   :0.00000   Min.   : 0.0000    Min.   : 0.000   Min.   :0.0000   
##  1st Qu.:0.00000   1st Qu.: 0.0000    1st Qu.: 1.000   1st Qu.:0.0000   
##  Median :0.00000   Median : 0.0000    Median : 5.000   Median :0.0000   
##  Mean   :0.03781   Mean   : 0.9456    Mean   : 5.871   Mean   :0.7667   
##  3rd Qu.:0.00000   3rd Qu.: 1.0000    3rd Qu.: 9.000   3rd Qu.:1.0000   
##  Max.   :1.00000   Max.   :44.0000    Max.   :37.000   Max.   :7.0000   
##                                                                         
##  green_part_2000 prom_part_2000  office_count_2000 office_sqm_2000  
##  Min.   : 0.01   Min.   : 0.00   Min.   :  0.00    Min.   :      0  
##  1st Qu.:10.16   1st Qu.: 3.12   1st Qu.:  0.00    1st Qu.:      0  
##  Median :17.63   Median : 8.80   Median :  2.00    Median :  58411  
##  Mean   :20.84   Mean   :11.22   Mean   : 13.32    Mean   : 246497  
##  3rd Qu.:28.33   3rd Qu.:16.21   3rd Qu.:  7.00    3rd Qu.: 207193  
##  Max.   :75.30   Max.   :56.10   Max.   :250.00    Max.   :3602982  
##                                                                     
##  trc_count_2000    trc_sqm_2000     cafe_count_2000  
##  Min.   : 0.000   Min.   :      0   Min.   :   0.00  
##  1st Qu.: 1.000   1st Qu.:  12065   1st Qu.:   3.00  
##  Median : 5.000   Median : 117300   Median :  18.00  
##  Mean   : 5.968   Mean   : 212759   Mean   :  55.03  
##  3rd Qu.: 9.000   3rd Qu.: 286681   3rd Qu.:  37.00  
##  Max.   :37.000   Max.   :2448300   Max.   :1115.00  
##                                                      
##  cafe_sum_2000_min_price_avg cafe_sum_2000_max_price_avg
##  Min.   : 300.0              Min.   : 500               
##  1st Qu.: 607.7              1st Qu.:1000               
##  Median : 683.3              Median :1156               
##  Mean   : 720.0              Mean   :1211               
##  3rd Qu.: 791.7              3rd Qu.:1322               
##  Max.   :2166.7              Max.   :3500               
##  NA's   :1725                NA's   :1725               
##  cafe_avg_price_2000 cafe_count_2000_na_price cafe_count_2000_price_500
##  Min.   : 400.0      Min.   : 0.00            Min.   :  0.0            
##  1st Qu.: 823.5      1st Qu.: 0.00            1st Qu.:  1.0            
##  Median : 919.2      Median : 1.00            Median :  4.0            
##  Mean   : 965.4      Mean   : 3.59            Mean   : 13.6            
##  3rd Qu.:1057.2      3rd Qu.: 3.00            3rd Qu.: 10.0            
##  Max.   :2833.3      Max.   :70.00            Max.   :278.0            
##  NA's   :1725                                                          
##  cafe_count_2000_price_1000 cafe_count_2000_price_1500
##  Min.   :  0.00             Min.   :  0.00            
##  1st Qu.:  1.00             1st Qu.:  1.00            
##  Median :  6.00             Median :  4.00            
##  Mean   : 15.23             Mean   : 13.27            
##  3rd Qu.: 13.00             3rd Qu.:  9.00            
##  Max.   :262.00             Max.   :261.00            
##                                                       
##  cafe_count_2000_price_2500 cafe_count_2000_price_4000
##  Min.   :  0.000            Min.   : 0.000            
##  1st Qu.:  0.000            1st Qu.: 0.000            
##  Median :  1.000            Median : 0.000            
##  Mean   :  6.651            Mean   : 2.321            
##  3rd Qu.:  3.000            3rd Qu.: 1.000            
##  Max.   :170.000            Max.   :81.000            
##                                                       
##  cafe_count_2000_price_high big_church_count_2000 church_count_2000
##  Min.   : 0.0000            Min.   : 0.00         Min.   :  0.000  
##  1st Qu.: 0.0000            1st Qu.: 0.00         1st Qu.:  2.000  
##  Median : 0.0000            Median : 1.00         Median :  3.000  
##  Mean   : 0.3779            Mean   : 3.25         Mean   :  6.205  
##  3rd Qu.: 0.0000            3rd Qu.: 2.00         3rd Qu.:  5.000  
##  Max.   :16.0000            Max.   :70.00         Max.   :108.000  
##                                                                    
##  mosque_count_2000 leisure_count_2000 sport_count_2000 market_count_2000
##  Min.   :0.00000   Min.   : 0.000     Min.   : 0.000   Min.   :0.00     
##  1st Qu.:0.00000   1st Qu.: 0.000     1st Qu.: 2.000   1st Qu.:0.00     
##  Median :0.00000   Median : 0.000     Median : 9.000   Median :1.00     
##  Mean   :0.08805   Mean   : 1.916     Mean   : 9.846   Mean   :1.17     
##  3rd Qu.:0.00000   3rd Qu.: 1.000     3rd Qu.:14.000   3rd Qu.:2.00     
##  Max.   :1.00000   Max.   :55.000     Max.   :54.000   Max.   :8.00     
##                                                                         
##  green_part_3000 prom_part_3000  office_count_3000 office_sqm_3000  
##  Min.   : 0.31   Min.   : 0.00   Min.   :  0.00    Min.   :      0  
##  1st Qu.:12.15   1st Qu.: 4.24   1st Qu.:  0.00    1st Qu.:      0  
##  Median :20.26   Median : 9.66   Median :  5.00    Median : 130303  
##  Mean   :22.73   Mean   :10.98   Mean   : 29.37    Mean   : 543262  
##  3rd Qu.:30.36   3rd Qu.:15.73   3rd Qu.: 17.00    3rd Qu.: 494706  
##  Max.   :74.02   Max.   :45.10   Max.   :493.00    Max.   :6106112  
##                                                                     
##  trc_count_3000   trc_sqm_3000     cafe_count_3000 
##  Min.   : 0.00   Min.   :      0   Min.   :   0.0  
##  1st Qu.: 2.00   1st Qu.:  41100   1st Qu.:   6.0  
##  Median :11.00   Median : 294350   Median :  41.0  
##  Mean   :11.83   Mean   : 438132   Mean   : 110.9  
##  3rd Qu.:17.00   3rd Qu.: 659453   3rd Qu.:  78.0  
##  Max.   :66.00   Max.   :2654102   Max.   :1815.0  
##                                                    
##  cafe_sum_3000_min_price_avg cafe_sum_3000_max_price_avg
##  Min.   : 300.0              Min.   : 500               
##  1st Qu.: 650.0              1st Qu.:1102               
##  Median : 711.1              Median :1212               
##  Mean   : 765.9              Mean   :1283               
##  3rd Qu.: 815.6              3rd Qu.:1333               
##  Max.   :1833.3              Max.   :3000               
##  NA's   :991                 NA's   :991                
##  cafe_avg_price_3000 cafe_count_3000_na_price cafe_count_3000_price_500
##  Min.   : 400.0      Min.   :  0.000          Min.   :  0.00           
##  1st Qu.: 875.8      1st Qu.:  0.000          1st Qu.:  1.00           
##  Median : 961.1      Median :  3.000          Median :  9.00           
##  Mean   :1024.6      Mean   :  7.275          Mean   : 27.78           
##  3rd Qu.:1083.3      3rd Qu.:  6.000          3rd Qu.: 22.00           
##  Max.   :2416.7      Max.   :119.000          Max.   :449.00           
##  NA's   :991                                                           
##  cafe_count_3000_price_1000 cafe_count_3000_price_1500
##  Min.   :  0.00             Min.   :  0.00            
##  1st Qu.:  2.00             1st Qu.:  2.00            
##  Median : 14.00             Median : 10.00            
##  Mean   : 30.45             Mean   : 26.69            
##  3rd Qu.: 26.00             3rd Qu.: 17.00            
##  Max.   :441.00             Max.   :446.00            
##                                                       
##  cafe_count_3000_price_2500 cafe_count_3000_price_4000
##  Min.   :  0.00             Min.   :  0.000           
##  1st Qu.:  1.00             1st Qu.:  0.000           
##  Median :  3.00             Median :  1.000           
##  Mean   : 13.32             Mean   :  4.647           
##  3rd Qu.:  6.00             3rd Qu.:  2.000           
##  Max.   :266.00             Max.   :113.000           
##                                                       
##  cafe_count_3000_price_high big_church_count_3000 church_count_3000
##  Min.   : 0.0000            Min.   :  0.000       Min.   :  0.00   
##  1st Qu.: 0.0000            1st Qu.:  1.000       1st Qu.:  3.00   
##  Median : 0.0000            Median :  2.000       Median :  6.00   
##  Mean   : 0.7071            Mean   :  6.123       Mean   : 12.29   
##  3rd Qu.: 0.0000            3rd Qu.:  5.000       3rd Qu.: 10.00   
##  Max.   :23.0000            Max.   :102.000       Max.   :164.00   
##                                                                    
##  mosque_count_3000 leisure_count_3000 sport_count_3000 market_count_3000
##  Min.   :0.0000    Min.   : 0.000     Min.   :  0.00   Min.   : 0.00    
##  1st Qu.:0.0000    1st Qu.: 0.000     1st Qu.:  5.00   1st Qu.: 0.00    
##  Median :0.0000    Median : 0.000     Median : 18.00   Median : 2.00    
##  Mean   :0.1991    Mean   : 3.876     Mean   : 20.24   Mean   : 2.32    
##  3rd Qu.:0.0000    3rd Qu.: 2.000     3rd Qu.: 29.00   3rd Qu.: 4.00    
##  Max.   :2.0000    Max.   :85.000     Max.   :100.00   Max.   :10.00    
##                                                                         
##  green_part_5000 prom_part_5000  office_count_5000 office_sqm_5000   
##  Min.   : 3.52   Min.   : 0.21   Min.   :  0.00    Min.   :       0  
##  1st Qu.:14.78   1st Qu.: 6.05   1st Qu.:  2.00    1st Qu.:   85159  
##  Median :19.76   Median : 8.98   Median : 15.00    Median :  432438  
##  Mean   :22.77   Mean   :10.35   Mean   : 71.36    Mean   : 1401057  
##  3rd Qu.:31.41   3rd Qu.:14.00   3rd Qu.: 53.00    3rd Qu.: 1433847  
##  Max.   :75.46   Max.   :28.56   Max.   :789.00    Max.   :12702114  
##                  NA's   :178                                         
##  trc_count_5000    trc_sqm_5000     cafe_count_5000 
##  Min.   :  0.00   Min.   :      0   Min.   :   0.0  
##  1st Qu.:  6.00   1st Qu.: 262000   1st Qu.:  20.0  
##  Median : 31.00   Median :1075495   Median : 108.0  
##  Mean   : 30.13   Mean   :1173871   Mean   : 265.5  
##  3rd Qu.: 43.00   3rd Qu.:1683836   3rd Qu.: 222.0  
##  Max.   :120.00   Max.   :4585477   Max.   :2645.0  
##                                                     
##  cafe_sum_5000_min_price_avg cafe_sum_5000_max_price_avg
##  Min.   : 300.0              Min.   : 500               
##  1st Qu.: 670.9              1st Qu.:1144               
##  Median : 721.7              Median :1212               
##  Mean   : 765.1              Mean   :1278               
##  3rd Qu.: 816.7              3rd Qu.:1346               
##  Max.   :1875.0              Max.   :3000               
##  NA's   :297                 NA's   :297                
##  cafe_avg_price_5000 cafe_count_5000_na_price cafe_count_5000_price_500
##  Min.   : 400.0      Min.   :  0.00           Min.   :  0.0            
##  1st Qu.: 909.4      1st Qu.:  1.00           1st Qu.:  4.0            
##  Median : 966.7      Median :  8.00           Median : 28.0            
##  Mean   :1021.7      Mean   : 17.81           Mean   : 66.2            
##  3rd Qu.:1091.7      3rd Qu.: 15.00           3rd Qu.: 59.0            
##  Max.   :2437.5      Max.   :174.00           Max.   :650.0            
##  NA's   :297                                                           
##  cafe_count_5000_price_1000 cafe_count_5000_price_1500
##  Min.   :  0.00             Min.   :  0.00            
##  1st Qu.:  8.00             1st Qu.:  6.00            
##  Median : 36.00             Median : 24.00            
##  Mean   : 73.44             Mean   : 63.47            
##  3rd Qu.: 69.00             3rd Qu.: 51.00            
##  Max.   :648.00             Max.   :641.00            
##                                                       
##  cafe_count_5000_price_2500 cafe_count_5000_price_4000
##  Min.   :  0.00             Min.   :  0.00            
##  1st Qu.:  2.00             1st Qu.:  1.00            
##  Median :  8.00             Median :  2.00            
##  Mean   : 32.06             Mean   : 10.78            
##  3rd Qu.: 21.00             3rd Qu.:  5.00            
##  Max.   :377.00             Max.   :147.00            
##                                                       
##  cafe_count_5000_price_high big_church_count_5000 church_count_5000
##  Min.   : 0.000             Min.   :  0.00        Min.   :  0.00   
##  1st Qu.: 0.000             1st Qu.:  2.00        1st Qu.:  9.00   
##  Median : 0.000             Median :  7.00        Median : 16.00   
##  Mean   : 1.772             Mean   : 15.05        Mean   : 30.25   
##  3rd Qu.: 1.000             3rd Qu.: 12.00        3rd Qu.: 28.00   
##  Max.   :30.000             Max.   :151.00        Max.   :250.00   
##                                                                    
##  mosque_count_5000 leisure_count_5000 sport_count_5000 market_count_5000
##  Min.   :0.0000    Min.   :  0.000    Min.   :  0.0    Min.   : 0.000   
##  1st Qu.:0.0000    1st Qu.:  0.000    1st Qu.: 11.0    1st Qu.: 1.000   
##  Median :0.0000    Median :  2.000    Median : 48.0    Median : 5.000   
##  Mean   :0.4424    Mean   :  8.649    Mean   : 52.8    Mean   : 5.987   
##  3rd Qu.:1.0000    3rd Qu.:  7.000    3rd Qu.: 76.0    3rd Qu.:10.000   
##  Max.   :2.0000    Max.   :106.000    Max.   :218.0    Max.   :21.000   
##                                                                         
##    price_doc           oil_urals        gdp_quart     gdp_quart_growth
##  Min.   :   100000   Min.   : 46.34   Min.   :14314   Min.   :-2.800  
##  1st Qu.:  4740002   1st Qu.: 93.74   1st Qu.:17015   1st Qu.: 0.700  
##  Median :  6274411   Median :107.20   Median :18411   Median : 0.900  
##  Mean   :  7123035   Mean   : 97.70   Mean   :18217   Mean   : 1.444  
##  3rd Qu.:  8300000   3rd Qu.:108.65   3rd Qu.:19567   3rd Qu.: 2.100  
##  Max.   :111111112   Max.   :122.52   Max.   :21515   Max.   : 5.200  
##                                                                       
##       cpi             ppi         gdp_deflator    balance_trade  
##  Min.   :353.0   Min.   :420.7   Min.   : 86.72   Min.   :12.79  
##  1st Qu.:388.5   1st Qu.:472.2   1st Qu.:108.30   1st Qu.:15.75  
##  Median :408.3   Median :487.9   Median :113.47   Median :16.95  
##  Mean   :411.7   Mean   :492.2   Mean   :110.40   Mean   :17.49  
##  3rd Qu.:428.6   3rd Qu.:510.1   3rd Qu.:113.47   3rd Qu.:19.64  
##  Max.   :489.5   Max.   :575.9   Max.   :123.66   Max.   :21.94  
##                                                                  
##  balance_trade_growth     usdrub          eurrub          brent       
##  Min.   : 4.60        Min.   :28.81   Min.   :38.43   Min.   : 46.59  
##  1st Qu.: 7.60        1st Qu.:31.93   1st Qu.:41.59   1st Qu.: 96.85  
##  Median :16.80        Median :34.38   Median :46.82   Median :107.44  
##  Mean   :22.61        Mean   :38.03   Mean   :48.76   Mean   : 98.83  
##  3rd Qu.:32.90        3rd Qu.:38.59   3rd Qu.:50.22   3rd Qu.:109.97  
##  Max.   :75.80        Max.   :69.47   Max.   :84.96   Max.   :126.22  
##                                                                       
##  net_capital_export   gdp_annual    gdp_annual_growth 
##  Min.   :-0.27712   Min.   :46309   Min.   :0.007065  
##  1st Qu.:-0.16905   1st Qu.:66927   1st Qu.:0.012795  
##  Median : 0.04836   Median :71017   Median :0.012795  
##  Mean   : 0.01810   Mean   :68274   Mean   :0.023583  
##  3rd Qu.: 0.16978   3rd Qu.:71017   3rd Qu.:0.035179  
##  Max.   : 0.61439   Max.   :77945   Max.   :0.045037  
##                                                       
##  average_provision_of_build_contract
##  Min.   :5.750                      
##  1st Qu.:5.980                      
##  Median :6.070                      
##  Mean   :6.117                      
##  3rd Qu.:6.290                      
##  Max.   :6.460                      
##                                     
##  average_provision_of_build_contract_moscow      rts        
##  Min.   :5.960                              Min.   : 629.1  
##  1st Qu.:6.180                              1st Qu.:1119.4  
##  Median :6.390                              Median :1316.0  
##  Mean   :6.416                              Mean   :1264.2  
##  3rd Qu.:6.650                              3rd Qu.:1426.0  
##  Max.   :7.130                              Max.   :1754.8  
##                                                             
##      micex      micex_rgbi_tr     micex_cbi_tr   deposits_value    
##  Min.   :1237   Min.   : 97.86   Min.   :195.3   Min.   :10618898  
##  1st Qu.:1398   1st Qu.:122.95   1st Qu.:231.2   1st Qu.:14738946  
##  Median :1460   Median :128.63   Median :242.4   Median :16689420  
##  Mean   :1464   Mean   :127.29   Mean   :237.9   Mean   :16050965  
##  3rd Qu.:1502   3rd Qu.:133.47   3rd Qu.:246.1   3rd Qu.:17297538  
##  Max.   :1838   Max.   :141.65   Max.   :282.7   Max.   :19383170  
##                                                                    
##  deposits_growth      deposits_rate    mortgage_value    mortgage_growth  
##  Min.   :-0.0203557   Min.   : 4.000   Min.   :  38606   Min.   :-0.4089  
##  1st Qu.: 0.0008146   1st Qu.: 5.190   1st Qu.: 297857   1st Qu.: 0.2950  
##  Median : 0.0075633   Median : 5.540   Median : 628163   Median : 0.3588  
##  Mean   : 0.0100726   Mean   : 6.374   Mean   : 681159   Mean   : 0.3668  
##  3rd Qu.: 0.0224220   3rd Qu.: 6.100   3rd Qu.:1029124   3rd Qu.: 0.5006  
##  Max.   : 0.0732270   Max.   :12.330   Max.   :1753294   Max.   : 1.0519  
##                                                                           
##  mortgage_rate        grp          grp_growth    income_per_cap 
##  Min.   :11.40   Min.   : 9949   Min.   :0.072   Min.   :33194  
##  1st Qu.:12.22   1st Qu.:11815   1st Qu.:0.084   1st Qu.:47334  
##  Median :12.30   Median :12809   Median :0.084   Median :52740  
##  Mean   :12.53   Mean   :12058   Mean   :0.092   Mean   :55778  
##  3rd Qu.:12.62   3rd Qu.:12809   3rd Qu.:0.108   3rd Qu.:58779  
##  Max.   :14.71   Max.   :12809   Max.   :0.188   Max.   :89252  
##                  NA's   :3239    NA's   :3239                   
##  real_dispos_income_per_cap_growth     salary      salary_growth    
##  Min.   :-0.079                    Min.   :44899   Min.   :0.05068  
##  1st Qu.:-0.079                    1st Qu.:55485   1st Qu.:0.08757  
##  Median :-0.079                    Median :61208   Median :0.10314  
##  Mean   :-0.028                    Mean   :57671   Mean   :0.10539  
##  3rd Qu.: 0.054                    3rd Qu.:61208   3rd Qu.:0.13628  
##  Max.   : 0.054                    Max.   :64310   Max.   :0.16892  
##  NA's   :3239                                                       
##   fixed_basket   retail_trade_turnover retail_trade_turnover_per_cap
##  Min.   :12838   Min.   :3322          Min.   :287.0                
##  1st Qu.:14739   1st Qu.:4017          1st Qu.:333.5                
##  Median :15731   Median :4310          Median :351.4                
##  Mean   :15665   Mean   :4159          Mean   :344.0                
##  3rd Qu.:16270   3rd Qu.:4437          3rd Qu.:365.1                
##  Max.   :18745   Max.   :4437          Max.   :365.1                
##                                                                     
##  retail_trade_turnover_growth  labor_force    unemployment    
##  Min.   : 82.8                Min.   :6644   Min.   :0.00800  
##  1st Qu.:101.7                1st Qu.:6879   1st Qu.:0.01500  
##  Median :102.4                Median :7067   Median :0.01500  
##  Mean   :100.6                Mean   :6974   Mean   :0.01468  
##  3rd Qu.:103.5                3rd Qu.:7087   3rd Qu.:0.01700  
##  Max.   :106.6                Max.   :7087   Max.   :0.01771  
##                                                               
##    employment     invest_fixed_capital_per_cap invest_fixed_assets
##  Min.   :0.7080   Min.   : 73976               Min.   : 856.4     
##  1st Qu.:0.7180   1st Qu.:117329               1st Qu.:1413.1     
##  Median :0.7336   Median :126874               Median :1541.9     
##  Mean   :0.7290   Mean   :119658               Mean   :1447.5     
##  3rd Qu.:0.7400   3rd Qu.:126874               3rd Qu.:1541.9     
##  Max.   :0.7400   Max.   :131403               Max.   :1611.5     
##                                                                   
##  profitable_enterpr_share unprofitable_enterpr_share share_own_revenues
##  Min.   :0.646            Min.   :0.292              Min.   :0.891     
##  1st Qu.:0.646            1st Qu.:0.315              1st Qu.:0.970     
##  Median :0.646            Median :0.354              Median :0.978     
##  Mean   :0.669            Mean   :0.331              Mean   :0.967     
##  3rd Qu.:0.685            3rd Qu.:0.354              3rd Qu.:0.978     
##  Max.   :0.708            Max.   :0.354              Max.   :0.978     
##  NA's   :3239             NA's   :3239               NA's   :3239      
##  overdue_wages_per_cap fin_res_per_cap  marriages_per_1000_cap
##  Min.   :47563         Min.   : 96.91   Min.   :7.800         
##  1st Qu.:57746         1st Qu.: 96.91   1st Qu.:8.000         
##  Median :57746         Median : 96.91   Median :8.300         
##  Mean   :63568         Mean   :157.18   Mean   :8.129         
##  3rd Qu.:84183         3rd Qu.:198.00   3rd Qu.:8.300         
##  Max.   :84183         Max.   :249.28   Max.   :8.500         
##  NA's   :3239          NA's   :3239     NA's   :3239          
##   divorce_rate   construction_value invest_fixed_assets_phys
##  Min.   :3.600   Min.   :549076     Min.   :100.1           
##  1st Qu.:3.700   1st Qu.:674277     1st Qu.:100.1           
##  Median :3.700   Median :734698     Median :100.1           
##  Mean   :3.714   Mean   :689658     Mean   :108.2           
##  3rd Qu.:3.800   3rd Qu.:734698     3rd Qu.:107.1           
##  Max.   :3.800   Max.   :734698     Max.   :133.1           
##  NA's   :3239    NA's   :3239       NA's   :3239            
##  pop_natural_increase pop_migration   pop_total_inc      childbirth   
##  Min.   :1.100        Min.   :5.100   Min.   : 6.200   Min.   :10.80  
##  1st Qu.:1.600        1st Qu.:5.700   1st Qu.: 7.300   1st Qu.:11.30  
##  Median :1.600        Median :5.700   Median : 7.300   Median :11.30  
##  Mean   :1.588        Mean   :7.219   Mean   : 8.799   Mean   :11.31  
##  3rd Qu.:1.700        3rd Qu.:9.000   3rd Qu.:10.700   3rd Qu.:11.30  
##  Max.   :1.700        Max.   :9.000   Max.   :10.700   Max.   :11.55  
##                       NA's   :3239    NA's   :3239                    
##    mortality     housing_fund_sqm lodging_sqm_per_cap water_pipes_share
##  Min.   :9.600   Min.   :218.0    Min.   :18.77       Min.   :98.80    
##  1st Qu.:9.600   1st Qu.:233.0    1st Qu.:19.18       1st Qu.:98.80    
##  Median :9.700   Median :234.0    Median :19.18       Median :98.80    
##  Mean   :9.726   Mean   :232.7    Mean   :19.21       Mean   :98.83    
##  3rd Qu.:9.890   3rd Qu.:234.0    3rd Qu.:19.24       3rd Qu.:98.80    
##  Max.   :9.900   Max.   :234.0    Max.   :19.28       Max.   :99.90    
##                  NA's   :3239     NA's   :3239        NA's   :3239     
##   baths_share    sewerage_share    gas_share     hot_water_share
##  Min.   :98.60   Min.   :98.00   Min.   :43.30   Min.   :94.30  
##  1st Qu.:98.60   1st Qu.:98.00   1st Qu.:43.30   1st Qu.:94.30  
##  Median :98.60   Median :98.10   Median :43.30   Median :94.30  
##  Mean   :98.63   Mean   :98.09   Mean   :43.55   Mean   :94.36  
##  3rd Qu.:98.60   3rd Qu.:98.10   3rd Qu.:43.60   3rd Qu.:94.30  
##  Max.   :99.80   Max.   :99.50   Max.   :44.10   Max.   :95.70  
##  NA's   :3239    NA's   :3239    NA's   :3239    NA's   :3239   
##  electric_stove_share heating_share   old_house_share average_life_exp
##  Min.   :54.1         Min.   :99.30   Min.   :0.300   Min.   :75.74   
##  1st Qu.:54.5         1st Qu.:99.30   1st Qu.:0.400   1st Qu.:76.37   
##  Median :55.2         Median :99.30   Median :0.400   Median :76.70   
##  Mean   :54.8         Mean   :99.32   Mean   :0.397   Mean   :76.45   
##  3rd Qu.:55.2         3rd Qu.:99.30   3rd Qu.:0.400   3rd Qu.:76.70   
##  Max.   :55.3         Max.   :99.90   Max.   :0.400   Max.   :76.77   
##  NA's   :3239         NA's   :3239    NA's   :3239                    
##  infant_mortarity_per_1000_cap perinatal_mort_per_1000_cap
##  Min.   :6.100                 Min.   : 5.530             
##  1st Qu.:6.100                 1st Qu.: 7.610             
##  Median :6.100                 Median : 7.610             
##  Mean   :6.898                 Mean   : 8.367             
##  3rd Qu.:7.600                 3rd Qu.: 8.820             
##  Max.   :8.100                 Max.   :10.200             
##  NA's   :3239                  NA's   :3239               
##  incidence_population rent_price_4.room_bus rent_price_3room_bus
##  Min.   :662.3        Min.   :100.1         Min.   : 77.93      
##  1st Qu.:662.3        1st Qu.:149.1         1st Qu.: 89.46      
##  Median :662.3        Median :160.7         Median : 97.07      
##  Mean   :676.6        Mean   :163.3         Mean   : 97.54      
##  3rd Qu.:684.2        3rd Qu.:174.2         3rd Qu.:101.75      
##  Max.   :715.1        Max.   :212.9         Max.   :138.14      
##  NA's   :3239                                                   
##  rent_price_2room_bus rent_price_1room_bus rent_price_3room_eco
##  Min.   :62.18        Min.   :44.49        Min.   :41.80       
##  1st Qu.:70.60        1st Qu.:51.88        1st Qu.:47.35       
##  Median :74.26        Median :56.60        Median :49.24       
##  Mean   :75.39        Mean   :56.62        Mean   :49.04       
##  3rd Qu.:79.09        3rd Qu.:59.94        3rd Qu.:50.36       
##  Max.   :96.00        Max.   :72.02        Max.   :53.21       
##                                                                
##  rent_price_2room_eco rent_price_1room_eco
##  Min.   : 0.10        Min.   : 2.31       
##  1st Qu.:40.83        1st Qu.:32.61       
##  Median :41.44        Median :33.10       
##  Mean   :41.01        Mean   :32.64       
##  3rd Qu.:42.10        3rd Qu.:34.33       
##  Max.   :43.85        Max.   :35.37       
##                                           
##  load_of_teachers_preschool_per_teacher child_on_acc_pre_school
##  Min.   :793.3                          Length:30471           
##  1st Qu.:856.7                          Class :character       
##  Median :863.4                          Mode  :character       
##  Mean   :857.1                                                 
##  3rd Qu.:863.4                                                 
##  Max.   :863.4                                                 
##  NA's   :16901                                                 
##  load_of_teachers_school_per_teacher students_state_oneshift
##  Min.   :1392                        Min.   : 85.51         
##  1st Qu.:1438                        1st Qu.: 85.51         
##  Median :1518                        Median : 97.85         
##  Mean   :1490                        Mean   : 92.89         
##  3rd Qu.:1518                        3rd Qu.:100.00         
##  Max.   :1574                        Max.   :100.00         
##                                                             
##  modern_education_share old_education_build_share provision_doctors
##  Length:30471           Length:30471              Min.   :61.00    
##  Class :character       Class :character          1st Qu.:61.00    
##  Mode  :character       Mode  :character          Median :61.00    
##                                                   Mean   :63.27    
##                                                   3rd Qu.:65.20    
##                                                   Max.   :66.10    
##                                                   NA's   :3239     
##  provision_nurse load_on_doctors power_clinics   
##  Min.   :90.80   Min.   :6900    Min.   : 41.90  
##  1st Qu.:92.80   1st Qu.:7805    1st Qu.: 41.90  
##  Median :92.80   Median :7805    Median : 41.90  
##  Mean   :94.68   Mean   :8069    Mean   : 94.66  
##  3rd Qu.:97.90   3rd Qu.:8847    3rd Qu.:121.10  
##  Max.   :99.60   Max.   :8847    Max.   :375.80  
##                                  NA's   :3239    
##  hospital_beds_available_per_cap hospital_bed_occupancy_per_year
##  Min.   :707.0                   Min.   :286.0                  
##  1st Qu.:707.0                   1st Qu.:286.0                  
##  Median :707.0                   Median :286.0                  
##  Mean   :752.8                   Mean   :290.6                  
##  3rd Qu.:772.0                   3rd Qu.:293.0                  
##  Max.   :846.0                   Max.   :302.0                  
##  NA's   :3239                    NA's   :3239                   
##  provision_retail_space_sqm provision_retail_space_modern_sqm
##  Min.   :741.0              Min.   :271                      
##  1st Qu.:794.0              1st Qu.:271                      
##  Median :794.0              Median :271                      
##  Mean   :786.9              Mean   :271                      
##  3rd Qu.:794.0              3rd Qu.:271                      
##  Max.   :794.0              Max.   :271                      
##  NA's   :24879              NA's   :29718                    
##  turnover_catering_per_cap theaters_viewers_per_1000_cap
##  Min.   : 6943             Min.   :565                  
##  1st Qu.: 9350             1st Qu.:603                  
##  Median :10311             Median :627                  
##  Mean   : 9745             Mean   :615                  
##  3rd Qu.:10311             3rd Qu.:627                  
##  Max.   :10805             Max.   :627                  
##                            NA's   :16901                
##  seats_theather_rfmin_per_100000_cap museum_visitis_per_100_cap
##  Min.   :0.4394                      Min.   :1240              
##  1st Qu.:0.4394                      1st Qu.:1309              
##  Median :0.4478                      Median :1440              
##  Mean   :0.4474                      Mean   :1382              
##  3rd Qu.:0.4507                      3rd Qu.:1440              
##  Max.   :0.4589                      Max.   :1440              
##                                      NA's   :16901             
##  bandwidth_sports population_reg_sports_share students_reg_sports_share
##  Min.   :269768   Min.   :22.37               Min.   :64.12            
##  1st Qu.:329348   1st Qu.:26.70               1st Qu.:67.85            
##  Median :398451   Median :28.20               Median :76.20            
##  Mean   :366627   Mean   :26.68               Mean   :72.55            
##  3rd Qu.:398451   3rd Qu.:28.20               3rd Qu.:76.20            
##  Max.   :463938   Max.   :28.20               Max.   :76.20            
##                   NA's   :3239                NA's   :16901            
##  apartment_build apartment_fund_sqm
##  Min.   :23587   Min.   :226047    
##  1st Qu.:46080   1st Qu.:226047    
##  Median :46080   Median :229295    
##  Mean   :44911   Mean   :229594    
##  3rd Qu.:46352   3rd Qu.:232840    
##  Max.   :46352   Max.   :234577    
##  NA's   :3239

Column types

df.class <- df %>% sapply(class)
df.class %>% table()   
## .
## character   integer   numeric 
##        19       198       174

Correlation of Numeric Inputs

library(ellipse)

cor.matr<- df[,df[df.class %in% c("integer","numeric")] %>% names()] %>% cor()

cor.matr[is.na(cor.matr)] <- 0

plotcorr(cor.matr, numbers = TRUE)

col_del<-NULL
for (col in 1:(nrow(cor.matr)-1))
{
  for (row in (col +1):(nrow(cor.matr)))
  {
    if (abs(cor.matr[row,col]) > 0.8)
    { col_del <- c(col_del, col)
      cat(row, ":", names(df[,df[df.class %in% c("integer","numeric")] %>% names()])[row], col,":", names(df[,df[df.class %in% c("integer","numeric")] %>% names()])[col]," - ",abs(cor.matr[row,col])  ,"\n")
    }
  }
}
## 280 : cpi 1 : id  -  0.9627442 
## 281 : ppi 1 : id  -  0.915856 
## 282 : gdp_deflator 1 : id  -  0.8886692 
## 285 : usdrub 1 : id  -  0.8032757 
## 286 : eurrub 1 : id  -  0.8295897 
## 289 : gdp_annual 1 : id  -  0.8707988 
## 290 : gdp_annual_growth 1 : id  -  0.9220454 
## 293 : rts 1 : id  -  0.8464968 
## 296 : micex_cbi_tr 1 : id  -  0.8393086 
## 297 : deposits_value 1 : id  -  0.9477349 
## 307 : salary 1 : id  -  0.9167773 
## 309 : fixed_basket 1 : id  -  0.9589006 
## 310 : retail_trade_turnover 1 : id  -  0.8433749 
## 311 : retail_trade_turnover_per_cap 1 : id  -  0.8233902 
## 313 : labor_force 1 : id  -  0.8774242 
## 315 : employment 1 : id  -  0.8209608 
## 316 : invest_fixed_capital_per_cap 1 : id  -  0.8410496 
## 317 : invest_fixed_assets 1 : id  -  0.8507932 
## 342 : average_life_exp 1 : id  -  0.8666088 
## 350 : rent_price_3room_eco 1 : id  -  0.8186099 
## 354 : load_of_teachers_school_per_teacher 1 : id  -  0.8822485 
## 357 : provision_nurse 1 : id  -  0.8592107 
## 364 : turnover_catering_per_cap 1 : id  -  0.9016474 
## 368 : bandwidth_sports 1 : id  -  0.9403518 
## 78 : kindergarten_km 11 : area_m  -  0.8021177 
## 15 : children_preschool 12 : raion_popul  -  0.9540021 
## 17 : preschool_education_centers_raion 12 : raion_popul  -  0.8443841 
## 18 : children_school 12 : raion_popul  -  0.9570167 
## 20 : school_education_centers_raion 12 : raion_popul  -  0.8250721 
## 33 : young_all 12 : raion_popul  -  0.9593282 
## 34 : young_male 12 : raion_popul  -  0.9584955 
## 35 : young_female 12 : raion_popul  -  0.9582795 
## 36 : work_all 12 : raion_popul  -  0.9965983 
## 37 : work_male 12 : raion_popul  -  0.994122 
## 38 : work_female 12 : raion_popul  -  0.9938296 
## 39 : ekder_all 12 : raion_popul  -  0.9536719 
## 40 : ekder_male 12 : raion_popul  -  0.9274719 
## 41 : ekder_female 12 : raion_popul  -  0.9608037 
## 42 : X0_6_all 12 : raion_popul  -  0.9540021 
## 43 : X0_6_male 12 : raion_popul  -  0.9532357 
## 44 : X0_6_female 12 : raion_popul  -  0.9530814 
## 45 : X7_14_all 12 : raion_popul  -  0.9570167 
## 46 : X7_14_male 12 : raion_popul  -  0.9569779 
## 47 : X7_14_female 12 : raion_popul  -  0.9538758 
## 48 : X0_17_all 12 : raion_popul  -  0.9617374 
## 49 : X0_17_male 12 : raion_popul  -  0.9606722 
## 50 : X0_17_female 12 : raion_popul  -  0.9610503 
## 54 : X0_13_all 12 : raion_popul  -  0.9582589 
## 55 : X0_13_male 12 : raion_popul  -  0.9574851 
## 56 : X0_13_female 12 : raion_popul  -  0.9570058 
## 17 : preschool_education_centers_raion 15 : children_preschool  -  0.8463937 
## 18 : children_school 15 : children_preschool  -  0.9871133 
## 20 : school_education_centers_raion 15 : children_preschool  -  0.8261249 
## 33 : young_all 15 : children_preschool  -  0.9964084 
## 34 : young_male 15 : children_preschool  -  0.9965892 
## 35 : young_female 15 : children_preschool  -  0.9942094 
## 36 : work_all 15 : children_preschool  -  0.9534949 
## 37 : work_male 15 : children_preschool  -  0.9482641 
## 38 : work_female 15 : children_preschool  -  0.9537531 
## 39 : ekder_all 15 : children_preschool  -  0.8509294 
## 40 : ekder_male 15 : children_preschool  -  0.8129627 
## 41 : ekder_female 15 : children_preschool  -  0.8637923 
## 42 : X0_6_all 15 : children_preschool  -  1 
## 43 : X0_6_male 15 : children_preschool  -  0.9991801 
## 44 : X0_6_female 15 : children_preschool  -  0.9990647 
## 45 : X7_14_all 15 : children_preschool  -  0.9871133 
## 46 : X7_14_male 15 : children_preschool  -  0.9889427 
## 47 : X7_14_female 15 : children_preschool  -  0.9819069 
## 48 : X0_17_all 15 : children_preschool  -  0.9958701 
## 49 : X0_17_male 15 : children_preschool  -  0.9958928 
## 50 : X0_17_female 15 : children_preschool  -  0.9939689 
## 54 : X0_13_all 15 : children_preschool  -  0.9968752 
## 55 : X0_13_male 15 : children_preschool  -  0.9970728 
## 56 : X0_13_female 15 : children_preschool  -  0.994506 
## 18 : children_school 17 : preschool_education_centers_raion  -  0.833643 
## 20 : school_education_centers_raion 17 : preschool_education_centers_raion  -  0.959278 
## 33 : young_all 17 : preschool_education_centers_raion  -  0.8419844 
## 34 : young_male 17 : preschool_education_centers_raion  -  0.8405331 
## 35 : young_female 17 : preschool_education_centers_raion  -  0.8418273 
## 36 : work_all 17 : preschool_education_centers_raion  -  0.8507397 
## 37 : work_male 17 : preschool_education_centers_raion  -  0.8384292 
## 38 : work_female 17 : preschool_education_centers_raion  -  0.8587338 
## 42 : X0_6_all 17 : preschool_education_centers_raion  -  0.8463937 
## 43 : X0_6_male 17 : preschool_education_centers_raion  -  0.845882 
## 44 : X0_6_female 17 : preschool_education_centers_raion  -  0.845382 
## 45 : X7_14_all 17 : preschool_education_centers_raion  -  0.833643 
## 46 : X7_14_male 17 : preschool_education_centers_raion  -  0.8322349 
## 47 : X7_14_female 17 : preschool_education_centers_raion  -  0.8323416 
## 48 : X0_17_all 17 : preschool_education_centers_raion  -  0.8424561 
## 49 : X0_17_male 17 : preschool_education_centers_raion  -  0.8403815 
## 50 : X0_17_female 17 : preschool_education_centers_raion  -  0.8430584 
## 54 : X0_13_all 17 : preschool_education_centers_raion  -  0.8433921 
## 55 : X0_13_male 17 : preschool_education_centers_raion  -  0.8420039 
## 56 : X0_13_female 17 : preschool_education_centers_raion  -  0.8430406 
## 20 : school_education_centers_raion 18 : children_school  -  0.8141455 
## 33 : young_all 18 : children_school  -  0.9970571 
## 34 : young_male 18 : children_school  -  0.9950035 
## 35 : young_female 18 : children_school  -  0.9972329 
## 36 : work_all 18 : children_school  -  0.9535209 
## 37 : work_male 18 : children_school  -  0.9469952 
## 38 : work_female 18 : children_school  -  0.9550944 
## 39 : ekder_all 18 : children_school  -  0.8636891 
## 40 : ekder_male 18 : children_school  -  0.8280752 
## 41 : ekder_female 18 : children_school  -  0.875443 
## 42 : X0_6_all 18 : children_school  -  0.9871133 
## 43 : X0_6_male 18 : children_school  -  0.9852876 
## 44 : X0_6_female 18 : children_school  -  0.9872745 
## 45 : X7_14_all 18 : children_school  -  1 
## 46 : X7_14_male 18 : children_school  -  0.998479 
## 47 : X7_14_female 18 : children_school  -  0.9982968 
## 48 : X0_17_all 18 : children_school  -  0.9968611 
## 49 : X0_17_male 18 : children_school  -  0.994707 
## 50 : X0_17_female 18 : children_school  -  0.9972692 
## 54 : X0_13_all 18 : children_school  -  0.9966101 
## 55 : X0_13_male 18 : children_school  -  0.9945059 
## 56 : X0_13_female 18 : children_school  -  0.9966889 
## 33 : young_all 20 : school_education_centers_raion  -  0.8225379 
## 34 : young_male 20 : school_education_centers_raion  -  0.8217533 
## 35 : young_female 20 : school_education_centers_raion  -  0.8217106 
## 36 : work_all 20 : school_education_centers_raion  -  0.8251897 
## 37 : work_male 20 : school_education_centers_raion  -  0.8116561 
## 38 : work_female 20 : school_education_centers_raion  -  0.8345616 
## 42 : X0_6_all 20 : school_education_centers_raion  -  0.8261249 
## 43 : X0_6_male 20 : school_education_centers_raion  -  0.8265074 
## 44 : X0_6_female 20 : school_education_centers_raion  -  0.8241923 
## 45 : X7_14_all 20 : school_education_centers_raion  -  0.8141455 
## 46 : X7_14_male 20 : school_education_centers_raion  -  0.8132119 
## 47 : X7_14_female 20 : school_education_centers_raion  -  0.8124044 
## 48 : X0_17_all 20 : school_education_centers_raion  -  0.8241789 
## 49 : X0_17_male 20 : school_education_centers_raion  -  0.8229301 
## 50 : X0_17_female 20 : school_education_centers_raion  -  0.8239378 
## 54 : X0_13_all 20 : school_education_centers_raion  -  0.8233129 
## 55 : X0_13_male 20 : school_education_centers_raion  -  0.8226382 
## 56 : X0_13_female 20 : school_education_centers_raion  -  0.8222463 
## 29 : office_raion 27 : culture_objects_top_25_raion  -  0.8920938 
## 144 : cafe_count_500 27 : culture_objects_top_25_raion  -  0.8561192 
## 148 : cafe_count_500_na_price 27 : culture_objects_top_25_raion  -  0.8741312 
## 149 : cafe_count_500_price_500 27 : culture_objects_top_25_raion  -  0.8461994 
## 152 : cafe_count_500_price_2500 27 : culture_objects_top_25_raion  -  0.8885567 
## 155 : big_church_count_500 27 : culture_objects_top_25_raion  -  0.8678375 
## 156 : church_count_500 27 : culture_objects_top_25_raion  -  0.8884682 
## 167 : cafe_count_1000 27 : culture_objects_top_25_raion  -  0.9047776 
## 171 : cafe_count_1000_na_price 27 : culture_objects_top_25_raion  -  0.8655295 
## 172 : cafe_count_1000_price_500 27 : culture_objects_top_25_raion  -  0.9186711 
## 173 : cafe_count_1000_price_1000 27 : culture_objects_top_25_raion  -  0.8388745 
## 174 : cafe_count_1000_price_1500 27 : culture_objects_top_25_raion  -  0.8804772 
## 175 : cafe_count_1000_price_2500 27 : culture_objects_top_25_raion  -  0.9178857 
## 176 : cafe_count_1000_price_4000 27 : culture_objects_top_25_raion  -  0.9084985 
## 178 : big_church_count_1000 27 : culture_objects_top_25_raion  -  0.8397395 
## 179 : church_count_1000 27 : culture_objects_top_25_raion  -  0.8862787 
## 181 : leisure_count_1000 27 : culture_objects_top_25_raion  -  0.8352698 
## 186 : office_count_1500 27 : culture_objects_top_25_raion  -  0.8240784 
## 190 : cafe_count_1500 27 : culture_objects_top_25_raion  -  0.9046933 
## 194 : cafe_count_1500_na_price 27 : culture_objects_top_25_raion  -  0.8744478 
## 195 : cafe_count_1500_price_500 27 : culture_objects_top_25_raion  -  0.9080177 
## 196 : cafe_count_1500_price_1000 27 : culture_objects_top_25_raion  -  0.8825485 
## 197 : cafe_count_1500_price_1500 27 : culture_objects_top_25_raion  -  0.8997748 
## 198 : cafe_count_1500_price_2500 27 : culture_objects_top_25_raion  -  0.9054068 
## 199 : cafe_count_1500_price_4000 27 : culture_objects_top_25_raion  -  0.9076221 
## 200 : cafe_count_1500_price_high 27 : culture_objects_top_25_raion  -  0.812911 
## 201 : big_church_count_1500 27 : culture_objects_top_25_raion  -  0.8863024 
## 202 : church_count_1500 27 : culture_objects_top_25_raion  -  0.8833046 
## 204 : leisure_count_1500 27 : culture_objects_top_25_raion  -  0.8367543 
## 209 : office_count_2000 27 : culture_objects_top_25_raion  -  0.8486865 
## 213 : cafe_count_2000 27 : culture_objects_top_25_raion  -  0.9008518 
## 217 : cafe_count_2000_na_price 27 : culture_objects_top_25_raion  -  0.8838595 
## 218 : cafe_count_2000_price_500 27 : culture_objects_top_25_raion  -  0.8973304 
## 219 : cafe_count_2000_price_1000 27 : culture_objects_top_25_raion  -  0.8922558 
## 220 : cafe_count_2000_price_1500 27 : culture_objects_top_25_raion  -  0.8960718 
## 221 : cafe_count_2000_price_2500 27 : culture_objects_top_25_raion  -  0.9055343 
## 222 : cafe_count_2000_price_4000 27 : culture_objects_top_25_raion  -  0.9015762 
## 223 : cafe_count_2000_price_high 27 : culture_objects_top_25_raion  -  0.8736278 
## 224 : big_church_count_2000 27 : culture_objects_top_25_raion  -  0.877567 
## 225 : church_count_2000 27 : culture_objects_top_25_raion  -  0.87539 
## 227 : leisure_count_2000 27 : culture_objects_top_25_raion  -  0.8975603 
## 232 : office_count_3000 27 : culture_objects_top_25_raion  -  0.8385859 
## 236 : cafe_count_3000 27 : culture_objects_top_25_raion  -  0.8719345 
## 240 : cafe_count_3000_na_price 27 : culture_objects_top_25_raion  -  0.8580008 
## 241 : cafe_count_3000_price_500 27 : culture_objects_top_25_raion  -  0.8694323 
## 242 : cafe_count_3000_price_1000 27 : culture_objects_top_25_raion  -  0.858639 
## 243 : cafe_count_3000_price_1500 27 : culture_objects_top_25_raion  -  0.8702785 
## 244 : cafe_count_3000_price_2500 27 : culture_objects_top_25_raion  -  0.8769942 
## 245 : cafe_count_3000_price_4000 27 : culture_objects_top_25_raion  -  0.8881527 
## 246 : cafe_count_3000_price_high 27 : culture_objects_top_25_raion  -  0.8337062 
## 247 : big_church_count_3000 27 : culture_objects_top_25_raion  -  0.8187833 
## 248 : church_count_3000 27 : culture_objects_top_25_raion  -  0.8344666 
## 250 : leisure_count_3000 27 : culture_objects_top_25_raion  -  0.8931528 
## 188 : trc_count_1500 28 : shopping_centers_raion  -  0.8309404 
## 211 : trc_count_2000 28 : shopping_centers_raion  -  0.8239059 
## 140 : office_count_500 29 : office_raion  -  0.8023637 
## 144 : cafe_count_500 29 : office_raion  -  0.8749404 
## 148 : cafe_count_500_na_price 29 : office_raion  -  0.8308588 
## 149 : cafe_count_500_price_500 29 : office_raion  -  0.848985 
## 151 : cafe_count_500_price_1500 29 : office_raion  -  0.8301438 
## 152 : cafe_count_500_price_2500 29 : office_raion  -  0.8710568 
## 155 : big_church_count_500 29 : office_raion  -  0.8308411 
## 156 : church_count_500 29 : office_raion  -  0.8362552 
## 163 : office_count_1000 29 : office_raion  -  0.8997899 
## 167 : cafe_count_1000 29 : office_raion  -  0.9056679 
## 171 : cafe_count_1000_na_price 29 : office_raion  -  0.8770982 
## 172 : cafe_count_1000_price_500 29 : office_raion  -  0.8978658 
## 173 : cafe_count_1000_price_1000 29 : office_raion  -  0.8829614 
## 174 : cafe_count_1000_price_1500 29 : office_raion  -  0.8998111 
## 175 : cafe_count_1000_price_2500 29 : office_raion  -  0.9002843 
## 176 : cafe_count_1000_price_4000 29 : office_raion  -  0.8564223 
## 178 : big_church_count_1000 29 : office_raion  -  0.8731183 
## 179 : church_count_1000 29 : office_raion  -  0.8794929 
## 181 : leisure_count_1000 29 : office_raion  -  0.8410005 
## 186 : office_count_1500 29 : office_raion  -  0.9265138 
## 190 : cafe_count_1500 29 : office_raion  -  0.9166059 
## 194 : cafe_count_1500_na_price 29 : office_raion  -  0.9048605 
## 195 : cafe_count_1500_price_500 29 : office_raion  -  0.9103909 
## 196 : cafe_count_1500_price_1000 29 : office_raion  -  0.9092988 
## 197 : cafe_count_1500_price_1500 29 : office_raion  -  0.9142281 
## 198 : cafe_count_1500_price_2500 29 : office_raion  -  0.9161808 
## 199 : cafe_count_1500_price_4000 29 : office_raion  -  0.8805402 
## 200 : cafe_count_1500_price_high 29 : office_raion  -  0.8307436 
## 201 : big_church_count_1500 29 : office_raion  -  0.8961057 
## 202 : church_count_1500 29 : office_raion  -  0.8970338 
## 204 : leisure_count_1500 29 : office_raion  -  0.8651134 
## 209 : office_count_2000 29 : office_raion  -  0.9376561 
## 210 : office_sqm_2000 29 : office_raion  -  0.8177734 
## 213 : cafe_count_2000 29 : office_raion  -  0.9243658 
## 217 : cafe_count_2000_na_price 29 : office_raion  -  0.9175871 
## 218 : cafe_count_2000_price_500 29 : office_raion  -  0.9180735 
## 219 : cafe_count_2000_price_1000 29 : office_raion  -  0.9203881 
## 220 : cafe_count_2000_price_1500 29 : office_raion  -  0.9237936 
## 221 : cafe_count_2000_price_2500 29 : office_raion  -  0.9237602 
## 222 : cafe_count_2000_price_4000 29 : office_raion  -  0.9023458 
## 223 : cafe_count_2000_price_high 29 : office_raion  -  0.8863546 
## 224 : big_church_count_2000 29 : office_raion  -  0.9046637 
## 225 : church_count_2000 29 : office_raion  -  0.9030915 
## 227 : leisure_count_2000 29 : office_raion  -  0.8983025 
## 232 : office_count_3000 29 : office_raion  -  0.9386803 
## 233 : office_sqm_3000 29 : office_raion  -  0.8618058 
## 236 : cafe_count_3000 29 : office_raion  -  0.9372318 
## 240 : cafe_count_3000_na_price 29 : office_raion  -  0.9335902 
## 241 : cafe_count_3000_price_500 29 : office_raion  -  0.931338 
## 242 : cafe_count_3000_price_1000 29 : office_raion  -  0.932962 
## 243 : cafe_count_3000_price_1500 29 : office_raion  -  0.9373665 
## 244 : cafe_count_3000_price_2500 29 : office_raion  -  0.9351219 
## 245 : cafe_count_3000_price_4000 29 : office_raion  -  0.926369 
## 246 : cafe_count_3000_price_high 29 : office_raion  -  0.8890371 
## 247 : big_church_count_3000 29 : office_raion  -  0.9153011 
## 248 : church_count_3000 29 : office_raion  -  0.9157033 
## 250 : leisure_count_3000 29 : office_raion  -  0.9246275 
## 255 : office_count_5000 29 : office_raion  -  0.8947745 
## 256 : office_sqm_5000 29 : office_raion  -  0.8206607 
## 259 : cafe_count_5000 29 : office_raion  -  0.899964 
## 263 : cafe_count_5000_na_price 29 : office_raion  -  0.8980044 
## 264 : cafe_count_5000_price_500 29 : office_raion  -  0.893919 
## 265 : cafe_count_5000_price_1000 29 : office_raion  -  0.8894159 
## 266 : cafe_count_5000_price_1500 29 : office_raion  -  0.9022171 
## 267 : cafe_count_5000_price_2500 29 : office_raion  -  0.9022741 
## 268 : cafe_count_5000_price_4000 29 : office_raion  -  0.8972294 
## 269 : cafe_count_5000_price_high 29 : office_raion  -  0.8675335 
## 270 : big_church_count_5000 29 : office_raion  -  0.8945562 
## 271 : church_count_5000 29 : office_raion  -  0.8954698 
## 273 : leisure_count_5000 29 : office_raion  -  0.9037701 
## 31 : male_f 30 : full_all  -  0.9997884 
## 32 : female_f 30 : full_all  -  0.9998498 
## 51 : X16_29_all 30 : full_all  -  0.9993699 
## 52 : X16_29_male 30 : full_all  -  0.9989193 
## 53 : X16_29_female 30 : full_all  -  0.9989537 
## 32 : female_f 31 : male_f  -  0.9992816 
## 51 : X16_29_all 31 : male_f  -  0.9991845 
## 52 : X16_29_male 31 : male_f  -  0.9992152 
## 53 : X16_29_female 31 : male_f  -  0.9983153 
## 51 : X16_29_all 32 : female_f  -  0.9991977 
## 52 : X16_29_male 32 : female_f  -  0.9983419 
## 53 : X16_29_female 32 : female_f  -  0.9991633 
## 34 : young_male 33 : young_all  -  0.9990821 
## 35 : young_female 33 : young_all  -  0.9989621 
## 36 : work_all 33 : young_all  -  0.9571813 
## 37 : work_male 33 : young_all  -  0.9512894 
## 38 : work_female 33 : young_all  -  0.9580916 
## 39 : ekder_all 33 : young_all  -  0.8615772 
## 40 : ekder_male 33 : young_all  -  0.8248303 
## 41 : ekder_female 33 : young_all  -  0.873846 
## 42 : X0_6_all 33 : young_all  -  0.9964084 
## 43 : X0_6_male 33 : young_all  -  0.9950837 
## 44 : X0_6_female 33 : young_all  -  0.9960181 
## 45 : X7_14_all 33 : young_all  -  0.9970571 
## 46 : X7_14_male 33 : young_all  -  0.9972592 
## 47 : X7_14_female 33 : young_all  -  0.9935402 
## 48 : X0_17_all 33 : young_all  -  0.9997121 
## 49 : X0_17_male 33 : young_all  -  0.9986648 
## 50 : X0_17_female 33 : young_all  -  0.9989396 
## 54 : X0_13_all 33 : young_all  -  0.9998847 
## 55 : X0_13_male 33 : young_all  -  0.9989494 
## 56 : X0_13_female 33 : young_all  -  0.9987136 
## 35 : young_female 34 : young_male  -  0.996094 
## 36 : work_all 34 : young_male  -  0.9569732 
## 37 : work_male 34 : young_male  -  0.9518731 
## 38 : work_female 34 : young_male  -  0.9570804 
## 39 : ekder_all 34 : young_male  -  0.8590889 
## 40 : ekder_male 34 : young_male  -  0.8225835 
## 41 : ekder_female 34 : young_male  -  0.8712619 
## 42 : X0_6_all 34 : young_male  -  0.9965892 
## 43 : X0_6_male 34 : young_male  -  0.9967479 
## 44 : X0_6_female 34 : young_male  -  0.9946142 
## 45 : X7_14_all 34 : young_male  -  0.9950035 
## 46 : X7_14_male 34 : young_male  -  0.9974105 
## 47 : X7_14_female 34 : young_male  -  0.9891605 
## 48 : X0_17_all 34 : young_male  -  0.9989854 
## 49 : X0_17_male 34 : young_male  -  0.9996867 
## 50 : X0_17_female 34 : young_male  -  0.996358 
## 54 : X0_13_all 34 : young_male  -  0.9989096 
## 55 : X0_13_male 34 : young_male  -  0.9998614 
## 56 : X0_13_female 34 : young_male  -  0.9957339 
## 36 : work_all 35 : young_female  -  0.9554728 
## 37 : work_male 35 : young_female  -  0.9487508 
## 38 : work_female 35 : young_female  -  0.9572355 
## 39 : ekder_all 35 : young_female  -  0.862484 
## 40 : ekder_male 35 : young_female  -  0.8255538 
## 41 : ekder_female 35 : young_female  -  0.8748301 
## 42 : X0_6_all 35 : young_female  -  0.9942094 
## 43 : X0_6_male 35 : young_female  -  0.9913101 
## 44 : X0_6_female 35 : young_female  -  0.9955049 
## 45 : X7_14_all 35 : young_female  -  0.9972329 
## 46 : X7_14_male 35 : young_female  -  0.9950899 
## 47 : X7_14_female 35 : young_female  -  0.9961964 
## 48 : X0_17_all 35 : young_female  -  0.9984712 
## 49 : X0_17_male 35 : young_female  -  0.9955668 
## 50 : X0_17_female 35 : young_female  -  0.9996729 
## 54 : X0_13_all 35 : young_female  -  0.9989079 
## 55 : X0_13_male 35 : young_female  -  0.9959677 
## 56 : X0_13_female 35 : young_female  -  0.9998706 
## 37 : work_male 36 : work_all  -  0.9974109 
## 38 : work_female 36 : work_all  -  0.9973279 
## 39 : ekder_all 36 : work_all  -  0.9304021 
## 40 : ekder_male 36 : work_all  -  0.9006774 
## 41 : ekder_female 36 : work_all  -  0.9392148 
## 42 : X0_6_all 36 : work_all  -  0.9534949 
## 43 : X0_6_male 36 : work_all  -  0.9532155 
## 44 : X0_6_female 36 : work_all  -  0.9520559 
## 45 : X7_14_all 36 : work_all  -  0.9535209 
## 46 : X7_14_male 36 : work_all  -  0.9542966 
## 47 : X7_14_female 36 : work_all  -  0.9495307 
## 48 : X0_17_all 36 : work_all  -  0.9594515 
## 49 : X0_17_male 36 : work_all  -  0.9590398 
## 50 : X0_17_female 36 : work_all  -  0.9580755 
## 54 : X0_13_all 36 : work_all  -  0.9562167 
## 55 : X0_13_male 36 : work_all  -  0.9561083 
## 56 : X0_13_female 36 : work_all  -  0.9542605 
## 38 : work_female 37 : work_male  -  0.9894921 
## 39 : ekder_all 37 : work_male  -  0.9305974 
## 40 : ekder_male 37 : work_male  -  0.9021572 
## 41 : ekder_female 37 : work_male  -  0.938837 
## 42 : X0_6_all 37 : work_male  -  0.9482641 
## 43 : X0_6_male 37 : work_male  -  0.9484816 
## 44 : X0_6_female 37 : work_male  -  0.9463033 
## 45 : X7_14_all 37 : work_male  -  0.9469952 
## 46 : X7_14_male 37 : work_male  -  0.9488336 
## 47 : X7_14_female 37 : work_male  -  0.9419017 
## 48 : X0_17_all 37 : work_male  -  0.9538128 
## 49 : X0_17_male 37 : work_male  -  0.9542827 
## 50 : X0_17_female 37 : work_male  -  0.9515111 
## 54 : X0_13_all 37 : work_male  -  0.9503148 
## 55 : X0_13_male 37 : work_male  -  0.9510272 
## 56 : X0_13_female 37 : work_male  -  0.9474988 
## 39 : ekder_all 38 : work_female  -  0.9252698 
## 40 : ekder_male 38 : work_female  -  0.8943978 
## 41 : ekder_female 38 : work_female  -  0.9346181 
## 42 : X0_6_all 38 : work_female  -  0.9537531 
## 43 : X0_6_male 38 : work_female  -  0.9529706 
## 44 : X0_6_female 38 : work_female  -  0.9528518 
## 45 : X7_14_all 38 : work_female  -  0.9550944 
## 46 : X7_14_male 38 : work_female  -  0.9547866 
## 47 : X7_14_female 38 : work_female  -  0.9522462 
## 48 : X0_17_all 38 : work_female  -  0.9600926 
## 49 : X0_17_male 38 : work_female  -  0.9587875 
## 50 : X0_17_female 38 : work_female  -  0.9596643 
## 54 : X0_13_all 38 : work_female  -  0.9571422 
## 55 : X0_13_male 38 : work_female  -  0.9562008 
## 56 : X0_13_female 38 : work_female  -  0.9560698 
## 40 : ekder_male 39 : ekder_all  -  0.9926006 
## 41 : ekder_female 39 : ekder_all  -  0.9985358 
## 42 : X0_6_all 39 : ekder_all  -  0.8509294 
## 43 : X0_6_male 39 : ekder_all  -  0.8491909 
## 44 : X0_6_female 39 : ekder_all  -  0.8512248 
## 45 : X7_14_all 39 : ekder_all  -  0.8636891 
## 46 : X7_14_male 39 : ekder_all  -  0.8611844 
## 47 : X7_14_female 39 : ekder_all  -  0.8634575 
## 48 : X0_17_all 39 : ekder_all  -  0.8658815 
## 49 : X0_17_male 39 : ekder_all  -  0.8630329 
## 50 : X0_17_female 39 : ekder_all  -  0.8672643 
## 54 : X0_13_all 39 : ekder_all  -  0.8596969 
## 55 : X0_13_male 39 : ekder_all  -  0.8571945 
## 56 : X0_13_female 39 : ekder_all  -  0.8604949 
## 41 : ekder_female 40 : ekder_male  -  0.9845788 
## 42 : X0_6_all 40 : ekder_male  -  0.8129627 
## 43 : X0_6_male 40 : ekder_male  -  0.8113355 
## 44 : X0_6_female 40 : ekder_male  -  0.813206 
## 45 : X7_14_all 40 : ekder_male  -  0.8280752 
## 46 : X7_14_male 40 : ekder_male  -  0.8259872 
## 47 : X7_14_female 40 : ekder_male  -  0.8275189 
## 48 : X0_17_all 40 : ekder_male  -  0.8300446 
## 49 : X0_17_male 40 : ekder_male  -  0.8273812 
## 50 : X0_17_female 40 : ekder_male  -  0.8312976 
## 54 : X0_13_all 40 : ekder_male  -  0.8226306 
## 55 : X0_13_male 40 : ekder_male  -  0.8203372 
## 56 : X0_13_female 40 : ekder_male  -  0.8232867 
## 42 : X0_6_all 41 : ekder_female  -  0.8637923 
## 43 : X0_6_male 41 : ekder_female  -  0.8620125 
## 44 : X0_6_female 41 : ekder_female  -  0.8641094 
## 45 : X7_14_all 41 : ekder_female  -  0.875443 
## 46 : X7_14_male 41 : ekder_female  -  0.8727647 
## 47 : X7_14_female 41 : ekder_female  -  0.8753572 
## 48 : X0_17_all 41 : ekder_female  -  0.8777243 
## 49 : X0_17_male 41 : ekder_female  -  0.8748069 
## 50 : X0_17_female 41 : ekder_female  -  0.8791584 
## 54 : X0_13_all 41 : ekder_female  -  0.8721169 
## 55 : X0_13_male 41 : ekder_female  -  0.8695334 
## 56 : X0_13_female 41 : ekder_female  -  0.8729743 
## 43 : X0_6_male 42 : X0_6_all  -  0.9991801 
## 44 : X0_6_female 42 : X0_6_all  -  0.9990647 
## 45 : X7_14_all 42 : X0_6_all  -  0.9871133 
## 46 : X7_14_male 42 : X0_6_all  -  0.9889427 
## 47 : X7_14_female 42 : X0_6_all  -  0.9819069 
## 48 : X0_17_all 42 : X0_6_all  -  0.9958701 
## 49 : X0_17_male 42 : X0_6_all  -  0.9958928 
## 50 : X0_17_female 42 : X0_6_all  -  0.9939689 
## 54 : X0_13_all 42 : X0_6_all  -  0.9968752 
## 55 : X0_13_male 42 : X0_6_all  -  0.9970728 
## 56 : X0_13_female 42 : X0_6_all  -  0.994506 
## 44 : X0_6_female 43 : X0_6_male  -  0.996495 
## 45 : X7_14_all 43 : X0_6_male  -  0.9852876 
## 46 : X7_14_male 43 : X0_6_male  -  0.9885091 
## 47 : X7_14_female 43 : X0_6_male  -  0.9786149 
## 48 : X0_17_all 43 : X0_6_male  -  0.9947308 
## 49 : X0_17_male 43 : X0_6_male  -  0.9961366 
## 50 : X0_17_female 43 : X0_6_male  -  0.9913634 
## 54 : X0_13_all 43 : X0_6_male  -  0.9955788 
## 55 : X0_13_male 43 : X0_6_male  -  0.9973408 
## 56 : X0_13_female 43 : X0_6_male  -  0.9915489 
## 45 : X7_14_all 44 : X0_6_female  -  0.9872745 
## 46 : X7_14_male 44 : X0_6_female  -  0.9876137 
## 47 : X7_14_female 44 : X0_6_female  -  0.9836437 
## 48 : X0_17_all 44 : X0_6_female  -  0.9952824 
## 49 : X0_17_male 44 : X0_6_female  -  0.9938277 
## 50 : X0_17_female 44 : X0_6_female  -  0.9949506 
## 54 : X0_13_all 44 : X0_6_female  -  0.996454 
## 55 : X0_13_male 44 : X0_6_female  -  0.9949803 
## 56 : X0_13_female 44 : X0_6_female  -  0.9958626 
## 46 : X7_14_male 45 : X7_14_all  -  0.998479 
## 47 : X7_14_female 45 : X7_14_all  -  0.9982968 
## 48 : X0_17_all 45 : X7_14_all  -  0.9968611 
## 49 : X0_17_male 45 : X7_14_all  -  0.994707 
## 50 : X0_17_female 45 : X7_14_all  -  0.9972692 
## 54 : X0_13_all 45 : X7_14_all  -  0.9966101 
## 55 : X0_13_male 45 : X7_14_all  -  0.9945059 
## 56 : X0_13_female 45 : X7_14_all  -  0.9966889 
## 47 : X7_14_female 46 : X7_14_male  -  0.993562 
## 48 : X0_17_all 46 : X7_14_male  -  0.9972794 
## 49 : X0_17_male 46 : X7_14_male  -  0.9972444 
## 50 : X0_17_female 46 : X7_14_male  -  0.9954367 
## 54 : X0_13_all 46 : X7_14_male  -  0.9966668 
## 55 : X0_13_male 46 : X7_14_male  -  0.9968225 
## 56 : X0_13_female 46 : X7_14_male  -  0.9943425 
## 48 : X0_17_all 47 : X7_14_female  -  0.9931155 
## 49 : X0_17_male 47 : X7_14_female  -  0.9887264 
## 50 : X0_17_female 47 : X7_14_female  -  0.9959037 
## 54 : X0_13_all 47 : X7_14_female  -  0.9932484 
## 55 : X0_13_male 47 : X7_14_female  -  0.9887601 
## 56 : X0_13_female 47 : X7_14_female  -  0.9958693 
## 49 : X0_17_male 48 : X0_17_all  -  0.9991388 
## 50 : X0_17_female 48 : X0_17_all  -  0.9990292 
## 54 : X0_13_all 48 : X0_17_all  -  0.999445 
## 55 : X0_13_male 48 : X0_17_all  -  0.9987221 
## 56 : X0_13_female 48 : X0_17_all  -  0.9980489 
## 50 : X0_17_female 49 : X0_17_male  -  0.9963411 
## 54 : X0_13_all 49 : X0_17_male  -  0.9983358 
## 55 : X0_13_male 49 : X0_17_male  -  0.9994018 
## 56 : X0_13_female 49 : X0_17_male  -  0.99504 
## 54 : X0_13_all 50 : X0_17_female  -  0.9987387 
## 55 : X0_13_male 50 : X0_17_female  -  0.9961179 
## 56 : X0_13_female 50 : X0_17_female  -  0.9993621 
## 52 : X16_29_male 51 : X16_29_all  -  0.9995401 
## 53 : X16_29_female 51 : X16_29_all  -  0.9995921 
## 53 : X16_29_female 52 : X16_29_male  -  0.9982663 
## 55 : X0_13_male 54 : X0_13_all  -  0.9990127 
## 56 : X0_13_female 54 : X0_13_all  -  0.9988838 
## 56 : X0_13_female 55 : X0_13_male  -  0.9957992 
## 75 : metro_km_avto 74 : metro_min_avto  -  0.9450349 
## 80 : park_km 74 : metro_min_avto  -  0.8984418 
## 111 : radiation_km 74 : metro_min_avto  -  0.8692206 
## 112 : power_transmission_line_km 74 : metro_min_avto  -  0.8291058 
## 113 : thermal_power_plant_km 74 : metro_min_avto  -  0.8328279 
## 114 : ts_km 74 : metro_min_avto  -  0.844203 
## 121 : basketball_km 74 : metro_min_avto  -  0.8336079 
## 136 : exhibition_km 74 : metro_min_avto  -  0.8461268 
## 80 : park_km 75 : metro_km_avto  -  0.922776 
## 96 : ttk_km 75 : metro_km_avto  -  0.8114067 
## 111 : radiation_km 75 : metro_km_avto  -  0.9059444 
## 112 : power_transmission_line_km 75 : metro_km_avto  -  0.8808198 
## 113 : thermal_power_plant_km 75 : metro_km_avto  -  0.8690001 
## 114 : ts_km 75 : metro_km_avto  -  0.8870096 
## 120 : stadium_km 75 : metro_km_avto  -  0.8069971 
## 121 : basketball_km 75 : metro_km_avto  -  0.8725396 
## 131 : big_church_km 75 : metro_km_avto  -  0.8248736 
## 136 : exhibition_km 75 : metro_km_avto  -  0.8786532 
## 79 : school_km 78 : kindergarten_km  -  0.8586962 
## 92 : public_transport_station_km 78 : kindergarten_km  -  0.8424346 
## 93 : public_transport_station_min_walk 78 : kindergarten_km  -  0.8424346 
## 122 : hospice_morgue_km 78 : kindergarten_km  -  0.8217088 
## 130 : preschool_km 78 : kindergarten_km  -  0.8585777 
## 92 : public_transport_station_km 79 : school_km  -  0.8416214 
## 93 : public_transport_station_min_walk 79 : school_km  -  0.8416214 
## 118 : swim_pool_km 79 : school_km  -  0.891354 
## 121 : basketball_km 79 : school_km  -  0.8015522 
## 122 : hospice_morgue_km 79 : school_km  -  0.8282315 
## 124 : public_healthcare_km 79 : school_km  -  0.9286618 
## 126 : workplaces_km 79 : school_km  -  0.8650854 
## 127 : shopping_centers_km 79 : school_km  -  0.8993349 
## 130 : preschool_km 79 : school_km  -  0.9994306 
## 131 : big_church_km 79 : school_km  -  0.9211418 
## 96 : ttk_km 80 : park_km  -  0.8187134 
## 97 : sadovoe_km 80 : park_km  -  0.8025898 
## 111 : radiation_km 80 : park_km  -  0.9124976 
## 112 : power_transmission_line_km 80 : park_km  -  0.8772813 
## 113 : thermal_power_plant_km 80 : park_km  -  0.8875163 
## 114 : ts_km 80 : park_km  -  0.8407656 
## 120 : stadium_km 80 : park_km  -  0.8083912 
## 121 : basketball_km 80 : park_km  -  0.8637366 
## 136 : exhibition_km 80 : park_km  -  0.8369843 
## 90 : railroad_station_avto_min 89 : railroad_station_avto_km  -  0.9015285 
## 104 : railroad_km 89 : railroad_station_avto_km  -  0.8863239 
## 93 : public_transport_station_min_walk 92 : public_transport_station_km  -  1 
## 130 : preschool_km 92 : public_transport_station_km  -  0.8414441 
## 130 : preschool_km 93 : public_transport_station_min_walk  -  0.8414441 
## 112 : power_transmission_line_km 95 : mkad_km  -  0.8166044 
## 97 : sadovoe_km 96 : ttk_km  -  0.9924771 
## 98 : bulvar_ring_km 96 : ttk_km  -  0.9870038 
## 99 : kremlin_km 96 : ttk_km  -  0.9845623 
## 105 : zd_vokzaly_avto_km 96 : ttk_km  -  0.959727 
## 109 : oil_chemistry_km 96 : ttk_km  -  0.8134983 
## 110 : nuclear_reactor_km 96 : ttk_km  -  0.8198195 
## 111 : radiation_km 96 : ttk_km  -  0.8939974 
## 113 : thermal_power_plant_km 96 : ttk_km  -  0.8911023 
## 120 : stadium_km 96 : ttk_km  -  0.9197009 
## 121 : basketball_km 96 : ttk_km  -  0.9156462 
## 123 : detention_facility_km 96 : ttk_km  -  0.8359401 
## 136 : exhibition_km 96 : ttk_km  -  0.8965827 
## 98 : bulvar_ring_km 97 : sadovoe_km  -  0.9984434 
## 99 : kremlin_km 97 : sadovoe_km  -  0.9974555 
## 105 : zd_vokzaly_avto_km 97 : sadovoe_km  -  0.9698001 
## 110 : nuclear_reactor_km 97 : sadovoe_km  -  0.8079323 
## 111 : radiation_km 97 : sadovoe_km  -  0.8723222 
## 113 : thermal_power_plant_km 97 : sadovoe_km  -  0.8774231 
## 120 : stadium_km 97 : sadovoe_km  -  0.9141943 
## 121 : basketball_km 97 : sadovoe_km  -  0.9015653 
## 123 : detention_facility_km 97 : sadovoe_km  -  0.8304248 
## 136 : exhibition_km 97 : sadovoe_km  -  0.8863651 
## 274 : sport_count_5000 97 : sadovoe_km  -  0.8064375 
## 99 : kremlin_km 98 : bulvar_ring_km  -  0.9988041 
## 105 : zd_vokzaly_avto_km 98 : bulvar_ring_km  -  0.9706542 
## 111 : radiation_km 98 : bulvar_ring_km  -  0.8646366 
## 113 : thermal_power_plant_km 98 : bulvar_ring_km  -  0.867578 
## 120 : stadium_km 98 : bulvar_ring_km  -  0.910117 
## 121 : basketball_km 98 : bulvar_ring_km  -  0.8979843 
## 123 : detention_facility_km 98 : bulvar_ring_km  -  0.8353492 
## 136 : exhibition_km 98 : bulvar_ring_km  -  0.8789181 
## 274 : sport_count_5000 98 : bulvar_ring_km  -  0.8221909 
## 105 : zd_vokzaly_avto_km 99 : kremlin_km  -  0.9657161 
## 110 : nuclear_reactor_km 99 : kremlin_km  -  0.8034289 
## 111 : radiation_km 99 : kremlin_km  -  0.8640533 
## 113 : thermal_power_plant_km 99 : kremlin_km  -  0.8672251 
## 120 : stadium_km 99 : kremlin_km  -  0.9052401 
## 121 : basketball_km 99 : kremlin_km  -  0.8919805 
## 123 : detention_facility_km 99 : kremlin_km  -  0.8226343 
## 136 : exhibition_km 99 : kremlin_km  -  0.8795303 
## 274 : sport_count_5000 99 : kremlin_km  -  0.8263875 
## 110 : nuclear_reactor_km 105 : zd_vokzaly_avto_km  -  0.8258332 
## 111 : radiation_km 105 : zd_vokzaly_avto_km  -  0.8473822 
## 113 : thermal_power_plant_km 105 : zd_vokzaly_avto_km  -  0.8633574 
## 120 : stadium_km 105 : zd_vokzaly_avto_km  -  0.9049329 
## 121 : basketball_km 105 : zd_vokzaly_avto_km  -  0.9057437 
## 123 : detention_facility_km 105 : zd_vokzaly_avto_km  -  0.8610885 
## 126 : workplaces_km 105 : zd_vokzaly_avto_km  -  0.8001063 
## 136 : exhibition_km 105 : zd_vokzaly_avto_km  -  0.8377998 
## 274 : sport_count_5000 105 : zd_vokzaly_avto_km  -  0.804994 
## 111 : radiation_km 109 : oil_chemistry_km  -  0.8225423 
## 111 : radiation_km 110 : nuclear_reactor_km  -  0.8126605 
## 113 : thermal_power_plant_km 110 : nuclear_reactor_km  -  0.8269289 
## 120 : stadium_km 110 : nuclear_reactor_km  -  0.8006041 
## 121 : basketball_km 110 : nuclear_reactor_km  -  0.8418898 
## 112 : power_transmission_line_km 111 : radiation_km  -  0.9221546 
## 113 : thermal_power_plant_km 111 : radiation_km  -  0.9331894 
## 114 : ts_km 111 : radiation_km  -  0.8706207 
## 120 : stadium_km 111 : radiation_km  -  0.8758977 
## 121 : basketball_km 111 : radiation_km  -  0.9343608 
## 136 : exhibition_km 111 : radiation_km  -  0.8893577 
## 113 : thermal_power_plant_km 112 : power_transmission_line_km  -  0.878474 
## 114 : ts_km 112 : power_transmission_line_km  -  0.8802774 
## 120 : stadium_km 112 : power_transmission_line_km  -  0.8095308 
## 121 : basketball_km 112 : power_transmission_line_km  -  0.8605474 
## 136 : exhibition_km 112 : power_transmission_line_km  -  0.847572 
## 114 : ts_km 113 : thermal_power_plant_km  -  0.8105309 
## 120 : stadium_km 113 : thermal_power_plant_km  -  0.8603635 
## 121 : basketball_km 113 : thermal_power_plant_km  -  0.9226947 
## 136 : exhibition_km 113 : thermal_power_plant_km  -  0.8706665 
## 120 : stadium_km 114 : ts_km  -  0.8102104 
## 121 : basketball_km 114 : ts_km  -  0.8588168 
## 136 : exhibition_km 114 : ts_km  -  0.8947503 
## 124 : public_healthcare_km 117 : fitness_km  -  0.8034494 
## 121 : basketball_km 118 : swim_pool_km  -  0.8138264 
## 124 : public_healthcare_km 118 : swim_pool_km  -  0.8894206 
## 126 : workplaces_km 118 : swim_pool_km  -  0.847199 
## 127 : shopping_centers_km 118 : swim_pool_km  -  0.9000279 
## 130 : preschool_km 118 : swim_pool_km  -  0.8902144 
## 131 : big_church_km 118 : swim_pool_km  -  0.906365 
## 121 : basketball_km 120 : stadium_km  -  0.9080339 
## 123 : detention_facility_km 120 : stadium_km  -  0.8264523 
## 136 : exhibition_km 120 : stadium_km  -  0.9110743 
## 123 : detention_facility_km 121 : basketball_km  -  0.8514758 
## 124 : public_healthcare_km 121 : basketball_km  -  0.8008189 
## 125 : university_km 121 : basketball_km  -  0.8129983 
## 126 : workplaces_km 121 : basketball_km  -  0.8881672 
## 131 : big_church_km 121 : basketball_km  -  0.8444439 
## 136 : exhibition_km 121 : basketball_km  -  0.8938212 
## 126 : workplaces_km 122 : hospice_morgue_km  -  0.8339333 
## 130 : preschool_km 122 : hospice_morgue_km  -  0.8269609 
## 126 : workplaces_km 123 : detention_facility_km  -  0.812324 
## 126 : workplaces_km 124 : public_healthcare_km  -  0.8460288 
## 127 : shopping_centers_km 124 : public_healthcare_km  -  0.8528417 
## 130 : preschool_km 124 : public_healthcare_km  -  0.928032 
## 131 : big_church_km 124 : public_healthcare_km  -  0.9162137 
## 126 : workplaces_km 125 : university_km  -  0.8756027 
## 134 : theater_km 125 : university_km  -  0.888875 
## 135 : museum_km 125 : university_km  -  0.887421 
## 127 : shopping_centers_km 126 : workplaces_km  -  0.8228761 
## 128 : office_km 126 : workplaces_km  -  0.8035441 
## 130 : preschool_km 126 : workplaces_km  -  0.8630003 
## 131 : big_church_km 126 : workplaces_km  -  0.8539744 
## 135 : museum_km 126 : workplaces_km  -  0.8056234 
## 128 : office_km 127 : shopping_centers_km  -  0.8295437 
## 130 : preschool_km 127 : shopping_centers_km  -  0.898468 
## 131 : big_church_km 127 : shopping_centers_km  -  0.8771749 
## 131 : big_church_km 130 : preschool_km  -  0.9202301 
## 135 : museum_km 134 : theater_km  -  0.9007163 
## 144 : cafe_count_500 140 : office_count_500  -  0.8265307 
## 149 : cafe_count_500_price_500 140 : office_count_500  -  0.8051683 
## 151 : cafe_count_500_price_1500 140 : office_count_500  -  0.8207133 
## 163 : office_count_1000 140 : office_count_500  -  0.9232092 
## 167 : cafe_count_1000 140 : office_count_500  -  0.8092637 
## 173 : cafe_count_1000_price_1000 140 : office_count_500  -  0.8408735 
## 174 : cafe_count_1000_price_1500 140 : office_count_500  -  0.8157259 
## 186 : office_count_1500 140 : office_count_500  -  0.8937584 
## 190 : cafe_count_1500 140 : office_count_500  -  0.8198678 
## 194 : cafe_count_1500_na_price 140 : office_count_500  -  0.8121535 
## 195 : cafe_count_1500_price_500 140 : office_count_500  -  0.8115564 
## 196 : cafe_count_1500_price_1000 140 : office_count_500  -  0.8320871 
## 197 : cafe_count_1500_price_1500 140 : office_count_500  -  0.8105401 
## 198 : cafe_count_1500_price_2500 140 : office_count_500  -  0.8195112 
## 204 : leisure_count_1500 140 : office_count_500  -  0.8029024 
## 209 : office_count_2000 140 : office_count_500  -  0.8682996 
## 213 : cafe_count_2000 140 : office_count_500  -  0.8258813 
## 217 : cafe_count_2000_na_price 140 : office_count_500  -  0.8198381 
## 218 : cafe_count_2000_price_500 140 : office_count_500  -  0.8279383 
## 219 : cafe_count_2000_price_1000 140 : office_count_500  -  0.8252793 
## 220 : cafe_count_2000_price_1500 140 : office_count_500  -  0.8198835 
## 221 : cafe_count_2000_price_2500 140 : office_count_500  -  0.8220631 
## 232 : office_count_3000 140 : office_count_500  -  0.8485835 
## 236 : cafe_count_3000 140 : office_count_500  -  0.8462733 
## 240 : cafe_count_3000_na_price 140 : office_count_500  -  0.8397499 
## 241 : cafe_count_3000_price_500 140 : office_count_500  -  0.8452698 
## 242 : cafe_count_3000_price_1000 140 : office_count_500  -  0.8453596 
## 243 : cafe_count_3000_price_1500 140 : office_count_500  -  0.8416548 
## 244 : cafe_count_3000_price_2500 140 : office_count_500  -  0.8452668 
## 245 : cafe_count_3000_price_4000 140 : office_count_500  -  0.8253674 
## 246 : cafe_count_3000_price_high 140 : office_count_500  -  0.8137221 
## 247 : big_church_count_3000 140 : office_count_500  -  0.8288707 
## 248 : church_count_3000 140 : office_count_500  -  0.8347721 
## 250 : leisure_count_3000 140 : office_count_500  -  0.8182738 
## 255 : office_count_5000 140 : office_count_500  -  0.827775 
## 259 : cafe_count_5000 140 : office_count_500  -  0.8337217 
## 263 : cafe_count_5000_na_price 140 : office_count_500  -  0.8292816 
## 264 : cafe_count_5000_price_500 140 : office_count_500  -  0.8304029 
## 265 : cafe_count_5000_price_1000 140 : office_count_500  -  0.8253399 
## 266 : cafe_count_5000_price_1500 140 : office_count_500  -  0.8344741 
## 267 : cafe_count_5000_price_2500 140 : office_count_500  -  0.8341491 
## 268 : cafe_count_5000_price_4000 140 : office_count_500  -  0.8276794 
## 269 : cafe_count_5000_price_high 140 : office_count_500  -  0.806576 
## 270 : big_church_count_5000 140 : office_count_500  -  0.8183887 
## 271 : church_count_5000 140 : office_count_500  -  0.8223785 
## 273 : leisure_count_5000 140 : office_count_500  -  0.833665 
## 148 : cafe_count_500_na_price 144 : cafe_count_500  -  0.9185137 
## 149 : cafe_count_500_price_500 144 : cafe_count_500  -  0.9714648 
## 150 : cafe_count_500_price_1000 144 : cafe_count_500  -  0.908954 
## 151 : cafe_count_500_price_1500 144 : cafe_count_500  -  0.9517908 
## 152 : cafe_count_500_price_2500 144 : cafe_count_500  -  0.9549935 
## 153 : cafe_count_500_price_4000 144 : cafe_count_500  -  0.8890998 
## 155 : big_church_count_500 144 : cafe_count_500  -  0.8740093 
## 156 : church_count_500 144 : cafe_count_500  -  0.8776271 
## 163 : office_count_1000 144 : cafe_count_500  -  0.8920446 
## 167 : cafe_count_1000 144 : cafe_count_500  -  0.9703329 
## 171 : cafe_count_1000_na_price 144 : cafe_count_500  -  0.9337166 
## 172 : cafe_count_1000_price_500 144 : cafe_count_500  -  0.9584628 
## 173 : cafe_count_1000_price_1000 144 : cafe_count_500  -  0.9559288 
## 174 : cafe_count_1000_price_1500 144 : cafe_count_500  -  0.9647535 
## 175 : cafe_count_1000_price_2500 144 : cafe_count_500  -  0.9555256 
## 176 : cafe_count_1000_price_4000 144 : cafe_count_500  -  0.926746 
## 178 : big_church_count_1000 144 : cafe_count_500  -  0.9059485 
## 179 : church_count_1000 144 : cafe_count_500  -  0.9137184 
## 181 : leisure_count_1000 144 : cafe_count_500  -  0.8931535 
## 186 : office_count_1500 144 : cafe_count_500  -  0.9212949 
## 190 : cafe_count_1500 144 : cafe_count_500  -  0.9636458 
## 194 : cafe_count_1500_na_price 144 : cafe_count_500  -  0.943396 
## 195 : cafe_count_1500_price_500 144 : cafe_count_500  -  0.9576486 
## 196 : cafe_count_1500_price_1000 144 : cafe_count_500  -  0.9581057 
## 197 : cafe_count_1500_price_1500 144 : cafe_count_500  -  0.9615913 
## 198 : cafe_count_1500_price_2500 144 : cafe_count_500  -  0.9561253 
## 199 : cafe_count_1500_price_4000 144 : cafe_count_500  -  0.9372227 
## 200 : cafe_count_1500_price_high 144 : cafe_count_500  -  0.8665668 
## 201 : big_church_count_1500 144 : cafe_count_500  -  0.9261266 
## 202 : church_count_1500 144 : cafe_count_500  -  0.9287109 
## 204 : leisure_count_1500 144 : cafe_count_500  -  0.9159258 
## 209 : office_count_2000 144 : cafe_count_500  -  0.9294801 
## 213 : cafe_count_2000 144 : cafe_count_500  -  0.9587632 
## 217 : cafe_count_2000_na_price 144 : cafe_count_500  -  0.9474402 
## 218 : cafe_count_2000_price_500 144 : cafe_count_500  -  0.9555287 
## 219 : cafe_count_2000_price_1000 144 : cafe_count_500  -  0.9549523 
## 220 : cafe_count_2000_price_1500 144 : cafe_count_500  -  0.9577667 
## 221 : cafe_count_2000_price_2500 144 : cafe_count_500  -  0.9541742 
## 222 : cafe_count_2000_price_4000 144 : cafe_count_500  -  0.9404796 
## 223 : cafe_count_2000_price_high 144 : cafe_count_500  -  0.8992729 
## 224 : big_church_count_2000 144 : cafe_count_500  -  0.9318314 
## 225 : church_count_2000 144 : cafe_count_500  -  0.9357344 
## 227 : leisure_count_2000 144 : cafe_count_500  -  0.9421654 
## 232 : office_count_3000 144 : cafe_count_500  -  0.9182275 
## 236 : cafe_count_3000 144 : cafe_count_500  -  0.943005 
## 240 : cafe_count_3000_na_price 144 : cafe_count_500  -  0.9324118 
## 241 : cafe_count_3000_price_500 144 : cafe_count_500  -  0.940776 
## 242 : cafe_count_3000_price_1000 144 : cafe_count_500  -  0.9373328 
## 243 : cafe_count_3000_price_1500 144 : cafe_count_500  -  0.9438246 
## 244 : cafe_count_3000_price_2500 144 : cafe_count_500  -  0.9396974 
## 245 : cafe_count_3000_price_4000 144 : cafe_count_500  -  0.9332402 
## 246 : cafe_count_3000_price_high 144 : cafe_count_500  -  0.8718141 
## 247 : big_church_count_3000 144 : cafe_count_500  -  0.9159697 
## 248 : church_count_3000 144 : cafe_count_500  -  0.9271502 
## 250 : leisure_count_3000 144 : cafe_count_500  -  0.9433253 
## 255 : office_count_5000 144 : cafe_count_500  -  0.8228532 
## 259 : cafe_count_5000 144 : cafe_count_500  -  0.8371211 
## 263 : cafe_count_5000_na_price 144 : cafe_count_500  -  0.8341456 
## 264 : cafe_count_5000_price_500 144 : cafe_count_500  -  0.8318859 
## 265 : cafe_count_5000_price_1000 144 : cafe_count_500  -  0.8279225 
## 266 : cafe_count_5000_price_1500 144 : cafe_count_500  -  0.8403713 
## 267 : cafe_count_5000_price_2500 144 : cafe_count_500  -  0.837579 
## 268 : cafe_count_5000_price_4000 144 : cafe_count_500  -  0.8305442 
## 269 : cafe_count_5000_price_high 144 : cafe_count_500  -  0.8083699 
## 270 : big_church_count_5000 144 : cafe_count_500  -  0.8287117 
## 271 : church_count_5000 144 : cafe_count_500  -  0.8330109 
## 273 : leisure_count_5000 144 : cafe_count_500  -  0.8396641 
## 149 : cafe_count_500_price_500 148 : cafe_count_500_na_price  -  0.8859398 
## 151 : cafe_count_500_price_1500 148 : cafe_count_500_na_price  -  0.8375786 
## 152 : cafe_count_500_price_2500 148 : cafe_count_500_na_price  -  0.9140325 
## 153 : cafe_count_500_price_4000 148 : cafe_count_500_na_price  -  0.8327365 
## 155 : big_church_count_500 148 : cafe_count_500_na_price  -  0.880291 
## 156 : church_count_500 148 : cafe_count_500_na_price  -  0.8993646 
## 167 : cafe_count_1000 148 : cafe_count_500_na_price  -  0.919662 
## 171 : cafe_count_1000_na_price 148 : cafe_count_500_na_price  -  0.9307944 
## 172 : cafe_count_1000_price_500 148 : cafe_count_500_na_price  -  0.9237071 
## 173 : cafe_count_1000_price_1000 148 : cafe_count_500_na_price  -  0.858112 
## 174 : cafe_count_1000_price_1500 148 : cafe_count_500_na_price  -  0.9028713 
## 175 : cafe_count_1000_price_2500 148 : cafe_count_500_na_price  -  0.9166372 
## 176 : cafe_count_1000_price_4000 148 : cafe_count_500_na_price  -  0.9174714 
## 178 : big_church_count_1000 148 : cafe_count_500_na_price  -  0.8772401 
## 179 : church_count_1000 148 : cafe_count_500_na_price  -  0.9082621 
## 181 : leisure_count_1000 148 : cafe_count_500_na_price  -  0.831752 
## 186 : office_count_1500 148 : cafe_count_500_na_price  -  0.8295955 
## 190 : cafe_count_1500 148 : cafe_count_500_na_price  -  0.912204 
## 194 : cafe_count_1500_na_price 148 : cafe_count_500_na_price  -  0.9100783 
## 195 : cafe_count_1500_price_500 148 : cafe_count_500_na_price  -  0.9106269 
## 196 : cafe_count_1500_price_1000 148 : cafe_count_500_na_price  -  0.8900266 
## 197 : cafe_count_1500_price_1500 148 : cafe_count_500_na_price  -  0.914772 
## 198 : cafe_count_1500_price_2500 148 : cafe_count_500_na_price  -  0.8996153 
## 199 : cafe_count_1500_price_4000 148 : cafe_count_500_na_price  -  0.9111969 
## 201 : big_church_count_1500 148 : cafe_count_500_na_price  -  0.9162601 
## 202 : church_count_1500 148 : cafe_count_500_na_price  -  0.9103259 
## 204 : leisure_count_1500 148 : cafe_count_500_na_price  -  0.8445263 
## 209 : office_count_2000 148 : cafe_count_500_na_price  -  0.853791 
## 213 : cafe_count_2000 148 : cafe_count_500_na_price  -  0.9051879 
## 217 : cafe_count_2000_na_price 148 : cafe_count_500_na_price  -  0.9058029 
## 218 : cafe_count_2000_price_500 148 : cafe_count_500_na_price  -  0.8990162 
## 219 : cafe_count_2000_price_1000 148 : cafe_count_500_na_price  -  0.8975899 
## 220 : cafe_count_2000_price_1500 148 : cafe_count_500_na_price  -  0.9071378 
## 221 : cafe_count_2000_price_2500 148 : cafe_count_500_na_price  -  0.8994699 
## 222 : cafe_count_2000_price_4000 148 : cafe_count_500_na_price  -  0.898283 
## 223 : cafe_count_2000_price_high 148 : cafe_count_500_na_price  -  0.8381811 
## 224 : big_church_count_2000 148 : cafe_count_500_na_price  -  0.913102 
## 225 : church_count_2000 148 : cafe_count_500_na_price  -  0.9064063 
## 227 : leisure_count_2000 148 : cafe_count_500_na_price  -  0.9010406 
## 232 : office_count_3000 148 : cafe_count_500_na_price  -  0.8476347 
## 236 : cafe_count_3000 148 : cafe_count_500_na_price  -  0.8745048 
## 240 : cafe_count_3000_na_price 148 : cafe_count_500_na_price  -  0.8725883 
## 241 : cafe_count_3000_price_500 148 : cafe_count_500_na_price  -  0.8722197 
## 242 : cafe_count_3000_price_1000 148 : cafe_count_500_na_price  -  0.8635911 
## 243 : cafe_count_3000_price_1500 148 : cafe_count_500_na_price  -  0.8786532 
## 244 : cafe_count_3000_price_2500 148 : cafe_count_500_na_price  -  0.8694385 
## 245 : cafe_count_3000_price_4000 148 : cafe_count_500_na_price  -  0.8749969 
## 247 : big_church_count_3000 148 : cafe_count_500_na_price  -  0.8599573 
## 248 : church_count_3000 148 : cafe_count_500_na_price  -  0.8682741 
## 250 : leisure_count_3000 148 : cafe_count_500_na_price  -  0.8919372 
## 150 : cafe_count_500_price_1000 149 : cafe_count_500_price_500  -  0.8620258 
## 151 : cafe_count_500_price_1500 149 : cafe_count_500_price_500  -  0.8966666 
## 152 : cafe_count_500_price_2500 149 : cafe_count_500_price_500  -  0.9125086 
## 153 : cafe_count_500_price_4000 149 : cafe_count_500_price_500  -  0.8390339 
## 155 : big_church_count_500 149 : cafe_count_500_price_500  -  0.864108 
## 156 : church_count_500 149 : cafe_count_500_price_500  -  0.865019 
## 163 : office_count_1000 149 : cafe_count_500_price_500  -  0.8632321 
## 167 : cafe_count_1000 149 : cafe_count_500_price_500  -  0.9424218 
## 171 : cafe_count_1000_na_price 149 : cafe_count_500_price_500  -  0.8996402 
## 172 : cafe_count_1000_price_500 149 : cafe_count_500_price_500  -  0.9451709 
## 173 : cafe_count_1000_price_1000 149 : cafe_count_500_price_500  -  0.9214143 
## 174 : cafe_count_1000_price_1500 149 : cafe_count_500_price_500  -  0.9305515 
## 175 : cafe_count_1000_price_2500 149 : cafe_count_500_price_500  -  0.9243111 
## 176 : cafe_count_1000_price_4000 149 : cafe_count_500_price_500  -  0.8985664 
## 178 : big_church_count_1000 149 : cafe_count_500_price_500  -  0.8815189 
## 179 : church_count_1000 149 : cafe_count_500_price_500  -  0.8932627 
## 181 : leisure_count_1000 149 : cafe_count_500_price_500  -  0.8632824 
## 186 : office_count_1500 149 : cafe_count_500_price_500  -  0.889292 
## 190 : cafe_count_1500 149 : cafe_count_500_price_500  -  0.9353105 
## 194 : cafe_count_1500_na_price 149 : cafe_count_500_price_500  -  0.9126353 
## 195 : cafe_count_1500_price_500 149 : cafe_count_500_price_500  -  0.9371256 
## 196 : cafe_count_1500_price_1000 149 : cafe_count_500_price_500  -  0.9290613 
## 197 : cafe_count_1500_price_1500 149 : cafe_count_500_price_500  -  0.9302446 
## 198 : cafe_count_1500_price_2500 149 : cafe_count_500_price_500  -  0.9243487 
## 199 : cafe_count_1500_price_4000 149 : cafe_count_500_price_500  -  0.9071517 
## 200 : cafe_count_1500_price_high 149 : cafe_count_500_price_500  -  0.8276974 
## 201 : big_church_count_1500 149 : cafe_count_500_price_500  -  0.8984347 
## 202 : church_count_1500 149 : cafe_count_500_price_500  -  0.9035595 
## 204 : leisure_count_1500 149 : cafe_count_500_price_500  -  0.8811899 
## 209 : office_count_2000 149 : cafe_count_500_price_500  -  0.8985675 
## 213 : cafe_count_2000 149 : cafe_count_500_price_500  -  0.9296565 
## 217 : cafe_count_2000_na_price 149 : cafe_count_500_price_500  -  0.9177813 
## 218 : cafe_count_2000_price_500 149 : cafe_count_500_price_500  -  0.9326819 
## 219 : cafe_count_2000_price_1000 149 : cafe_count_500_price_500  -  0.9259668 
## 220 : cafe_count_2000_price_1500 149 : cafe_count_500_price_500  -  0.9256406 
## 221 : cafe_count_2000_price_2500 149 : cafe_count_500_price_500  -  0.9225611 
## 222 : cafe_count_2000_price_4000 149 : cafe_count_500_price_500  -  0.9078011 
## 223 : cafe_count_2000_price_high 149 : cafe_count_500_price_500  -  0.8653329 
## 224 : big_church_count_2000 149 : cafe_count_500_price_500  -  0.9019691 
## 225 : church_count_2000 149 : cafe_count_500_price_500  -  0.9084701 
## 227 : leisure_count_2000 149 : cafe_count_500_price_500  -  0.9123953 
## 232 : office_count_3000 149 : cafe_count_500_price_500  -  0.8850233 
## 236 : cafe_count_3000 149 : cafe_count_500_price_500  -  0.9109703 
## 240 : cafe_count_3000_na_price 149 : cafe_count_500_price_500  -  0.9002485 
## 241 : cafe_count_3000_price_500 149 : cafe_count_500_price_500  -  0.9126065 
## 242 : cafe_count_3000_price_1000 149 : cafe_count_500_price_500  -  0.9049855 
## 243 : cafe_count_3000_price_1500 149 : cafe_count_500_price_500  -  0.9095107 
## 244 : cafe_count_3000_price_2500 149 : cafe_count_500_price_500  -  0.9067486 
## 245 : cafe_count_3000_price_4000 149 : cafe_count_500_price_500  -  0.9006524 
## 246 : cafe_count_3000_price_high 149 : cafe_count_500_price_500  -  0.8381258 
## 247 : big_church_count_3000 149 : cafe_count_500_price_500  -  0.8807376 
## 248 : church_count_3000 149 : cafe_count_500_price_500  -  0.8952679 
## 250 : leisure_count_3000 149 : cafe_count_500_price_500  -  0.9121857 
## 266 : cafe_count_5000_price_1500 149 : cafe_count_500_price_500  -  0.800361 
## 273 : leisure_count_5000 149 : cafe_count_500_price_500  -  0.8010761 
## 151 : cafe_count_500_price_1500 150 : cafe_count_500_price_1000  -  0.8669442 
## 163 : office_count_1000 150 : cafe_count_500_price_1000  -  0.8183388 
## 167 : cafe_count_1000 150 : cafe_count_500_price_1000  -  0.8320624 
## 172 : cafe_count_1000_price_500 150 : cafe_count_500_price_1000  -  0.8047071 
## 173 : cafe_count_1000_price_1000 150 : cafe_count_500_price_1000  -  0.8814988 
## 174 : cafe_count_1000_price_1500 150 : cafe_count_500_price_1000  -  0.833027 
## 186 : office_count_1500 150 : cafe_count_500_price_1000  -  0.8297283 
## 190 : cafe_count_1500 150 : cafe_count_500_price_1000  -  0.8239122 
## 194 : cafe_count_1500_na_price 150 : cafe_count_500_price_1000  -  0.803339 
## 195 : cafe_count_1500_price_500 150 : cafe_count_500_price_1000  -  0.8148494 
## 196 : cafe_count_1500_price_1000 150 : cafe_count_500_price_1000  -  0.8408963 
## 197 : cafe_count_1500_price_1500 150 : cafe_count_500_price_1000  -  0.8176331 
## 198 : cafe_count_1500_price_2500 150 : cafe_count_500_price_1000  -  0.8155959 
## 204 : leisure_count_1500 150 : cafe_count_500_price_1000  -  0.8012451 
## 209 : office_count_2000 150 : cafe_count_500_price_1000  -  0.8228517 
## 213 : cafe_count_2000 150 : cafe_count_500_price_1000  -  0.8216951 
## 217 : cafe_count_2000_na_price 150 : cafe_count_500_price_1000  -  0.809221 
## 218 : cafe_count_2000_price_500 150 : cafe_count_500_price_1000  -  0.8212056 
## 219 : cafe_count_2000_price_1000 150 : cafe_count_500_price_1000  -  0.8272502 
## 220 : cafe_count_2000_price_1500 150 : cafe_count_500_price_1000  -  0.8179767 
## 221 : cafe_count_2000_price_2500 150 : cafe_count_500_price_1000  -  0.8142091 
## 232 : office_count_3000 150 : cafe_count_500_price_1000  -  0.8109646 
## 236 : cafe_count_3000 150 : cafe_count_500_price_1000  -  0.8240754 
## 240 : cafe_count_3000_na_price 150 : cafe_count_500_price_1000  -  0.811883 
## 241 : cafe_count_3000_price_500 150 : cafe_count_500_price_1000  -  0.8230619 
## 242 : cafe_count_3000_price_1000 150 : cafe_count_500_price_1000  -  0.828028 
## 243 : cafe_count_3000_price_1500 150 : cafe_count_500_price_1000  -  0.8214081 
## 244 : cafe_count_3000_price_2500 150 : cafe_count_500_price_1000  -  0.8184331 
## 247 : big_church_count_3000 150 : cafe_count_500_price_1000  -  0.801572 
## 248 : church_count_3000 150 : cafe_count_500_price_1000  -  0.8096583 
## 250 : leisure_count_3000 150 : cafe_count_500_price_1000  -  0.8068485 
## 152 : cafe_count_500_price_2500 151 : cafe_count_500_price_1500  -  0.878752 
## 153 : cafe_count_500_price_4000 151 : cafe_count_500_price_1500  -  0.8190513 
## 163 : office_count_1000 151 : cafe_count_500_price_1500  -  0.8728889 
## 167 : cafe_count_1000 151 : cafe_count_500_price_1500  -  0.9127469 
## 171 : cafe_count_1000_na_price 151 : cafe_count_500_price_1500  -  0.8773959 
## 172 : cafe_count_1000_price_500 151 : cafe_count_500_price_1500  -  0.8886336 
## 173 : cafe_count_1000_price_1000 151 : cafe_count_500_price_1500  -  0.9124619 
## 174 : cafe_count_1000_price_1500 151 : cafe_count_500_price_1500  -  0.927755 
## 175 : cafe_count_1000_price_2500 151 : cafe_count_500_price_1500  -  0.8897831 
## 176 : cafe_count_1000_price_4000 151 : cafe_count_500_price_1500  -  0.8468049 
## 178 : big_church_count_1000 151 : cafe_count_500_price_1500  -  0.8532603 
## 179 : church_count_1000 151 : cafe_count_500_price_1500  -  0.845743 
## 181 : leisure_count_1000 151 : cafe_count_500_price_1500  -  0.8426245 
## 186 : office_count_1500 151 : cafe_count_500_price_1500  -  0.8912009 
## 190 : cafe_count_1500 151 : cafe_count_500_price_1500  -  0.9094764 
## 194 : cafe_count_1500_na_price 151 : cafe_count_500_price_1500  -  0.8949081 
## 195 : cafe_count_1500_price_500 151 : cafe_count_500_price_1500  -  0.8983814 
## 196 : cafe_count_1500_price_1000 151 : cafe_count_500_price_1500  -  0.908361 
## 197 : cafe_count_1500_price_1500 151 : cafe_count_500_price_1500  -  0.9126251 
## 198 : cafe_count_1500_price_2500 151 : cafe_count_500_price_1500  -  0.9018477 
## 199 : cafe_count_1500_price_4000 151 : cafe_count_500_price_1500  -  0.8691084 
## 200 : cafe_count_1500_price_high 151 : cafe_count_500_price_1500  -  0.823904 
## 201 : big_church_count_1500 151 : cafe_count_500_price_1500  -  0.8643597 
## 202 : church_count_1500 151 : cafe_count_500_price_1500  -  0.8667156 
## 204 : leisure_count_1500 151 : cafe_count_500_price_1500  -  0.8703096 
## 209 : office_count_2000 151 : cafe_count_500_price_1500  -  0.8907332 
## 213 : cafe_count_2000 151 : cafe_count_500_price_1500  -  0.9065137 
## 217 : cafe_count_2000_na_price 151 : cafe_count_500_price_1500  -  0.8961402 
## 218 : cafe_count_2000_price_500 151 : cafe_count_500_price_1500  -  0.9011632 
## 219 : cafe_count_2000_price_1000 151 : cafe_count_500_price_1500  -  0.9034424 
## 220 : cafe_count_2000_price_1500 151 : cafe_count_500_price_1500  -  0.9109614 
## 221 : cafe_count_2000_price_2500 151 : cafe_count_500_price_1500  -  0.8993626 
## 222 : cafe_count_2000_price_4000 151 : cafe_count_500_price_1500  -  0.8815426 
## 223 : cafe_count_2000_price_high 151 : cafe_count_500_price_1500  -  0.8468216 
## 224 : big_church_count_2000 151 : cafe_count_500_price_1500  -  0.8757832 
## 225 : church_count_2000 151 : cafe_count_500_price_1500  -  0.8783944 
## 227 : leisure_count_2000 151 : cafe_count_500_price_1500  -  0.8821178 
## 232 : office_count_3000 151 : cafe_count_500_price_1500  -  0.880196 
## 236 : cafe_count_3000 151 : cafe_count_500_price_1500  -  0.8994439 
## 240 : cafe_count_3000_na_price 151 : cafe_count_500_price_1500  -  0.8882403 
## 241 : cafe_count_3000_price_500 151 : cafe_count_500_price_1500  -  0.8949331 
## 242 : cafe_count_3000_price_1000 151 : cafe_count_500_price_1500  -  0.8969195 
## 243 : cafe_count_3000_price_1500 151 : cafe_count_500_price_1500  -  0.9034465 
## 244 : cafe_count_3000_price_2500 151 : cafe_count_500_price_1500  -  0.8937993 
## 245 : cafe_count_3000_price_4000 151 : cafe_count_500_price_1500  -  0.881989 
## 246 : cafe_count_3000_price_high 151 : cafe_count_500_price_1500  -  0.8325294 
## 247 : big_church_count_3000 151 : cafe_count_500_price_1500  -  0.8810127 
## 248 : church_count_3000 151 : cafe_count_500_price_1500  -  0.8866283 
## 250 : leisure_count_3000 151 : cafe_count_500_price_1500  -  0.888997 
## 255 : office_count_5000 151 : cafe_count_500_price_1500  -  0.806071 
## 259 : cafe_count_5000 151 : cafe_count_500_price_1500  -  0.820443 
## 263 : cafe_count_5000_na_price 151 : cafe_count_500_price_1500  -  0.8169245 
## 264 : cafe_count_5000_price_500 151 : cafe_count_500_price_1500  -  0.8146684 
## 265 : cafe_count_5000_price_1000 151 : cafe_count_500_price_1500  -  0.8126567 
## 266 : cafe_count_5000_price_1500 151 : cafe_count_500_price_1500  -  0.8256707 
## 267 : cafe_count_5000_price_2500 151 : cafe_count_500_price_1500  -  0.8191123 
## 268 : cafe_count_5000_price_4000 151 : cafe_count_500_price_1500  -  0.8096334 
## 270 : big_church_count_5000 151 : cafe_count_500_price_1500  -  0.814967 
## 271 : church_count_5000 151 : cafe_count_500_price_1500  -  0.8178462 
## 273 : leisure_count_5000 151 : cafe_count_500_price_1500  -  0.8188285 
## 153 : cafe_count_500_price_4000 152 : cafe_count_500_price_2500  -  0.8986787 
## 155 : big_church_count_500 152 : cafe_count_500_price_2500  -  0.8871733 
## 156 : church_count_500 152 : cafe_count_500_price_2500  -  0.8996489 
## 163 : office_count_1000 152 : cafe_count_500_price_2500  -  0.8517854 
## 167 : cafe_count_1000 152 : cafe_count_500_price_2500  -  0.9607362 
## 171 : cafe_count_1000_na_price 152 : cafe_count_500_price_2500  -  0.9243558 
## 172 : cafe_count_1000_price_500 152 : cafe_count_500_price_2500  -  0.9529872 
## 173 : cafe_count_1000_price_1000 152 : cafe_count_500_price_2500  -  0.9180079 
## 174 : cafe_count_1000_price_1500 152 : cafe_count_500_price_2500  -  0.9464361 
## 175 : cafe_count_1000_price_2500 152 : cafe_count_500_price_2500  -  0.9692573 
## 176 : cafe_count_1000_price_4000 152 : cafe_count_500_price_2500  -  0.9515904 
## 178 : big_church_count_1000 152 : cafe_count_500_price_2500  -  0.8962071 
## 179 : church_count_1000 152 : cafe_count_500_price_2500  -  0.9210145 
## 181 : leisure_count_1000 152 : cafe_count_500_price_2500  -  0.8885922 
## 186 : office_count_1500 152 : cafe_count_500_price_2500  -  0.889136 
## 190 : cafe_count_1500 152 : cafe_count_500_price_2500  -  0.9543437 
## 194 : cafe_count_1500_na_price 152 : cafe_count_500_price_2500  -  0.9287337 
## 195 : cafe_count_1500_price_500 152 : cafe_count_500_price_2500  -  0.9477123 
## 196 : cafe_count_1500_price_1000 152 : cafe_count_500_price_2500  -  0.9385676 
## 197 : cafe_count_1500_price_1500 152 : cafe_count_500_price_2500  -  0.9531868 
## 198 : cafe_count_1500_price_2500 152 : cafe_count_500_price_2500  -  0.9538945 
## 199 : cafe_count_1500_price_4000 152 : cafe_count_500_price_2500  -  0.9515806 
## 200 : cafe_count_1500_price_high 152 : cafe_count_500_price_2500  -  0.8633392 
## 201 : big_church_count_1500 152 : cafe_count_500_price_2500  -  0.9341817 
## 202 : church_count_1500 152 : cafe_count_500_price_2500  -  0.930724 
## 204 : leisure_count_1500 152 : cafe_count_500_price_2500  -  0.9043814 
## 209 : office_count_2000 152 : cafe_count_500_price_2500  -  0.9056259 
## 213 : cafe_count_2000 152 : cafe_count_500_price_2500  -  0.9484546 
## 217 : cafe_count_2000_na_price 152 : cafe_count_500_price_2500  -  0.9342188 
## 218 : cafe_count_2000_price_500 152 : cafe_count_500_price_2500  -  0.9411445 
## 219 : cafe_count_2000_price_1000 152 : cafe_count_500_price_2500  -  0.9406802 
## 220 : cafe_count_2000_price_1500 152 : cafe_count_500_price_2500  -  0.9477272 
## 221 : cafe_count_2000_price_2500 152 : cafe_count_500_price_2500  -  0.9510131 
## 222 : cafe_count_2000_price_4000 152 : cafe_count_500_price_2500  -  0.946432 
## 223 : cafe_count_2000_price_high 152 : cafe_count_500_price_2500  -  0.9002583 
## 224 : big_church_count_2000 152 : cafe_count_500_price_2500  -  0.9336576 
## 225 : church_count_2000 152 : cafe_count_500_price_2500  -  0.9338978 
## 227 : leisure_count_2000 152 : cafe_count_500_price_2500  -  0.9422772 
## 232 : office_count_3000 152 : cafe_count_500_price_2500  -  0.8960488 
## 236 : cafe_count_3000 152 : cafe_count_500_price_2500  -  0.9255191 
## 240 : cafe_count_3000_na_price 152 : cafe_count_500_price_2500  -  0.9134298 
## 241 : cafe_count_3000_price_500 152 : cafe_count_500_price_2500  -  0.920978 
## 242 : cafe_count_3000_price_1000 152 : cafe_count_500_price_2500  -  0.915021 
## 243 : cafe_count_3000_price_1500 152 : cafe_count_500_price_2500  -  0.9279487 
## 244 : cafe_count_3000_price_2500 152 : cafe_count_500_price_2500  -  0.9271313 
## 245 : cafe_count_3000_price_4000 152 : cafe_count_500_price_2500  -  0.9291127 
## 246 : cafe_count_3000_price_high 152 : cafe_count_500_price_2500  -  0.8572905 
## 247 : big_church_count_3000 152 : cafe_count_500_price_2500  -  0.8954832 
## 248 : church_count_3000 152 : cafe_count_500_price_2500  -  0.9085131 
## 250 : leisure_count_3000 152 : cafe_count_500_price_2500  -  0.9381747 
## 266 : cafe_count_5000_price_1500 152 : cafe_count_500_price_2500  -  0.8031605 
## 267 : cafe_count_5000_price_2500 152 : cafe_count_500_price_2500  -  0.8046978 
## 268 : cafe_count_5000_price_4000 152 : cafe_count_500_price_2500  -  0.8013134 
## 273 : leisure_count_5000 152 : cafe_count_500_price_2500  -  0.8104686 
## 155 : big_church_count_500 153 : cafe_count_500_price_4000  -  0.8023277 
## 156 : church_count_500 153 : cafe_count_500_price_4000  -  0.8082072 
## 167 : cafe_count_1000 153 : cafe_count_500_price_4000  -  0.8910738 
## 171 : cafe_count_1000_na_price 153 : cafe_count_500_price_4000  -  0.8560592 
## 172 : cafe_count_1000_price_500 153 : cafe_count_500_price_4000  -  0.8735182 
## 173 : cafe_count_1000_price_1000 153 : cafe_count_500_price_4000  -  0.8529169 
## 174 : cafe_count_1000_price_1500 153 : cafe_count_500_price_4000  -  0.8778342 
## 175 : cafe_count_1000_price_2500 153 : cafe_count_500_price_4000  -  0.8955504 
## 176 : cafe_count_1000_price_4000 153 : cafe_count_500_price_4000  -  0.9162088 
## 178 : big_church_count_1000 153 : cafe_count_500_price_4000  -  0.8267801 
## 179 : church_count_1000 153 : cafe_count_500_price_4000  -  0.8371198 
## 181 : leisure_count_1000 153 : cafe_count_500_price_4000  -  0.8395142 
## 186 : office_count_1500 153 : cafe_count_500_price_4000  -  0.8232739 
## 190 : cafe_count_1500 153 : cafe_count_500_price_4000  -  0.8843049 
## 194 : cafe_count_1500_na_price 153 : cafe_count_500_price_4000  -  0.8636972 
## 195 : cafe_count_1500_price_500 153 : cafe_count_500_price_4000  -  0.8716266 
## 196 : cafe_count_1500_price_1000 153 : cafe_count_500_price_4000  -  0.8663045 
## 197 : cafe_count_1500_price_1500 153 : cafe_count_500_price_4000  -  0.8813289 
## 198 : cafe_count_1500_price_2500 153 : cafe_count_500_price_4000  -  0.8887646 
## 199 : cafe_count_1500_price_4000 153 : cafe_count_500_price_4000  -  0.9065852 
## 200 : cafe_count_1500_price_high 153 : cafe_count_500_price_4000  -  0.8346288 
## 201 : big_church_count_1500 153 : cafe_count_500_price_4000  -  0.8509347 
## 202 : church_count_1500 153 : cafe_count_500_price_4000  -  0.8498476 
## 204 : leisure_count_1500 153 : cafe_count_500_price_4000  -  0.8503482 
## 209 : office_count_2000 153 : cafe_count_500_price_4000  -  0.8355759 
## 213 : cafe_count_2000 153 : cafe_count_500_price_4000  -  0.8791109 
## 217 : cafe_count_2000_na_price 153 : cafe_count_500_price_4000  -  0.870059 
## 218 : cafe_count_2000_price_500 153 : cafe_count_500_price_4000  -  0.8695852 
## 219 : cafe_count_2000_price_1000 153 : cafe_count_500_price_4000  -  0.8669006 
## 220 : cafe_count_2000_price_1500 153 : cafe_count_500_price_4000  -  0.8769128 
## 221 : cafe_count_2000_price_2500 153 : cafe_count_500_price_4000  -  0.8857319 
## 222 : cafe_count_2000_price_4000 153 : cafe_count_500_price_4000  -  0.8970001 
## 223 : cafe_count_2000_price_high 153 : cafe_count_500_price_4000  -  0.8526013 
## 224 : big_church_count_2000 153 : cafe_count_500_price_4000  -  0.8514112 
## 225 : church_count_2000 153 : cafe_count_500_price_4000  -  0.8539197 
## 227 : leisure_count_2000 153 : cafe_count_500_price_4000  -  0.8806274 
## 232 : office_count_3000 153 : cafe_count_500_price_4000  -  0.8275257 
## 236 : cafe_count_3000 153 : cafe_count_500_price_4000  -  0.8560537 
## 240 : cafe_count_3000_na_price 153 : cafe_count_500_price_4000  -  0.8519764 
## 241 : cafe_count_3000_price_500 153 : cafe_count_500_price_4000  -  0.8506405 
## 242 : cafe_count_3000_price_1000 153 : cafe_count_500_price_4000  -  0.8425018 
## 243 : cafe_count_3000_price_1500 153 : cafe_count_500_price_4000  -  0.8559581 
## 244 : cafe_count_3000_price_2500 153 : cafe_count_500_price_4000  -  0.8616974 
## 245 : cafe_count_3000_price_4000 153 : cafe_count_500_price_4000  -  0.8694341 
## 246 : cafe_count_3000_price_high 153 : cafe_count_500_price_4000  -  0.8107402 
## 247 : big_church_count_3000 153 : cafe_count_500_price_4000  -  0.8224663 
## 248 : church_count_3000 153 : cafe_count_500_price_4000  -  0.8352343 
## 250 : leisure_count_3000 153 : cafe_count_500_price_4000  -  0.871109 
## 176 : cafe_count_1000_price_4000 154 : cafe_count_500_price_high  -  0.8092707 
## 199 : cafe_count_1500_price_4000 154 : cafe_count_500_price_high  -  0.8153263 
## 200 : cafe_count_1500_price_high 154 : cafe_count_500_price_high  -  0.8031867 
## 221 : cafe_count_2000_price_2500 154 : cafe_count_500_price_high  -  0.8026811 
## 222 : cafe_count_2000_price_4000 154 : cafe_count_500_price_high  -  0.8130193 
## 223 : cafe_count_2000_price_high 154 : cafe_count_500_price_high  -  0.8107273 
## 156 : church_count_500 155 : big_church_count_500  -  0.9480427 
## 167 : cafe_count_1000 155 : big_church_count_500  -  0.9106421 
## 171 : cafe_count_1000_na_price 155 : big_church_count_500  -  0.8626004 
## 172 : cafe_count_1000_price_500 155 : big_church_count_500  -  0.9214133 
## 173 : cafe_count_1000_price_1000 155 : big_church_count_500  -  0.8495521 
## 174 : cafe_count_1000_price_1500 155 : big_church_count_500  -  0.898504 
## 175 : cafe_count_1000_price_2500 155 : big_church_count_500  -  0.9087499 
## 176 : cafe_count_1000_price_4000 155 : big_church_count_500  -  0.9190689 
## 178 : big_church_count_1000 155 : big_church_count_500  -  0.9300659 
## 179 : church_count_1000 155 : big_church_count_500  -  0.9355829 
## 181 : leisure_count_1000 155 : big_church_count_500  -  0.8433357 
## 186 : office_count_1500 155 : big_church_count_500  -  0.8260414 
## 190 : cafe_count_1500 155 : big_church_count_500  -  0.9093763 
## 194 : cafe_count_1500_na_price 155 : big_church_count_500  -  0.8800207 
## 195 : cafe_count_1500_price_500 155 : big_church_count_500  -  0.9088717 
## 196 : cafe_count_1500_price_1000 155 : big_church_count_500  -  0.8918154 
## 197 : cafe_count_1500_price_1500 155 : big_church_count_500  -  0.9145204 
## 198 : cafe_count_1500_price_2500 155 : big_church_count_500  -  0.8941195 
## 199 : cafe_count_1500_price_4000 155 : big_church_count_500  -  0.9115948 
## 201 : big_church_count_1500 155 : big_church_count_500  -  0.9386183 
## 202 : church_count_1500 155 : big_church_count_500  -  0.9261279 
## 204 : leisure_count_1500 155 : big_church_count_500  -  0.8432472 
## 209 : office_count_2000 155 : big_church_count_500  -  0.8547648 
## 213 : cafe_count_2000 155 : big_church_count_500  -  0.9046418 
## 217 : cafe_count_2000_na_price 155 : big_church_count_500  -  0.8963704 
## 218 : cafe_count_2000_price_500 155 : big_church_count_500  -  0.8994099 
## 219 : cafe_count_2000_price_1000 155 : big_church_count_500  -  0.8995281 
## 220 : cafe_count_2000_price_1500 155 : big_church_count_500  -  0.9077437 
## 221 : cafe_count_2000_price_2500 155 : big_church_count_500  -  0.8970511 
## 222 : cafe_count_2000_price_4000 155 : big_church_count_500  -  0.8956072 
## 223 : cafe_count_2000_price_high 155 : big_church_count_500  -  0.8234308 
## 224 : big_church_count_2000 155 : big_church_count_500  -  0.9284682 
## 225 : church_count_2000 155 : big_church_count_500  -  0.9203293 
## 227 : leisure_count_2000 155 : big_church_count_500  -  0.9012489 
## 232 : office_count_3000 155 : big_church_count_500  -  0.8499013 
## 236 : cafe_count_3000 155 : big_church_count_500  -  0.874377 
## 240 : cafe_count_3000_na_price 155 : big_church_count_500  -  0.8677348 
## 241 : cafe_count_3000_price_500 155 : big_church_count_500  -  0.8727271 
## 242 : cafe_count_3000_price_1000 155 : big_church_count_500  -  0.865091 
## 243 : cafe_count_3000_price_1500 155 : big_church_count_500  -  0.8803464 
## 244 : cafe_count_3000_price_2500 155 : big_church_count_500  -  0.8683262 
## 245 : cafe_count_3000_price_4000 155 : big_church_count_500  -  0.8690726 
## 247 : big_church_count_3000 155 : big_church_count_500  -  0.8707553 
## 248 : church_count_3000 155 : big_church_count_500  -  0.8768765 
## 250 : leisure_count_3000 155 : big_church_count_500  -  0.8973298 
## 167 : cafe_count_1000 156 : church_count_500  -  0.9205147 
## 171 : cafe_count_1000_na_price 156 : church_count_500  -  0.8766949 
## 172 : cafe_count_1000_price_500 156 : church_count_500  -  0.9336995 
## 173 : cafe_count_1000_price_1000 156 : church_count_500  -  0.8553632 
## 174 : cafe_count_1000_price_1500 156 : church_count_500  -  0.9033518 
## 175 : cafe_count_1000_price_2500 156 : church_count_500  -  0.9232301 
## 176 : cafe_count_1000_price_4000 156 : church_count_500  -  0.9312103 
## 178 : big_church_count_1000 156 : church_count_500  -  0.9096877 
## 179 : church_count_1000 156 : church_count_500  -  0.9620452 
## 181 : leisure_count_1000 156 : church_count_500  -  0.8536636 
## 186 : office_count_1500 156 : church_count_500  -  0.8336479 
## 190 : cafe_count_1500 156 : church_count_500  -  0.919007 
## 194 : cafe_count_1500_na_price 156 : church_count_500  -  0.8884675 
## 195 : cafe_count_1500_price_500 156 : church_count_500  -  0.9207786 
## 196 : cafe_count_1500_price_1000 156 : church_count_500  -  0.9003992 
## 197 : cafe_count_1500_price_1500 156 : church_count_500  -  0.9221776 
## 198 : cafe_count_1500_price_2500 156 : church_count_500  -  0.9050005 
## 199 : cafe_count_1500_price_4000 156 : church_count_500  -  0.9216224 
## 201 : big_church_count_1500 156 : church_count_500  -  0.9397927 
## 202 : church_count_1500 156 : church_count_500  -  0.9474281 
## 204 : leisure_count_1500 156 : church_count_500  -  0.8513485 
## 209 : office_count_2000 156 : church_count_500  -  0.8637698 
## 213 : cafe_count_2000 156 : church_count_500  -  0.9150882 
## 217 : cafe_count_2000_na_price 156 : church_count_500  -  0.9031707 
## 218 : cafe_count_2000_price_500 156 : church_count_500  -  0.9114879 
## 219 : cafe_count_2000_price_1000 156 : church_count_500  -  0.9103918 
## 220 : cafe_count_2000_price_1500 156 : church_count_500  -  0.9162972 
## 221 : cafe_count_2000_price_2500 156 : church_count_500  -  0.9085939 
## 222 : cafe_count_2000_price_4000 156 : church_count_500  -  0.9058214 
## 223 : cafe_count_2000_price_high 156 : church_count_500  -  0.8333544 
## 224 : big_church_count_2000 156 : church_count_500  -  0.9317077 
## 225 : church_count_2000 156 : church_count_500  -  0.937477 
## 227 : leisure_count_2000 156 : church_count_500  -  0.9145522 
## 232 : office_count_3000 156 : church_count_500  -  0.857701 
## 236 : cafe_count_3000 156 : church_count_500  -  0.8840873 
## 240 : cafe_count_3000_na_price 156 : church_count_500  -  0.8741909 
## 241 : cafe_count_3000_price_500 156 : church_count_500  -  0.8832287 
## 242 : cafe_count_3000_price_1000 156 : church_count_500  -  0.8733504 
## 243 : cafe_count_3000_price_1500 156 : church_count_500  -  0.8890522 
## 244 : cafe_count_3000_price_2500 156 : church_count_500  -  0.8801349 
## 245 : cafe_count_3000_price_4000 156 : church_count_500  -  0.8828148 
## 247 : big_church_count_3000 156 : church_count_500  -  0.8696538 
## 248 : church_count_3000 156 : church_count_500  -  0.8888466 
## 250 : leisure_count_3000 156 : church_count_500  -  0.9106753 
## 184 : green_part_1500 161 : green_part_1000  -  0.8862229 
## 185 : prom_part_1500 162 : prom_part_1000  -  0.9040999 
## 164 : office_sqm_1000 163 : office_count_1000  -  0.8537413 
## 167 : cafe_count_1000 163 : office_count_1000  -  0.9115821 
## 171 : cafe_count_1000_na_price 163 : office_count_1000  -  0.8699182 
## 172 : cafe_count_1000_price_500 163 : office_count_1000  -  0.8911473 
## 173 : cafe_count_1000_price_1000 163 : office_count_1000  -  0.929044 
## 174 : cafe_count_1000_price_1500 163 : office_count_1000  -  0.9139512 
## 175 : cafe_count_1000_price_2500 163 : office_count_1000  -  0.8902646 
## 176 : cafe_count_1000_price_4000 163 : office_count_1000  -  0.8244191 
## 178 : big_church_count_1000 163 : office_count_1000  -  0.858295 
## 179 : church_count_1000 163 : office_count_1000  -  0.8489141 
## 181 : leisure_count_1000 163 : office_count_1000  -  0.8612187 
## 186 : office_count_1500 163 : office_count_1000  -  0.978952 
## 187 : office_sqm_1500 163 : office_count_1000  -  0.8199768 
## 190 : cafe_count_1500 163 : office_count_1000  -  0.9215845 
## 194 : cafe_count_1500_na_price 163 : office_count_1000  -  0.9083281 
## 195 : cafe_count_1500_price_500 163 : office_count_1000  -  0.9157515 
## 196 : cafe_count_1500_price_1000 163 : office_count_1000  -  0.9295203 
## 197 : cafe_count_1500_price_1500 163 : office_count_1000  -  0.9128386 
## 198 : cafe_count_1500_price_2500 163 : office_count_1000  -  0.9184417 
## 199 : cafe_count_1500_price_4000 163 : office_count_1000  -  0.8609322 
## 200 : cafe_count_1500_price_high 163 : office_count_1000  -  0.8512393 
## 201 : big_church_count_1500 163 : office_count_1000  -  0.8627611 
## 202 : church_count_1500 163 : office_count_1000  -  0.8764377 
## 204 : leisure_count_1500 163 : office_count_1000  -  0.8952097 
## 209 : office_count_2000 163 : office_count_1000  -  0.9619405 
## 210 : office_sqm_2000 163 : office_count_1000  -  0.8343932 
## 213 : cafe_count_2000 163 : office_count_1000  -  0.9278006 
## 217 : cafe_count_2000_na_price 163 : office_count_1000  -  0.9194811 
## 218 : cafe_count_2000_price_500 163 : office_count_1000  -  0.9290703 
## 219 : cafe_count_2000_price_1000 163 : office_count_1000  -  0.9273947 
## 220 : cafe_count_2000_price_1500 163 : office_count_1000  -  0.92231 
## 221 : cafe_count_2000_price_2500 163 : office_count_1000  -  0.9227624 
## 222 : cafe_count_2000_price_4000 163 : office_count_1000  -  0.8940226 
## 223 : cafe_count_2000_price_high 163 : office_count_1000  -  0.8818487 
## 224 : big_church_count_2000 163 : office_count_1000  -  0.8822611 
## 225 : church_count_2000 163 : office_count_1000  -  0.8941062 
## 227 : leisure_count_2000 163 : office_count_1000  -  0.8928579 
## 232 : office_count_3000 163 : office_count_1000  -  0.9442157 
## 233 : office_sqm_3000 163 : office_count_1000  -  0.8636704 
## 236 : cafe_count_3000 163 : office_count_1000  -  0.9434172 
## 240 : cafe_count_3000_na_price 163 : office_count_1000  -  0.9363347 
## 241 : cafe_count_3000_price_500 163 : office_count_1000  -  0.9429556 
## 242 : cafe_count_3000_price_1000 163 : office_count_1000  -  0.9419473 
## 243 : cafe_count_3000_price_1500 163 : office_count_1000  -  0.9397258 
## 244 : cafe_count_3000_price_2500 163 : office_count_1000  -  0.9395159 
## 245 : cafe_count_3000_price_4000 163 : office_count_1000  -  0.9215833 
## 246 : cafe_count_3000_price_high 163 : office_count_1000  -  0.8953706 
## 247 : big_church_count_3000 163 : office_count_1000  -  0.9228214 
## 248 : church_count_3000 163 : office_count_1000  -  0.9298656 
## 250 : leisure_count_3000 163 : office_count_1000  -  0.9177501 
## 255 : office_count_5000 163 : office_count_1000  -  0.9066216 
## 256 : office_sqm_5000 163 : office_count_1000  -  0.8282674 
## 259 : cafe_count_5000 163 : office_count_1000  -  0.9116872 
## 263 : cafe_count_5000_na_price 163 : office_count_1000  -  0.9067088 
## 264 : cafe_count_5000_price_500 163 : office_count_1000  -  0.9088058 
## 265 : cafe_count_5000_price_1000 163 : office_count_1000  -  0.9034318 
## 266 : cafe_count_5000_price_1500 163 : office_count_1000  -  0.9127051 
## 267 : cafe_count_5000_price_2500 163 : office_count_1000  -  0.9105207 
## 268 : cafe_count_5000_price_4000 163 : office_count_1000  -  0.9018513 
## 269 : cafe_count_5000_price_high 163 : office_count_1000  -  0.8787856 
## 270 : big_church_count_5000 163 : office_count_1000  -  0.8976777 
## 271 : church_count_5000 163 : office_count_1000  -  0.9028117 
## 273 : leisure_count_5000 163 : office_count_1000  -  0.9118085 
## 186 : office_count_1500 164 : office_sqm_1000  -  0.832823 
## 187 : office_sqm_1500 164 : office_sqm_1000  -  0.9097224 
## 209 : office_count_2000 164 : office_sqm_1000  -  0.8150587 
## 210 : office_sqm_2000 164 : office_sqm_1000  -  0.8654454 
## 232 : office_count_3000 164 : office_sqm_1000  -  0.8043068 
## 233 : office_sqm_3000 164 : office_sqm_1000  -  0.8290438 
## 255 : office_count_5000 164 : office_sqm_1000  -  0.8057375 
## 259 : cafe_count_5000 164 : office_sqm_1000  -  0.8085855 
## 263 : cafe_count_5000_na_price 164 : office_sqm_1000  -  0.8048429 
## 264 : cafe_count_5000_price_500 164 : office_sqm_1000  -  0.8049656 
## 265 : cafe_count_5000_price_1000 164 : office_sqm_1000  -  0.8044592 
## 266 : cafe_count_5000_price_1500 164 : office_sqm_1000  -  0.807685 
## 267 : cafe_count_5000_price_2500 164 : office_sqm_1000  -  0.8065921 
## 273 : leisure_count_5000 164 : office_sqm_1000  -  0.8025015 
## 166 : trc_sqm_1000 165 : trc_count_1000  -  0.811356 
## 167 : cafe_count_1000 165 : trc_count_1000  -  0.809354 
## 172 : cafe_count_1000_price_500 165 : trc_count_1000  -  0.8187538 
## 174 : cafe_count_1000_price_1500 165 : trc_count_1000  -  0.8032852 
## 188 : trc_count_1500 165 : trc_count_1000  -  0.8979819 
## 195 : cafe_count_1500_price_500 165 : trc_count_1000  -  0.8005293 
## 201 : big_church_count_1500 165 : trc_count_1000  -  0.8021531 
## 211 : trc_count_2000 165 : trc_count_1000  -  0.8258123 
## 189 : trc_sqm_1500 166 : trc_sqm_1000  -  0.8321051 
## 171 : cafe_count_1000_na_price 167 : cafe_count_1000  -  0.9573588 
## 172 : cafe_count_1000_price_500 167 : cafe_count_1000  -  0.9924591 
## 173 : cafe_count_1000_price_1000 167 : cafe_count_1000  -  0.974651 
## 174 : cafe_count_1000_price_1500 167 : cafe_count_1000  -  0.9918739 
## 175 : cafe_count_1000_price_2500 167 : cafe_count_1000  -  0.989392 
## 176 : cafe_count_1000_price_4000 167 : cafe_count_1000  -  0.96547 
## 178 : big_church_count_1000 167 : cafe_count_1000  -  0.9312981 
## 179 : church_count_1000 167 : cafe_count_1000  -  0.9494137 
## 181 : leisure_count_1000 167 : cafe_count_1000  -  0.9263323 
## 186 : office_count_1500 167 : cafe_count_1000  -  0.9404748 
## 190 : cafe_count_1500 167 : cafe_count_1000  -  0.9946866 
## 194 : cafe_count_1500_na_price 167 : cafe_count_1000  -  0.9700058 
## 195 : cafe_count_1500_price_500 167 : cafe_count_1000  -  0.9905787 
## 196 : cafe_count_1500_price_1000 167 : cafe_count_1000  -  0.9863836 
## 197 : cafe_count_1500_price_1500 167 : cafe_count_1000  -  0.9919942 
## 198 : cafe_count_1500_price_2500 167 : cafe_count_1000  -  0.9865592 
## 199 : cafe_count_1500_price_4000 167 : cafe_count_1000  -  0.974476 
## 200 : cafe_count_1500_price_high 167 : cafe_count_1000  -  0.8934552 
## 201 : big_church_count_1500 167 : cafe_count_1000  -  0.9591611 
## 202 : church_count_1500 167 : cafe_count_1000  -  0.9610207 
## 204 : leisure_count_1500 167 : cafe_count_1000  -  0.941863 
## 209 : office_count_2000 167 : cafe_count_1000  -  0.9527276 
## 213 : cafe_count_2000 167 : cafe_count_1000  -  0.9889224 
## 217 : cafe_count_2000_na_price 167 : cafe_count_1000  -  0.9756328 
## 218 : cafe_count_2000_price_500 167 : cafe_count_1000  -  0.9855844 
## 219 : cafe_count_2000_price_1000 167 : cafe_count_1000  -  0.9846349 
## 220 : cafe_count_2000_price_1500 167 : cafe_count_1000  -  0.98704 
## 221 : cafe_count_2000_price_2500 167 : cafe_count_1000  -  0.9847281 
## 222 : cafe_count_2000_price_4000 167 : cafe_count_1000  -  0.975046 
## 223 : cafe_count_2000_price_high 167 : cafe_count_1000  -  0.9293816 
## 224 : big_church_count_2000 167 : cafe_count_1000  -  0.9622558 
## 225 : church_count_2000 167 : cafe_count_1000  -  0.9655528 
## 227 : leisure_count_2000 167 : cafe_count_1000  -  0.9734703 
## 232 : office_count_3000 167 : cafe_count_1000  -  0.9402386 
## 236 : cafe_count_3000 167 : cafe_count_1000  -  0.968791 
## 240 : cafe_count_3000_na_price 167 : cafe_count_1000  -  0.9573519 
## 241 : cafe_count_3000_price_500 167 : cafe_count_1000  -  0.9668404 
## 242 : cafe_count_3000_price_1000 167 : cafe_count_1000  -  0.9618162 
## 243 : cafe_count_3000_price_1500 167 : cafe_count_1000  -  0.9696145 
## 244 : cafe_count_3000_price_2500 167 : cafe_count_1000  -  0.965603 
## 245 : cafe_count_3000_price_4000 167 : cafe_count_1000  -  0.9624424 
## 246 : cafe_count_3000_price_high 167 : cafe_count_1000  -  0.8942141 
## 247 : big_church_count_3000 167 : cafe_count_1000  -  0.9367092 
## 248 : church_count_3000 167 : cafe_count_1000  -  0.950141 
## 250 : leisure_count_3000 167 : cafe_count_1000  -  0.9728691 
## 255 : office_count_5000 167 : cafe_count_1000  -  0.8332851 
## 259 : cafe_count_5000 167 : cafe_count_1000  -  0.8471639 
## 263 : cafe_count_5000_na_price 167 : cafe_count_1000  -  0.8441374 
## 264 : cafe_count_5000_price_500 167 : cafe_count_1000  -  0.8421339 
## 265 : cafe_count_5000_price_1000 167 : cafe_count_1000  -  0.8375044 
## 266 : cafe_count_5000_price_1500 167 : cafe_count_1000  -  0.8501856 
## 267 : cafe_count_5000_price_2500 167 : cafe_count_1000  -  0.847797 
## 268 : cafe_count_5000_price_4000 167 : cafe_count_1000  -  0.8412361 
## 269 : cafe_count_5000_price_high 167 : cafe_count_1000  -  0.8201062 
## 270 : big_church_count_5000 167 : cafe_count_1000  -  0.8386938 
## 271 : church_count_5000 167 : cafe_count_1000  -  0.8436491 
## 273 : leisure_count_5000 167 : cafe_count_1000  -  0.851341 
## 172 : cafe_count_1000_price_500 171 : cafe_count_1000_na_price  -  0.9460548 
## 173 : cafe_count_1000_price_1000 171 : cafe_count_1000_na_price  -  0.9206583 
## 174 : cafe_count_1000_price_1500 171 : cafe_count_1000_na_price  -  0.9457029 
## 175 : cafe_count_1000_price_2500 171 : cafe_count_1000_na_price  -  0.9437295 
## 176 : cafe_count_1000_price_4000 171 : cafe_count_1000_na_price  -  0.9198348 
## 178 : big_church_count_1000 171 : cafe_count_1000_na_price  -  0.8988509 
## 179 : church_count_1000 171 : cafe_count_1000_na_price  -  0.9118015 
## 181 : leisure_count_1000 171 : cafe_count_1000_na_price  -  0.8723884 
## 186 : office_count_1500 171 : cafe_count_1000_na_price  -  0.9058755 
## 190 : cafe_count_1500 171 : cafe_count_1000_na_price  -  0.9508501 
## 194 : cafe_count_1500_na_price 171 : cafe_count_1000_na_price  -  0.9710631 
## 195 : cafe_count_1500_price_500 171 : cafe_count_1000_na_price  -  0.9448319 
## 196 : cafe_count_1500_price_1000 171 : cafe_count_1000_na_price  -  0.9343755 
## 197 : cafe_count_1500_price_1500 171 : cafe_count_1000_na_price  -  0.9489591 
## 198 : cafe_count_1500_price_2500 171 : cafe_count_1000_na_price  -  0.9422025 
## 199 : cafe_count_1500_price_4000 171 : cafe_count_1000_na_price  -  0.9290788 
## 200 : cafe_count_1500_price_high 171 : cafe_count_1000_na_price  -  0.8443023 
## 201 : big_church_count_1500 171 : cafe_count_1000_na_price  -  0.926674 
## 202 : church_count_1500 171 : cafe_count_1000_na_price  -  0.9255836 
## 204 : leisure_count_1500 171 : cafe_count_1000_na_price  -  0.8967196 
## 209 : office_count_2000 171 : cafe_count_1000_na_price  -  0.9174775 
## 213 : cafe_count_2000 171 : cafe_count_1000_na_price  -  0.9446669 
## 217 : cafe_count_2000_na_price 171 : cafe_count_1000_na_price  -  0.9536801 
## 218 : cafe_count_2000_price_500 171 : cafe_count_1000_na_price  -  0.9386962 
## 219 : cafe_count_2000_price_1000 171 : cafe_count_1000_na_price  -  0.935645 
## 220 : cafe_count_2000_price_1500 171 : cafe_count_1000_na_price  -  0.9446422 
## 221 : cafe_count_2000_price_2500 171 : cafe_count_1000_na_price  -  0.9404467 
## 222 : cafe_count_2000_price_4000 171 : cafe_count_1000_na_price  -  0.9327729 
## 223 : cafe_count_2000_price_high 171 : cafe_count_1000_na_price  -  0.8893343 
## 224 : big_church_count_2000 171 : cafe_count_1000_na_price  -  0.9336596 
## 225 : church_count_2000 171 : cafe_count_1000_na_price  -  0.9297286 
## 227 : leisure_count_2000 171 : cafe_count_1000_na_price  -  0.930958 
## 232 : office_count_3000 171 : cafe_count_1000_na_price  -  0.9066126 
## 236 : cafe_count_3000 171 : cafe_count_1000_na_price  -  0.9265745 
## 240 : cafe_count_3000_na_price 171 : cafe_count_1000_na_price  -  0.9287556 
## 241 : cafe_count_3000_price_500 171 : cafe_count_1000_na_price  -  0.9240405 
## 242 : cafe_count_3000_price_1000 171 : cafe_count_1000_na_price  -  0.9172796 
## 243 : cafe_count_3000_price_1500 171 : cafe_count_1000_na_price  -  0.9278402 
## 244 : cafe_count_3000_price_2500 171 : cafe_count_1000_na_price  -  0.9215113 
## 245 : cafe_count_3000_price_4000 171 : cafe_count_1000_na_price  -  0.9225361 
## 246 : cafe_count_3000_price_high 171 : cafe_count_1000_na_price  -  0.8574143 
## 247 : big_church_count_3000 171 : cafe_count_1000_na_price  -  0.9131766 
## 248 : church_count_3000 171 : cafe_count_1000_na_price  -  0.9182383 
## 250 : leisure_count_3000 171 : cafe_count_1000_na_price  -  0.9280457 
## 255 : office_count_5000 171 : cafe_count_1000_na_price  -  0.8147615 
## 259 : cafe_count_5000 171 : cafe_count_1000_na_price  -  0.8286862 
## 263 : cafe_count_5000_na_price 171 : cafe_count_1000_na_price  -  0.8351624 
## 264 : cafe_count_5000_price_500 171 : cafe_count_1000_na_price  -  0.8228555 
## 265 : cafe_count_5000_price_1000 171 : cafe_count_1000_na_price  -  0.8159732 
## 266 : cafe_count_5000_price_1500 171 : cafe_count_1000_na_price  -  0.8313559 
## 267 : cafe_count_5000_price_2500 171 : cafe_count_1000_na_price  -  0.8300734 
## 268 : cafe_count_5000_price_4000 171 : cafe_count_1000_na_price  -  0.8296999 
## 269 : cafe_count_5000_price_high 171 : cafe_count_1000_na_price  -  0.8018986 
## 270 : big_church_count_5000 171 : cafe_count_1000_na_price  -  0.8243518 
## 271 : church_count_5000 171 : cafe_count_1000_na_price  -  0.8228619 
## 273 : leisure_count_5000 171 : cafe_count_1000_na_price  -  0.8320404 
## 173 : cafe_count_1000_price_1000 172 : cafe_count_1000_price_500  -  0.95509 
## 174 : cafe_count_1000_price_1500 172 : cafe_count_1000_price_500  -  0.9766476 
## 175 : cafe_count_1000_price_2500 172 : cafe_count_1000_price_500  -  0.980615 
## 176 : cafe_count_1000_price_4000 172 : cafe_count_1000_price_500  -  0.9634758 
## 178 : big_church_count_1000 172 : cafe_count_1000_price_500  -  0.9279632 
## 179 : church_count_1000 172 : cafe_count_1000_price_500  -  0.954534 
## 181 : leisure_count_1000 172 : cafe_count_1000_price_500  -  0.915496 
## 186 : office_count_1500 172 : cafe_count_1000_price_500  -  0.9239435 
## 190 : cafe_count_1500 172 : cafe_count_1000_price_500  -  0.9871772 
## 194 : cafe_count_1500_na_price 172 : cafe_count_1000_price_500  -  0.9596604 
## 195 : cafe_count_1500_price_500 172 : cafe_count_1000_price_500  -  0.990662 
## 196 : cafe_count_1500_price_1000 172 : cafe_count_1000_price_500  -  0.9760012 
## 197 : cafe_count_1500_price_1500 172 : cafe_count_1000_price_500  -  0.9828051 
## 198 : cafe_count_1500_price_2500 172 : cafe_count_1000_price_500  -  0.9746762 
## 199 : cafe_count_1500_price_4000 172 : cafe_count_1000_price_500  -  0.9684376 
## 200 : cafe_count_1500_price_high 172 : cafe_count_1000_price_500  -  0.87226 
## 201 : big_church_count_1500 172 : cafe_count_1000_price_500  -  0.959898 
## 202 : church_count_1500 172 : cafe_count_1000_price_500  -  0.9616158 
## 204 : leisure_count_1500 172 : cafe_count_1000_price_500  -  0.9269246 
## 209 : office_count_2000 172 : cafe_count_1000_price_500  -  0.9393282 
## 213 : cafe_count_2000 172 : cafe_count_1000_price_500  -  0.9805686 
## 217 : cafe_count_2000_na_price 172 : cafe_count_1000_price_500  -  0.9671942 
## 218 : cafe_count_2000_price_500 172 : cafe_count_1000_price_500  -  0.9814099 
## 219 : cafe_count_2000_price_1000 172 : cafe_count_1000_price_500  -  0.9760129 
## 220 : cafe_count_2000_price_1500 172 : cafe_count_1000_price_500  -  0.9768928 
## 221 : cafe_count_2000_price_2500 172 : cafe_count_1000_price_500  -  0.9742693 
## 222 : cafe_count_2000_price_4000 172 : cafe_count_1000_price_500  -  0.9649255 
## 223 : cafe_count_2000_price_high 172 : cafe_count_1000_price_500  -  0.9158326 
## 224 : big_church_count_2000 172 : cafe_count_1000_price_500  -  0.959769 
## 225 : church_count_2000 172 : cafe_count_1000_price_500  -  0.9629671 
## 227 : leisure_count_2000 172 : cafe_count_1000_price_500  -  0.9675281 
## 232 : office_count_3000 172 : cafe_count_1000_price_500  -  0.9262361 
## 236 : cafe_count_3000 172 : cafe_count_1000_price_500  -  0.9559948 
## 240 : cafe_count_3000_na_price 172 : cafe_count_1000_price_500  -  0.9448084 
## 241 : cafe_count_3000_price_500 172 : cafe_count_1000_price_500  -  0.9569856 
## 242 : cafe_count_3000_price_1000 172 : cafe_count_1000_price_500  -  0.9479008 
## 243 : cafe_count_3000_price_1500 172 : cafe_count_1000_price_500  -  0.9558336 
## 244 : cafe_count_3000_price_2500 172 : cafe_count_1000_price_500  -  0.9517373 
## 245 : cafe_count_3000_price_4000 172 : cafe_count_1000_price_500  -  0.9500815 
## 246 : cafe_count_3000_price_high 172 : cafe_count_1000_price_500  -  0.8758922 
## 247 : big_church_count_3000 172 : cafe_count_1000_price_500  -  0.9223759 
## 248 : church_count_3000 172 : cafe_count_1000_price_500  -  0.9381426 
## 250 : leisure_count_3000 172 : cafe_count_1000_price_500  -  0.9649444 
## 255 : office_count_5000 172 : cafe_count_1000_price_500  -  0.8094851 
## 259 : cafe_count_5000 172 : cafe_count_1000_price_500  -  0.8225674 
## 263 : cafe_count_5000_na_price 172 : cafe_count_1000_price_500  -  0.8192676 
## 264 : cafe_count_5000_price_500 172 : cafe_count_1000_price_500  -  0.8192001 
## 265 : cafe_count_5000_price_1000 172 : cafe_count_1000_price_500  -  0.8128984 
## 266 : cafe_count_5000_price_1500 172 : cafe_count_1000_price_500  -  0.8246443 
## 267 : cafe_count_5000_price_2500 172 : cafe_count_1000_price_500  -  0.8226869 
## 268 : cafe_count_5000_price_4000 172 : cafe_count_1000_price_500  -  0.8165239 
## 270 : big_church_count_5000 172 : cafe_count_1000_price_500  -  0.8143869 
## 271 : church_count_5000 172 : cafe_count_1000_price_500  -  0.8195267 
## 273 : leisure_count_5000 172 : cafe_count_1000_price_500  -  0.8284994 
## 174 : cafe_count_1000_price_1500 173 : cafe_count_1000_price_1000  -  0.9690516 
## 175 : cafe_count_1000_price_2500 173 : cafe_count_1000_price_1000  -  0.9473908 
## 176 : cafe_count_1000_price_4000 173 : cafe_count_1000_price_1000  -  0.900313 
## 178 : big_church_count_1000 173 : cafe_count_1000_price_1000  -  0.8958682 
## 179 : church_count_1000 173 : cafe_count_1000_price_1000  -  0.900353 
## 181 : leisure_count_1000 173 : cafe_count_1000_price_1000  -  0.9045426 
## 186 : office_count_1500 173 : cafe_count_1000_price_1000  -  0.9455791 
## 190 : cafe_count_1500 173 : cafe_count_1000_price_1000  -  0.9679428 
## 194 : cafe_count_1500_na_price 173 : cafe_count_1000_price_1000  -  0.9400783 
## 195 : cafe_count_1500_price_500 173 : cafe_count_1000_price_1000  -  0.9614437 
## 196 : cafe_count_1500_price_1000 173 : cafe_count_1000_price_1000  -  0.9781755 
## 197 : cafe_count_1500_price_1500 173 : cafe_count_1000_price_1000  -  0.9618199 
## 198 : cafe_count_1500_price_2500 173 : cafe_count_1000_price_1000  -  0.9567169 
## 199 : cafe_count_1500_price_4000 173 : cafe_count_1000_price_1000  -  0.9199745 
## 200 : cafe_count_1500_price_high 173 : cafe_count_1000_price_1000  -  0.8695147 
## 201 : big_church_count_1500 173 : cafe_count_1000_price_1000  -  0.911559 
## 202 : church_count_1500 173 : cafe_count_1000_price_1000  -  0.9207015 
## 204 : leisure_count_1500 173 : cafe_count_1000_price_1000  -  0.9283321 
## 209 : office_count_2000 173 : cafe_count_1000_price_1000  -  0.9477791 
## 213 : cafe_count_2000 173 : cafe_count_1000_price_1000  -  0.9636838 
## 217 : cafe_count_2000_na_price 173 : cafe_count_1000_price_1000  -  0.9471404 
## 218 : cafe_count_2000_price_500 173 : cafe_count_1000_price_1000  -  0.9622823 
## 219 : cafe_count_2000_price_1000 173 : cafe_count_1000_price_1000  -  0.9669678 
## 220 : cafe_count_2000_price_1500 173 : cafe_count_1000_price_1000  -  0.9598935 
## 221 : cafe_count_2000_price_2500 173 : cafe_count_1000_price_1000  -  0.9563154 
## 222 : cafe_count_2000_price_4000 173 : cafe_count_1000_price_1000  -  0.9330397 
## 223 : cafe_count_2000_price_high 173 : cafe_count_1000_price_1000  -  0.9001299 
## 224 : big_church_count_2000 173 : cafe_count_1000_price_1000  -  0.9219772 
## 225 : church_count_2000 173 : cafe_count_1000_price_1000  -  0.9318129 
## 227 : leisure_count_2000 173 : cafe_count_1000_price_1000  -  0.9398586 
## 232 : office_count_3000 173 : cafe_count_1000_price_1000  -  0.9333822 
## 233 : office_sqm_3000 173 : cafe_count_1000_price_1000  -  0.8110367 
## 236 : cafe_count_3000 173 : cafe_count_1000_price_1000  -  0.9554298 
## 240 : cafe_count_3000_na_price 173 : cafe_count_1000_price_1000  -  0.9421155 
## 241 : cafe_count_3000_price_500 173 : cafe_count_1000_price_1000  -  0.9541241 
## 242 : cafe_count_3000_price_1000 173 : cafe_count_1000_price_1000  -  0.9555405 
## 243 : cafe_count_3000_price_1500 173 : cafe_count_1000_price_1000  -  0.95416 
## 244 : cafe_count_3000_price_2500 173 : cafe_count_1000_price_1000  -  0.9495418 
## 245 : cafe_count_3000_price_4000 173 : cafe_count_1000_price_1000  -  0.9352442 
## 246 : cafe_count_3000_price_high 173 : cafe_count_1000_price_1000  -  0.8828359 
## 247 : big_church_count_3000 173 : cafe_count_1000_price_1000  -  0.9249022 
## 248 : church_count_3000 173 : cafe_count_1000_price_1000  -  0.9378862 
## 250 : leisure_count_3000 173 : cafe_count_1000_price_1000  -  0.9455049 
## 255 : office_count_5000 173 : cafe_count_1000_price_1000  -  0.8508665 
## 259 : cafe_count_5000 173 : cafe_count_1000_price_1000  -  0.8653111 
## 263 : cafe_count_5000_na_price 173 : cafe_count_1000_price_1000  -  0.8604414 
## 264 : cafe_count_5000_price_500 173 : cafe_count_1000_price_1000  -  0.8611111 
## 265 : cafe_count_5000_price_1000 173 : cafe_count_1000_price_1000  -  0.8598918 
## 266 : cafe_count_5000_price_1500 173 : cafe_count_1000_price_1000  -  0.8683792 
## 267 : cafe_count_5000_price_2500 173 : cafe_count_1000_price_1000  -  0.8617783 
## 268 : cafe_count_5000_price_4000 173 : cafe_count_1000_price_1000  -  0.8504533 
## 269 : cafe_count_5000_price_high 173 : cafe_count_1000_price_1000  -  0.8264516 
## 270 : big_church_count_5000 173 : cafe_count_1000_price_1000  -  0.8543594 
## 271 : church_count_5000 173 : cafe_count_1000_price_1000  -  0.8623211 
## 273 : leisure_count_5000 173 : cafe_count_1000_price_1000  -  0.8631721 
## 175 : cafe_count_1000_price_2500 174 : cafe_count_1000_price_1500  -  0.9761612 
## 176 : cafe_count_1000_price_4000 174 : cafe_count_1000_price_1500  -  0.9482064 
## 178 : big_church_count_1000 174 : cafe_count_1000_price_1500  -  0.9272446 
## 179 : church_count_1000 174 : cafe_count_1000_price_1500  -  0.9377186 
## 181 : leisure_count_1000 174 : cafe_count_1000_price_1500  -  0.918767 
## 186 : office_count_1500 174 : cafe_count_1000_price_1500  -  0.9394494 
## 190 : cafe_count_1500 174 : cafe_count_1000_price_1500  -  0.9875883 
## 194 : cafe_count_1500_na_price 174 : cafe_count_1000_price_1500  -  0.9629987 
## 195 : cafe_count_1500_price_500 174 : cafe_count_1000_price_1500  -  0.9794292 
## 196 : cafe_count_1500_price_1000 174 : cafe_count_1000_price_1500  -  0.9806118 
## 197 : cafe_count_1500_price_1500 174 : cafe_count_1000_price_1500  -  0.9905052 
## 198 : cafe_count_1500_price_2500 174 : cafe_count_1000_price_1500  -  0.9778356 
## 199 : cafe_count_1500_price_4000 174 : cafe_count_1000_price_1500  -  0.9617156 
## 200 : cafe_count_1500_price_high 174 : cafe_count_1000_price_1500  -  0.8881832 
## 201 : big_church_count_1500 174 : cafe_count_1000_price_1500  -  0.9521335 
## 202 : church_count_1500 174 : cafe_count_1000_price_1500  -  0.9523007 
## 204 : leisure_count_1500 174 : cafe_count_1000_price_1500  -  0.9360352 
## 209 : office_count_2000 174 : cafe_count_1000_price_1500  -  0.9496939 
## 213 : cafe_count_2000 174 : cafe_count_1000_price_1500  -  0.9827356 
## 217 : cafe_count_2000_na_price 174 : cafe_count_1000_price_1500  -  0.9692113 
## 218 : cafe_count_2000_price_500 174 : cafe_count_1000_price_1500  -  0.9771814 
## 219 : cafe_count_2000_price_1000 174 : cafe_count_1000_price_1500  -  0.9789871 
## 220 : cafe_count_2000_price_1500 174 : cafe_count_1000_price_1500  -  0.9851161 
## 221 : cafe_count_2000_price_2500 174 : cafe_count_1000_price_1500  -  0.9763904 
## 222 : cafe_count_2000_price_4000 174 : cafe_count_1000_price_1500  -  0.965114 
## 223 : cafe_count_2000_price_high 174 : cafe_count_1000_price_1500  -  0.9187632 
## 224 : big_church_count_2000 174 : cafe_count_1000_price_1500  -  0.9570085 
## 225 : church_count_2000 174 : cafe_count_1000_price_1500  -  0.9586868 
## 227 : leisure_count_2000 174 : cafe_count_1000_price_1500  -  0.9626825 
## 232 : office_count_3000 174 : cafe_count_1000_price_1500  -  0.9379168 
## 236 : cafe_count_3000 174 : cafe_count_1000_price_1500  -  0.965181 
## 240 : cafe_count_3000_na_price 174 : cafe_count_1000_price_1500  -  0.95297 
## 241 : cafe_count_3000_price_500 174 : cafe_count_1000_price_1500  -  0.9615466 
## 242 : cafe_count_3000_price_1000 174 : cafe_count_1000_price_1500  -  0.9597126 
## 243 : cafe_count_3000_price_1500 174 : cafe_count_1000_price_1500  -  0.968943 
## 244 : cafe_count_3000_price_2500 174 : cafe_count_1000_price_1500  -  0.959977 
## 245 : cafe_count_3000_price_4000 174 : cafe_count_1000_price_1500  -  0.9543157 
## 246 : cafe_count_3000_price_high 174 : cafe_count_1000_price_1500  -  0.8856084 
## 247 : big_church_count_3000 174 : cafe_count_1000_price_1500  -  0.938839 
## 248 : church_count_3000 174 : cafe_count_1000_price_1500  -  0.9490069 
## 250 : leisure_count_3000 174 : cafe_count_1000_price_1500  -  0.9644744 
## 255 : office_count_5000 174 : cafe_count_1000_price_1500  -  0.836754 
## 259 : cafe_count_5000 174 : cafe_count_1000_price_1500  -  0.8507333 
## 263 : cafe_count_5000_na_price 174 : cafe_count_1000_price_1500  -  0.8472602 
## 264 : cafe_count_5000_price_500 174 : cafe_count_1000_price_1500  -  0.845015 
## 265 : cafe_count_5000_price_1000 174 : cafe_count_1000_price_1500  -  0.8421637 
## 266 : cafe_count_5000_price_1500 174 : cafe_count_1000_price_1500  -  0.8554869 
## 267 : cafe_count_5000_price_2500 174 : cafe_count_1000_price_1500  -  0.8499902 
## 268 : cafe_count_5000_price_4000 174 : cafe_count_1000_price_1500  -  0.8406709 
## 269 : cafe_count_5000_price_high 174 : cafe_count_1000_price_1500  -  0.81626 
## 270 : big_church_count_5000 174 : cafe_count_1000_price_1500  -  0.8450426 
## 271 : church_count_5000 174 : cafe_count_1000_price_1500  -  0.8490387 
## 273 : leisure_count_5000 174 : cafe_count_1000_price_1500  -  0.8524744 
## 176 : cafe_count_1000_price_4000 175 : cafe_count_1000_price_2500  -  0.9754585 
## 178 : big_church_count_1000 175 : cafe_count_1000_price_2500  -  0.9197205 
## 179 : church_count_1000 175 : cafe_count_1000_price_2500  -  0.9449449 
## 181 : leisure_count_1000 175 : cafe_count_1000_price_2500  -  0.923673 
## 186 : office_count_1500 175 : cafe_count_1000_price_2500  -  0.9205058 
## 190 : cafe_count_1500 175 : cafe_count_1000_price_2500  -  0.9852259 
## 194 : cafe_count_1500_na_price 175 : cafe_count_1000_price_2500  -  0.9563698 
## 195 : cafe_count_1500_price_500 175 : cafe_count_1000_price_2500  -  0.9788681 
## 196 : cafe_count_1500_price_1000 175 : cafe_count_1000_price_2500  -  0.9702069 
## 197 : cafe_count_1500_price_1500 175 : cafe_count_1000_price_2500  -  0.9815923 
## 198 : cafe_count_1500_price_2500 175 : cafe_count_1000_price_2500  -  0.9875157 
## 199 : cafe_count_1500_price_4000 175 : cafe_count_1000_price_2500  -  0.9810033 
## 200 : cafe_count_1500_price_high 175 : cafe_count_1000_price_2500  -  0.8969279 
## 201 : big_church_count_1500 175 : cafe_count_1000_price_2500  -  0.9520409 
## 202 : church_count_1500 175 : cafe_count_1000_price_2500  -  0.9526684 
## 204 : leisure_count_1500 175 : cafe_count_1000_price_2500  -  0.9342516 
## 209 : office_count_2000 175 : cafe_count_1000_price_2500  -  0.9353339 
## 213 : cafe_count_2000 175 : cafe_count_1000_price_2500  -  0.9791738 
## 217 : cafe_count_2000_na_price 175 : cafe_count_1000_price_2500  -  0.9625759 
## 218 : cafe_count_2000_price_500 175 : cafe_count_1000_price_2500  -  0.9730395 
## 219 : cafe_count_2000_price_1000 175 : cafe_count_1000_price_2500  -  0.9718557 
## 220 : cafe_count_2000_price_1500 175 : cafe_count_1000_price_2500  -  0.9766929 
## 221 : cafe_count_2000_price_2500 175 : cafe_count_1000_price_2500  -  0.9817894 
## 222 : cafe_count_2000_price_4000 175 : cafe_count_1000_price_2500  -  0.9773413 
## 223 : cafe_count_2000_price_high 175 : cafe_count_1000_price_2500  -  0.9307525 
## 224 : big_church_count_2000 175 : cafe_count_1000_price_2500  -  0.9522386 
## 225 : church_count_2000 175 : cafe_count_1000_price_2500  -  0.9551451 
## 227 : leisure_count_2000 175 : cafe_count_1000_price_2500  -  0.9691404 
## 232 : office_count_3000 175 : cafe_count_1000_price_2500  -  0.9236238 
## 236 : cafe_count_3000 175 : cafe_count_1000_price_2500  -  0.9558647 
## 240 : cafe_count_3000_na_price 175 : cafe_count_1000_price_2500  -  0.9419252 
## 241 : cafe_count_3000_price_500 175 : cafe_count_1000_price_2500  -  0.9518449 
## 242 : cafe_count_3000_price_1000 175 : cafe_count_1000_price_2500  -  0.9460568 
## 243 : cafe_count_3000_price_1500 175 : cafe_count_1000_price_2500  -  0.9567301 
## 244 : cafe_count_3000_price_2500 175 : cafe_count_1000_price_2500  -  0.9577598 
## 245 : cafe_count_3000_price_4000 175 : cafe_count_1000_price_2500  -  0.9593747 
## 246 : cafe_count_3000_price_high 175 : cafe_count_1000_price_2500  -  0.8914744 
## 247 : big_church_count_3000 175 : cafe_count_1000_price_2500  -  0.9180251 
## 248 : church_count_3000 175 : cafe_count_1000_price_2500  -  0.9335087 
## 250 : leisure_count_3000 175 : cafe_count_1000_price_2500  -  0.9660913 
## 255 : office_count_5000 175 : cafe_count_1000_price_2500  -  0.8120175 
## 259 : cafe_count_5000 175 : cafe_count_1000_price_2500  -  0.8252946 
## 263 : cafe_count_5000_na_price 175 : cafe_count_1000_price_2500  -  0.82115 
## 264 : cafe_count_5000_price_500 175 : cafe_count_1000_price_2500  -  0.8187743 
## 265 : cafe_count_5000_price_1000 175 : cafe_count_1000_price_2500  -  0.813666 
## 266 : cafe_count_5000_price_1500 175 : cafe_count_1000_price_2500  -  0.8281718 
## 267 : cafe_count_5000_price_2500 175 : cafe_count_1000_price_2500  -  0.8300757 
## 268 : cafe_count_5000_price_4000 175 : cafe_count_1000_price_2500  -  0.8257515 
## 269 : cafe_count_5000_price_high 175 : cafe_count_1000_price_2500  -  0.8080085 
## 270 : big_church_count_5000 175 : cafe_count_1000_price_2500  -  0.8156119 
## 271 : church_count_5000 175 : cafe_count_1000_price_2500  -  0.8215747 
## 273 : leisure_count_5000 175 : cafe_count_1000_price_2500  -  0.8338028 
## 178 : big_church_count_1000 176 : cafe_count_1000_price_4000  -  0.9057421 
## 179 : church_count_1000 176 : cafe_count_1000_price_4000  -  0.9368925 
## 181 : leisure_count_1000 176 : cafe_count_1000_price_4000  -  0.9006486 
## 186 : office_count_1500 176 : cafe_count_1000_price_4000  -  0.8656922 
## 190 : cafe_count_1500 176 : cafe_count_1000_price_4000  -  0.9592894 
## 194 : cafe_count_1500_na_price 176 : cafe_count_1000_price_4000  -  0.9293471 
## 195 : cafe_count_1500_price_500 176 : cafe_count_1000_price_4000  -  0.9530591 
## 196 : cafe_count_1500_price_1000 176 : cafe_count_1000_price_4000  -  0.9349146 
## 197 : cafe_count_1500_price_1500 176 : cafe_count_1000_price_4000  -  0.9581946 
## 198 : cafe_count_1500_price_2500 176 : cafe_count_1000_price_4000  -  0.9575833 
## 199 : cafe_count_1500_price_4000 176 : cafe_count_1000_price_4000  -  0.9879765 
## 200 : cafe_count_1500_price_high 176 : cafe_count_1000_price_4000  -  0.8744212 
## 201 : big_church_count_1500 176 : cafe_count_1000_price_4000  -  0.9444451 
## 202 : church_count_1500 176 : cafe_count_1000_price_4000  -  0.9381586 
## 204 : leisure_count_1500 176 : cafe_count_1000_price_4000  -  0.9031025 
## 209 : office_count_2000 176 : cafe_count_1000_price_4000  -  0.8898796 
## 213 : cafe_count_2000 176 : cafe_count_1000_price_4000  -  0.9515893 
## 217 : cafe_count_2000_na_price 176 : cafe_count_1000_price_4000  -  0.9386614 
## 218 : cafe_count_2000_price_500 176 : cafe_count_1000_price_4000  -  0.9433344 
## 219 : cafe_count_2000_price_1000 176 : cafe_count_1000_price_4000  -  0.9402818 
## 220 : cafe_count_2000_price_1500 176 : cafe_count_1000_price_4000  -  0.949914 
## 221 : cafe_count_2000_price_2500 176 : cafe_count_1000_price_4000  -  0.9542417 
## 222 : cafe_count_2000_price_4000 176 : cafe_count_1000_price_4000  -  0.9689039 
## 223 : cafe_count_2000_price_high 176 : cafe_count_1000_price_4000  -  0.9073197 
## 224 : big_church_count_2000 176 : cafe_count_1000_price_4000  -  0.9382775 
## 225 : church_count_2000 176 : cafe_count_1000_price_4000  -  0.9356501 
## 227 : leisure_count_2000 176 : cafe_count_1000_price_4000  -  0.9520477 
## 232 : office_count_3000 176 : cafe_count_1000_price_4000  -  0.8811234 
## 236 : cafe_count_3000 176 : cafe_count_1000_price_4000  -  0.9178254 
## 240 : cafe_count_3000_na_price 176 : cafe_count_1000_price_4000  -  0.9083592 
## 241 : cafe_count_3000_price_500 176 : cafe_count_1000_price_4000  -  0.9135936 
## 242 : cafe_count_3000_price_1000 176 : cafe_count_1000_price_4000  -  0.9031125 
## 243 : cafe_count_3000_price_1500 176 : cafe_count_1000_price_4000  -  0.9197968 
## 244 : cafe_count_3000_price_2500 176 : cafe_count_1000_price_4000  -  0.9209997 
## 245 : cafe_count_3000_price_4000 176 : cafe_count_1000_price_4000  -  0.9329309 
## 246 : cafe_count_3000_price_high 176 : cafe_count_1000_price_4000  -  0.8518687 
## 247 : big_church_count_3000 176 : cafe_count_1000_price_4000  -  0.8809981 
## 248 : church_count_3000 176 : cafe_count_1000_price_4000  -  0.8953451 
## 250 : leisure_count_3000 176 : cafe_count_1000_price_4000  -  0.9419873 
## 200 : cafe_count_1500_price_high 177 : cafe_count_1000_price_high  -  0.816702 
## 179 : church_count_1000 178 : big_church_count_1000  -  0.9546936 
## 181 : leisure_count_1000 178 : big_church_count_1000  -  0.8689428 
## 186 : office_count_1500 178 : big_church_count_1000  -  0.8986792 
## 190 : cafe_count_1500 178 : big_church_count_1000  -  0.9340805 
## 194 : cafe_count_1500_na_price 178 : big_church_count_1000  -  0.9205514 
## 195 : cafe_count_1500_price_500 178 : big_church_count_1000  -  0.928691 
## 196 : cafe_count_1500_price_1000 178 : big_church_count_1000  -  0.9236374 
## 197 : cafe_count_1500_price_1500 178 : big_church_count_1000  -  0.9393411 
## 198 : cafe_count_1500_price_2500 178 : big_church_count_1000  -  0.9190913 
## 199 : cafe_count_1500_price_4000 178 : big_church_count_1000  -  0.9128887 
## 200 : cafe_count_1500_price_high 178 : big_church_count_1000  -  0.8008878 
## 201 : big_church_count_1500 178 : big_church_count_1000  -  0.9698884 
## 202 : church_count_1500 178 : big_church_count_1000  -  0.9534242 
## 204 : leisure_count_1500 178 : big_church_count_1000  -  0.8843071 
## 209 : office_count_2000 178 : big_church_count_1000  -  0.91603 
## 213 : cafe_count_2000 178 : big_church_count_1000  -  0.9338816 
## 217 : cafe_count_2000_na_price 178 : big_church_count_1000  -  0.9332945 
## 218 : cafe_count_2000_price_500 178 : big_church_count_1000  -  0.9283664 
## 219 : cafe_count_2000_price_1000 178 : big_church_count_1000  -  0.9297083 
## 220 : cafe_count_2000_price_1500 178 : big_church_count_1000  -  0.9384875 
## 221 : cafe_count_2000_price_2500 178 : big_church_count_1000  -  0.923929 
## 222 : cafe_count_2000_price_4000 178 : big_church_count_1000  -  0.9122591 
## 223 : cafe_count_2000_price_high 178 : big_church_count_1000  -  0.8461687 
## 224 : big_church_count_2000 178 : big_church_count_1000  -  0.9651532 
## 225 : church_count_2000 178 : big_church_count_1000  -  0.9527707 
## 227 : leisure_count_2000 178 : big_church_count_1000  -  0.9222424 
## 232 : office_count_3000 178 : big_church_count_1000  -  0.9145007 
## 236 : cafe_count_3000 178 : big_church_count_1000  -  0.9221507 
## 240 : cafe_count_3000_na_price 178 : big_church_count_1000  -  0.9225551 
## 241 : cafe_count_3000_price_500 178 : big_church_count_1000  -  0.9199921 
## 242 : cafe_count_3000_price_1000 178 : big_church_count_1000  -  0.9160067 
## 243 : cafe_count_3000_price_1500 178 : big_church_count_1000  -  0.928484 
## 244 : cafe_count_3000_price_2500 178 : big_church_count_1000  -  0.9126344 
## 245 : cafe_count_3000_price_4000 178 : big_church_count_1000  -  0.9031686 
## 246 : cafe_count_3000_price_high 178 : big_church_count_1000  -  0.805811 
## 247 : big_church_count_3000 178 : big_church_count_1000  -  0.9454352 
## 248 : church_count_3000 178 : big_church_count_1000  -  0.9389037 
## 250 : leisure_count_3000 178 : big_church_count_1000  -  0.9291959 
## 255 : office_count_5000 178 : big_church_count_1000  -  0.822141 
## 259 : cafe_count_5000 178 : big_church_count_1000  -  0.8260709 
## 263 : cafe_count_5000_na_price 178 : big_church_count_1000  -  0.8271768 
## 264 : cafe_count_5000_price_500 178 : big_church_count_1000  -  0.8204845 
## 265 : cafe_count_5000_price_1000 178 : big_church_count_1000  -  0.8168087 
## 266 : cafe_count_5000_price_1500 178 : big_church_count_1000  -  0.8327344 
## 267 : cafe_count_5000_price_2500 178 : big_church_count_1000  -  0.8237742 
## 268 : cafe_count_5000_price_4000 178 : big_church_count_1000  -  0.8137584 
## 270 : big_church_count_5000 178 : big_church_count_1000  -  0.8514044 
## 271 : church_count_5000 178 : big_church_count_1000  -  0.8395897 
## 273 : leisure_count_5000 178 : big_church_count_1000  -  0.836174 
## 181 : leisure_count_1000 179 : church_count_1000  -  0.8824468 
## 186 : office_count_1500 179 : church_count_1000  -  0.8955543 
## 190 : cafe_count_1500 179 : church_count_1000  -  0.9514791 
## 194 : cafe_count_1500_na_price 179 : church_count_1000  -  0.9276829 
## 195 : cafe_count_1500_price_500 179 : church_count_1000  -  0.9505161 
## 196 : cafe_count_1500_price_1000 179 : church_count_1000  -  0.9376672 
## 197 : cafe_count_1500_price_1500 179 : church_count_1000  -  0.954248 
## 198 : cafe_count_1500_price_2500 179 : church_count_1000  -  0.9382438 
## 199 : cafe_count_1500_price_4000 179 : church_count_1000  -  0.9384524 
## 200 : cafe_count_1500_price_high 179 : church_count_1000  -  0.8100303 
## 201 : big_church_count_1500 179 : church_count_1000  -  0.970132 
## 202 : church_count_1500 179 : church_count_1000  -  0.985188 
## 204 : leisure_count_1500 179 : church_count_1000  -  0.8935885 
## 209 : office_count_2000 179 : church_count_1000  -  0.9187172 
## 213 : cafe_count_2000 179 : church_count_1000  -  0.950383 
## 217 : cafe_count_2000_na_price 179 : church_count_1000  -  0.940687 
## 218 : cafe_count_2000_price_500 179 : church_count_1000  -  0.9469532 
## 219 : cafe_count_2000_price_1000 179 : church_count_1000  -  0.9459748 
## 220 : cafe_count_2000_price_1500 179 : church_count_1000  -  0.9524508 
## 221 : cafe_count_2000_price_2500 179 : church_count_1000  -  0.9430881 
## 222 : cafe_count_2000_price_4000 179 : church_count_1000  -  0.932986 
## 223 : cafe_count_2000_price_high 179 : church_count_1000  -  0.8646466 
## 224 : big_church_count_2000 179 : church_count_1000  -  0.9666891 
## 225 : church_count_2000 179 : church_count_1000  -  0.9771228 
## 227 : leisure_count_2000 179 : church_count_1000  -  0.94426 
## 232 : office_count_3000 179 : church_count_1000  -  0.9144055 
## 236 : cafe_count_3000 179 : church_count_1000  -  0.9313517 
## 240 : cafe_count_3000_na_price 179 : church_count_1000  -  0.922825 
## 241 : cafe_count_3000_price_500 179 : church_count_1000  -  0.9304892 
## 242 : cafe_count_3000_price_1000 179 : church_count_1000  -  0.9227253 
## 243 : cafe_count_3000_price_1500 179 : church_count_1000  -  0.936323 
## 244 : cafe_count_3000_price_2500 179 : church_count_1000  -  0.9258515 
## 245 : cafe_count_3000_price_4000 179 : church_count_1000  -  0.9209067 
## 246 : cafe_count_3000_price_high 179 : church_count_1000  -  0.8212826 
## 247 : big_church_count_3000 179 : church_count_1000  -  0.9269377 
## 248 : church_count_3000 179 : church_count_1000  -  0.9437087 
## 250 : leisure_count_3000 179 : church_count_1000  -  0.9478583 
## 259 : cafe_count_5000 179 : church_count_1000  -  0.8083868 
## 263 : cafe_count_5000_na_price 179 : church_count_1000  -  0.8031593 
## 264 : cafe_count_5000_price_500 179 : church_count_1000  -  0.8035119 
## 266 : cafe_count_5000_price_1500 179 : church_count_1000  -  0.8133804 
## 267 : cafe_count_5000_price_2500 179 : church_count_1000  -  0.8093723 
## 268 : cafe_count_5000_price_4000 179 : church_count_1000  -  0.801134 
## 270 : big_church_count_5000 179 : church_count_1000  -  0.8162599 
## 271 : church_count_5000 179 : church_count_1000  -  0.8170691 
## 273 : leisure_count_5000 179 : church_count_1000  -  0.8200035 
## 186 : office_count_1500 181 : leisure_count_1000  -  0.8816537 
## 190 : cafe_count_1500 181 : leisure_count_1000  -  0.9248939 
## 194 : cafe_count_1500_na_price 181 : leisure_count_1000  -  0.8978046 
## 195 : cafe_count_1500_price_500 181 : leisure_count_1000  -  0.9177442 
## 196 : cafe_count_1500_price_1000 181 : leisure_count_1000  -  0.9176738 
## 197 : cafe_count_1500_price_1500 181 : leisure_count_1000  -  0.9210328 
## 198 : cafe_count_1500_price_2500 181 : leisure_count_1000  -  0.9238462 
## 199 : cafe_count_1500_price_4000 181 : leisure_count_1000  -  0.9121578 
## 200 : cafe_count_1500_price_high 181 : leisure_count_1000  -  0.8313628 
## 201 : big_church_count_1500 181 : leisure_count_1000  -  0.8917944 
## 202 : church_count_1500 181 : leisure_count_1000  -  0.895788 
## 204 : leisure_count_1500 181 : leisure_count_1000  -  0.9582888 
## 209 : office_count_2000 181 : leisure_count_1000  -  0.887281 
## 213 : cafe_count_2000 181 : leisure_count_1000  -  0.9192664 
## 217 : cafe_count_2000_na_price 181 : leisure_count_1000  -  0.9045905 
## 218 : cafe_count_2000_price_500 181 : leisure_count_1000  -  0.914715 
## 219 : cafe_count_2000_price_1000 181 : leisure_count_1000  -  0.914292 
## 220 : cafe_count_2000_price_1500 181 : leisure_count_1000  -  0.9165147 
## 221 : cafe_count_2000_price_2500 181 : leisure_count_1000  -  0.9189044 
## 222 : cafe_count_2000_price_4000 181 : leisure_count_1000  -  0.9146474 
## 223 : cafe_count_2000_price_high 181 : leisure_count_1000  -  0.8614958 
## 224 : big_church_count_2000 181 : leisure_count_1000  -  0.8968356 
## 225 : church_count_2000 181 : leisure_count_1000  -  0.9017152 
## 227 : leisure_count_2000 181 : leisure_count_1000  -  0.9417302 
## 232 : office_count_3000 181 : leisure_count_1000  -  0.870019 
## 236 : cafe_count_3000 181 : leisure_count_1000  -  0.8987035 
## 240 : cafe_count_3000_na_price 181 : leisure_count_1000  -  0.8864967 
## 241 : cafe_count_3000_price_500 181 : leisure_count_1000  -  0.8959223 
## 242 : cafe_count_3000_price_1000 181 : leisure_count_1000  -  0.8908917 
## 243 : cafe_count_3000_price_1500 181 : leisure_count_1000  -  0.8996637 
## 244 : cafe_count_3000_price_2500 181 : leisure_count_1000  -  0.8979284 
## 245 : cafe_count_3000_price_4000 181 : leisure_count_1000  -  0.8990974 
## 246 : cafe_count_3000_price_high 181 : leisure_count_1000  -  0.8230771 
## 247 : big_church_count_3000 181 : leisure_count_1000  -  0.8800234 
## 248 : church_count_3000 181 : leisure_count_1000  -  0.8929307 
## 250 : leisure_count_3000 181 : leisure_count_1000  -  0.9193228 
## 205 : sport_count_1500 182 : sport_count_1000  -  0.8786639 
## 228 : sport_count_2000 182 : sport_count_1000  -  0.8247242 
## 207 : green_part_2000 184 : green_part_1500  -  0.9414236 
## 208 : prom_part_2000 185 : prom_part_1500  -  0.9296944 
## 187 : office_sqm_1500 186 : office_count_1500  -  0.835174 
## 190 : cafe_count_1500 186 : office_count_1500  -  0.9542459 
## 194 : cafe_count_1500_na_price 186 : office_count_1500  -  0.9422939 
## 195 : cafe_count_1500_price_500 186 : office_count_1500  -  0.9487323 
## 196 : cafe_count_1500_price_1000 186 : office_count_1500  -  0.9581287 
## 197 : cafe_count_1500_price_1500 186 : office_count_1500  -  0.9478596 
## 198 : cafe_count_1500_price_2500 186 : office_count_1500  -  0.9487066 
## 199 : cafe_count_1500_price_4000 186 : office_count_1500  -  0.8985353 
## 200 : cafe_count_1500_price_high 186 : office_count_1500  -  0.8713745 
## 201 : big_church_count_1500 186 : office_count_1500  -  0.9098832 
## 202 : church_count_1500 186 : office_count_1500  -  0.921366 
## 204 : leisure_count_1500 186 : office_count_1500  -  0.9214572 
## 209 : office_count_2000 186 : office_count_1500  -  0.992104 
## 210 : office_sqm_2000 186 : office_count_1500  -  0.8545637 
## 213 : cafe_count_2000 186 : office_count_1500  -  0.9616329 
## 217 : cafe_count_2000_na_price 186 : office_count_1500  -  0.9539901 
## 218 : cafe_count_2000_price_500 186 : office_count_1500  -  0.9614416 
## 219 : cafe_count_2000_price_1000 186 : office_count_1500  -  0.9607941 
## 220 : cafe_count_2000_price_1500 186 : office_count_1500  -  0.9582434 
## 221 : cafe_count_2000_price_2500 186 : office_count_1500  -  0.9555873 
## 222 : cafe_count_2000_price_4000 186 : office_count_1500  -  0.9266354 
## 223 : cafe_count_2000_price_high 186 : office_count_1500  -  0.9105741 
## 224 : big_church_count_2000 186 : office_count_1500  -  0.9277241 
## 225 : church_count_2000 186 : office_count_1500  -  0.9364384 
## 227 : leisure_count_2000 186 : office_count_1500  -  0.9319898 
## 232 : office_count_3000 186 : office_count_1500  -  0.9798125 
## 233 : office_sqm_3000 186 : office_count_1500  -  0.8920813 
## 236 : cafe_count_3000 186 : office_count_1500  -  0.9753181 
## 240 : cafe_count_3000_na_price 186 : office_count_1500  -  0.9686046 
## 241 : cafe_count_3000_price_500 186 : office_count_1500  -  0.9747389 
## 242 : cafe_count_3000_price_1000 186 : office_count_1500  -  0.9736651 
## 243 : cafe_count_3000_price_1500 186 : office_count_1500  -  0.9732916 
## 244 : cafe_count_3000_price_2500 186 : office_count_1500  -  0.9697227 
## 245 : cafe_count_3000_price_4000 186 : office_count_1500  -  0.9511723 
## 246 : cafe_count_3000_price_high 186 : office_count_1500  -  0.9147527 
## 247 : big_church_count_3000 186 : office_count_1500  -  0.9587318 
## 248 : church_count_3000 186 : office_count_1500  -  0.9652384 
## 250 : leisure_count_3000 186 : office_count_1500  -  0.9540184 
## 255 : office_count_5000 186 : office_count_1500  -  0.9336229 
## 256 : office_sqm_5000 186 : office_count_1500  -  0.8501085 
## 259 : cafe_count_5000 186 : office_count_1500  -  0.9396512 
## 263 : cafe_count_5000_na_price 186 : office_count_1500  -  0.9344474 
## 264 : cafe_count_5000_price_500 186 : office_count_1500  -  0.9361429 
## 265 : cafe_count_5000_price_1000 186 : office_count_1500  -  0.9308427 
## 266 : cafe_count_5000_price_1500 186 : office_count_1500  -  0.9416682 
## 267 : cafe_count_5000_price_2500 186 : office_count_1500  -  0.9383351 
## 268 : cafe_count_5000_price_4000 186 : office_count_1500  -  0.9299219 
## 269 : cafe_count_5000_price_high 186 : office_count_1500  -  0.9029246 
## 270 : big_church_count_5000 186 : office_count_1500  -  0.9299588 
## 271 : church_count_5000 186 : office_count_1500  -  0.9325792 
## 273 : leisure_count_5000 186 : office_count_1500  -  0.9400653 
## 209 : office_count_2000 187 : office_sqm_1500  -  0.815503 
## 210 : office_sqm_2000 187 : office_sqm_1500  -  0.946487 
## 232 : office_count_3000 187 : office_sqm_1500  -  0.8104223 
## 233 : office_sqm_3000 187 : office_sqm_1500  -  0.8875778 
## 255 : office_count_5000 187 : office_sqm_1500  -  0.8417598 
## 256 : office_sqm_5000 187 : office_sqm_1500  -  0.8370427 
## 259 : cafe_count_5000 187 : office_sqm_1500  -  0.8457004 
## 263 : cafe_count_5000_na_price 187 : office_sqm_1500  -  0.8424099 
## 264 : cafe_count_5000_price_500 187 : office_sqm_1500  -  0.8411762 
## 265 : cafe_count_5000_price_1000 187 : office_sqm_1500  -  0.8415182 
## 266 : cafe_count_5000_price_1500 187 : office_sqm_1500  -  0.8434685 
## 267 : cafe_count_5000_price_2500 187 : office_sqm_1500  -  0.8444285 
## 268 : cafe_count_5000_price_4000 187 : office_sqm_1500  -  0.8390249 
## 269 : cafe_count_5000_price_high 187 : office_sqm_1500  -  0.8316005 
## 270 : big_church_count_5000 187 : office_sqm_1500  -  0.8022564 
## 271 : church_count_5000 187 : office_sqm_1500  -  0.8123369 
## 273 : leisure_count_5000 187 : office_sqm_1500  -  0.8373735 
## 211 : trc_count_2000 188 : trc_count_1500  -  0.9334777 
## 234 : trc_count_3000 188 : trc_count_1500  -  0.8409786 
## 212 : trc_sqm_2000 189 : trc_sqm_1500  -  0.8295976 
## 194 : cafe_count_1500_na_price 190 : cafe_count_1500  -  0.9758431 
## 195 : cafe_count_1500_price_500 190 : cafe_count_1500  -  0.9955688 
## 196 : cafe_count_1500_price_1000 190 : cafe_count_1500  -  0.9934768 
## 197 : cafe_count_1500_price_1500 190 : cafe_count_1500  -  0.9965267 
## 198 : cafe_count_1500_price_2500 190 : cafe_count_1500  -  0.9923066 
## 199 : cafe_count_1500_price_4000 190 : cafe_count_1500  -  0.9752932 
## 200 : cafe_count_1500_price_high 190 : cafe_count_1500  -  0.90355 
## 201 : big_church_count_1500 190 : cafe_count_1500  -  0.9611922 
## 202 : church_count_1500 190 : cafe_count_1500  -  0.9643597 
## 204 : leisure_count_1500 190 : cafe_count_1500  -  0.9471271 
## 209 : office_count_2000 190 : cafe_count_1500  -  0.9658384 
## 213 : cafe_count_2000 190 : cafe_count_1500  -  0.996679 
## 217 : cafe_count_2000_na_price 190 : cafe_count_1500  -  0.9835249 
## 218 : cafe_count_2000_price_500 190 : cafe_count_1500  -  0.9934806 
## 219 : cafe_count_2000_price_1000 190 : cafe_count_1500  -  0.992962 
## 220 : cafe_count_2000_price_1500 190 : cafe_count_1500  -  0.9945177 
## 221 : cafe_count_2000_price_2500 190 : cafe_count_1500  -  0.9922982 
## 222 : cafe_count_2000_price_4000 190 : cafe_count_1500  -  0.9801548 
## 223 : cafe_count_2000_price_high 190 : cafe_count_1500  -  0.9401892 
## 224 : big_church_count_2000 190 : cafe_count_1500  -  0.9663745 
## 225 : church_count_2000 190 : cafe_count_1500  -  0.9702531 
## 227 : leisure_count_2000 190 : cafe_count_1500  -  0.9781024 
## 232 : office_count_3000 190 : cafe_count_1500  -  0.9544355 
## 233 : office_sqm_3000 190 : cafe_count_1500  -  0.8164612 
## 236 : cafe_count_3000 190 : cafe_count_1500  -  0.9808651 
## 240 : cafe_count_3000_na_price 190 : cafe_count_1500  -  0.9696969 
## 241 : cafe_count_3000_price_500 190 : cafe_count_1500  -  0.9789301 
## 242 : cafe_count_3000_price_1000 190 : cafe_count_1500  -  0.9746192 
## 243 : cafe_count_3000_price_1500 190 : cafe_count_1500  -  0.9812124 
## 244 : cafe_count_3000_price_2500 190 : cafe_count_1500  -  0.9774299 
## 245 : cafe_count_3000_price_4000 190 : cafe_count_1500  -  0.9724459 
## 246 : cafe_count_3000_price_high 190 : cafe_count_1500  -  0.908798 
## 247 : big_church_count_3000 190 : cafe_count_1500  -  0.9469723 
## 248 : church_count_3000 190 : cafe_count_1500  -  0.9603685 
## 250 : leisure_count_3000 190 : cafe_count_1500  -  0.9808032 
## 255 : office_count_5000 190 : cafe_count_1500  -  0.8535645 
## 259 : cafe_count_5000 190 : cafe_count_1500  -  0.8678195 
## 263 : cafe_count_5000_na_price 190 : cafe_count_1500  -  0.8638314 
## 264 : cafe_count_5000_price_500 190 : cafe_count_1500  -  0.862945 
## 265 : cafe_count_5000_price_1000 190 : cafe_count_1500  -  0.8585764 
## 266 : cafe_count_5000_price_1500 190 : cafe_count_1500  -  0.87067 
## 267 : cafe_count_5000_price_2500 190 : cafe_count_1500  -  0.867983 
## 268 : cafe_count_5000_price_4000 190 : cafe_count_1500  -  0.8610327 
## 269 : cafe_count_5000_price_high 190 : cafe_count_1500  -  0.8398392 
## 270 : big_church_count_5000 190 : cafe_count_1500  -  0.8571894 
## 271 : church_count_5000 190 : cafe_count_1500  -  0.8626804 
## 273 : leisure_count_5000 190 : cafe_count_1500  -  0.8708897 
## 195 : cafe_count_1500_price_500 194 : cafe_count_1500_na_price  -  0.9694289 
## 196 : cafe_count_1500_price_1000 194 : cafe_count_1500_na_price  -  0.9628029 
## 197 : cafe_count_1500_price_1500 194 : cafe_count_1500_na_price  -  0.971149 
## 198 : cafe_count_1500_price_2500 194 : cafe_count_1500_na_price  -  0.9667435 
## 199 : cafe_count_1500_price_4000 194 : cafe_count_1500_na_price  -  0.9477995 
## 200 : cafe_count_1500_price_high 194 : cafe_count_1500_na_price  -  0.8751257 
## 201 : big_church_count_1500 194 : cafe_count_1500_na_price  -  0.9445736 
## 202 : church_count_1500 194 : cafe_count_1500_na_price  -  0.9442153 
## 204 : leisure_count_1500 194 : cafe_count_1500_na_price  -  0.9240081 
## 209 : office_count_2000 194 : cafe_count_1500_na_price  -  0.9513985 
## 213 : cafe_count_2000 194 : cafe_count_1500_na_price  -  0.9723186 
## 217 : cafe_count_2000_na_price 194 : cafe_count_1500_na_price  -  0.985239 
## 218 : cafe_count_2000_price_500 194 : cafe_count_1500_na_price  -  0.9677049 
## 219 : cafe_count_2000_price_1000 194 : cafe_count_1500_na_price  -  0.9640226 
## 220 : cafe_count_2000_price_1500 194 : cafe_count_1500_na_price  -  0.9702884 
## 221 : cafe_count_2000_price_2500 194 : cafe_count_1500_na_price  -  0.9668037 
## 222 : cafe_count_2000_price_4000 194 : cafe_count_1500_na_price  -  0.9563373 
## 223 : cafe_count_2000_price_high 194 : cafe_count_1500_na_price  -  0.9189574 
## 224 : big_church_count_2000 194 : cafe_count_1500_na_price  -  0.9535616 
## 225 : church_count_2000 194 : cafe_count_1500_na_price  -  0.9508721 
## 227 : leisure_count_2000 194 : cafe_count_1500_na_price  -  0.9525395 
## 232 : office_count_3000 194 : cafe_count_1500_na_price  -  0.9409352 
## 233 : office_sqm_3000 194 : cafe_count_1500_na_price  -  0.8189705 
## 236 : cafe_count_3000 194 : cafe_count_1500_na_price  -  0.960317 
## 240 : cafe_count_3000_na_price 194 : cafe_count_1500_na_price  -  0.9645171 
## 241 : cafe_count_3000_price_500 194 : cafe_count_1500_na_price  -  0.9579653 
## 242 : cafe_count_3000_price_1000 194 : cafe_count_1500_na_price  -  0.9514383 
## 243 : cafe_count_3000_price_1500 194 : cafe_count_1500_na_price  -  0.9605347 
## 244 : cafe_count_3000_price_2500 194 : cafe_count_1500_na_price  -  0.9550043 
## 245 : cafe_count_3000_price_4000 194 : cafe_count_1500_na_price  -  0.9539442 
## 246 : cafe_count_3000_price_high 194 : cafe_count_1500_na_price  -  0.8920925 
## 247 : big_church_count_3000 194 : cafe_count_1500_na_price  -  0.9423189 
## 248 : church_count_3000 194 : cafe_count_1500_na_price  -  0.9468808 
## 250 : leisure_count_3000 194 : cafe_count_1500_na_price  -  0.9559537 
## 255 : office_count_5000 194 : cafe_count_1500_na_price  -  0.8535653 
## 259 : cafe_count_5000 194 : cafe_count_1500_na_price  -  0.8678485 
## 263 : cafe_count_5000_na_price 194 : cafe_count_1500_na_price  -  0.8736388 
## 264 : cafe_count_5000_price_500 194 : cafe_count_1500_na_price  -  0.8626891 
## 265 : cafe_count_5000_price_1000 194 : cafe_count_1500_na_price  -  0.8557864 
## 266 : cafe_count_5000_price_1500 194 : cafe_count_1500_na_price  -  0.8700939 
## 267 : cafe_count_5000_price_2500 194 : cafe_count_1500_na_price  -  0.8677816 
## 268 : cafe_count_5000_price_4000 194 : cafe_count_1500_na_price  -  0.8667038 
## 269 : cafe_count_5000_price_high 194 : cafe_count_1500_na_price  -  0.8394941 
## 270 : big_church_count_5000 194 : cafe_count_1500_na_price  -  0.8602141 
## 271 : church_count_5000 194 : cafe_count_1500_na_price  -  0.8600104 
## 273 : leisure_count_5000 194 : cafe_count_1500_na_price  -  0.8679935 
## 196 : cafe_count_1500_price_1000 195 : cafe_count_1500_price_500  -  0.9883952 
## 197 : cafe_count_1500_price_1500 195 : cafe_count_1500_price_500  -  0.9887448 
## 198 : cafe_count_1500_price_2500 195 : cafe_count_1500_price_500  -  0.9830099 
## 199 : cafe_count_1500_price_4000 195 : cafe_count_1500_price_500  -  0.9658141 
## 200 : cafe_count_1500_price_high 195 : cafe_count_1500_price_500  -  0.8881084 
## 201 : big_church_count_1500 195 : cafe_count_1500_price_500  -  0.9578271 
## 202 : church_count_1500 195 : cafe_count_1500_price_500  -  0.9625241 
## 204 : leisure_count_1500 195 : cafe_count_1500_price_500  -  0.9383594 
## 209 : office_count_2000 195 : cafe_count_1500_price_500  -  0.9604473 
## 213 : cafe_count_2000 195 : cafe_count_1500_price_500  -  0.991429 
## 217 : cafe_count_2000_na_price 195 : cafe_count_1500_price_500  -  0.9776052 
## 218 : cafe_count_2000_price_500 195 : cafe_count_1500_price_500  -  0.9940679 
## 219 : cafe_count_2000_price_1000 195 : cafe_count_1500_price_500  -  0.9881154 
## 220 : cafe_count_2000_price_1500 195 : cafe_count_1500_price_500  -  0.9867112 
## 221 : cafe_count_2000_price_2500 195 : cafe_count_1500_price_500  -  0.9840987 
## 222 : cafe_count_2000_price_4000 195 : cafe_count_1500_price_500  -  0.9693876 
## 223 : cafe_count_2000_price_high 195 : cafe_count_1500_price_500  -  0.9285936 
## 224 : big_church_count_2000 195 : cafe_count_1500_price_500  -  0.9618108 
## 225 : church_count_2000 195 : cafe_count_1500_price_500  -  0.9673766 
## 227 : leisure_count_2000 195 : cafe_count_1500_price_500  -  0.9716893 
## 232 : office_count_3000 195 : cafe_count_1500_price_500  -  0.9480712 
## 233 : office_sqm_3000 195 : cafe_count_1500_price_500  -  0.8072312 
## 236 : cafe_count_3000 195 : cafe_count_1500_price_500  -  0.9741172 
## 240 : cafe_count_3000_na_price 195 : cafe_count_1500_price_500  -  0.9625666 
## 241 : cafe_count_3000_price_500 195 : cafe_count_1500_price_500  -  0.9758032 
## 242 : cafe_count_3000_price_1000 195 : cafe_count_1500_price_500  -  0.9683046 
## 243 : cafe_count_3000_price_1500 195 : cafe_count_1500_price_500  -  0.9727129 
## 244 : cafe_count_3000_price_2500 195 : cafe_count_1500_price_500  -  0.9686801 
## 245 : cafe_count_3000_price_4000 195 : cafe_count_1500_price_500  -  0.9623961 
## 246 : cafe_count_3000_price_high 195 : cafe_count_1500_price_500  -  0.8976427 
## 247 : big_church_count_3000 195 : cafe_count_1500_price_500  -  0.9377523 
## 248 : church_count_3000 195 : cafe_count_1500_price_500  -  0.9540422 
## 250 : leisure_count_3000 195 : cafe_count_1500_price_500  -  0.9744439 
## 255 : office_count_5000 195 : cafe_count_1500_price_500  -  0.8433943 
## 259 : cafe_count_5000 195 : cafe_count_1500_price_500  -  0.856946 
## 263 : cafe_count_5000_na_price 195 : cafe_count_1500_price_500  -  0.8520509 
## 264 : cafe_count_5000_price_500 195 : cafe_count_1500_price_500  -  0.8543935 
## 265 : cafe_count_5000_price_1000 195 : cafe_count_1500_price_500  -  0.848471 
## 266 : cafe_count_5000_price_1500 195 : cafe_count_1500_price_500  -  0.8585213 
## 267 : cafe_count_5000_price_2500 195 : cafe_count_1500_price_500  -  0.8556666 
## 268 : cafe_count_5000_price_4000 195 : cafe_count_1500_price_500  -  0.8477329 
## 269 : cafe_count_5000_price_high 195 : cafe_count_1500_price_500  -  0.8285232 
## 270 : big_church_count_5000 195 : cafe_count_1500_price_500  -  0.8447305 
## 271 : church_count_5000 195 : cafe_count_1500_price_500  -  0.8521576 
## 273 : leisure_count_5000 195 : cafe_count_1500_price_500  -  0.8600936 
## 197 : cafe_count_1500_price_1500 196 : cafe_count_1500_price_1000  -  0.9880628 
## 198 : cafe_count_1500_price_2500 196 : cafe_count_1500_price_1000  -  0.9806993 
## 199 : cafe_count_1500_price_4000 196 : cafe_count_1500_price_1000  -  0.9530771 
## 200 : cafe_count_1500_price_high 196 : cafe_count_1500_price_1000  -  0.8895135 
## 201 : big_church_count_1500 196 : cafe_count_1500_price_1000  -  0.9470019 
## 202 : church_count_1500 196 : cafe_count_1500_price_1000  -  0.9533927 
## 204 : leisure_count_1500 196 : cafe_count_1500_price_1000  -  0.9425851 
## 209 : office_count_2000 196 : cafe_count_1500_price_1000  -  0.9667522 
## 213 : cafe_count_2000 196 : cafe_count_1500_price_1000  -  0.9902175 
## 217 : cafe_count_2000_na_price 196 : cafe_count_1500_price_1000  -  0.9728325 
## 218 : cafe_count_2000_price_500 196 : cafe_count_1500_price_1000  -  0.9883579 
## 219 : cafe_count_2000_price_1000 196 : cafe_count_1500_price_1000  -  0.9930789 
## 220 : cafe_count_2000_price_1500 196 : cafe_count_1500_price_1000  -  0.9871533 
## 221 : cafe_count_2000_price_2500 196 : cafe_count_1500_price_1000  -  0.9818532 
## 222 : cafe_count_2000_price_4000 196 : cafe_count_1500_price_1000  -  0.9615817 
## 223 : cafe_count_2000_price_high 196 : cafe_count_1500_price_1000  -  0.9241081 
## 224 : big_church_count_2000 196 : cafe_count_1500_price_1000  -  0.9545717 
## 225 : church_count_2000 196 : cafe_count_1500_price_1000  -  0.9617977 
## 227 : leisure_count_2000 196 : cafe_count_1500_price_1000  -  0.9669751 
## 232 : office_count_3000 196 : cafe_count_1500_price_1000  -  0.9546135 
## 233 : office_sqm_3000 196 : cafe_count_1500_price_1000  -  0.8241462 
## 236 : cafe_count_3000 196 : cafe_count_1500_price_1000  -  0.9783634 
## 240 : cafe_count_3000_na_price 196 : cafe_count_1500_price_1000  -  0.9649857 
## 241 : cafe_count_3000_price_500 196 : cafe_count_1500_price_1000  -  0.9772381 
## 242 : cafe_count_3000_price_1000 196 : cafe_count_1500_price_1000  -  0.9770596 
## 243 : cafe_count_3000_price_1500 196 : cafe_count_1500_price_1000  -  0.9781049 
## 244 : cafe_count_3000_price_2500 196 : cafe_count_1500_price_1000  -  0.9720522 
## 245 : cafe_count_3000_price_4000 196 : cafe_count_1500_price_1000  -  0.9595251 
## 246 : cafe_count_3000_price_high 196 : cafe_count_1500_price_1000  -  0.8988159 
## 247 : big_church_count_3000 196 : cafe_count_1500_price_1000  -  0.9458602 
## 248 : church_count_3000 196 : cafe_count_1500_price_1000  -  0.9601062 
## 250 : leisure_count_3000 196 : cafe_count_1500_price_1000  -  0.9722574 
## 255 : office_count_5000 196 : cafe_count_1500_price_1000  -  0.8617318 
## 259 : cafe_count_5000 196 : cafe_count_1500_price_1000  -  0.8762628 
## 263 : cafe_count_5000_na_price 196 : cafe_count_1500_price_1000  -  0.8704272 
## 264 : cafe_count_5000_price_500 196 : cafe_count_1500_price_1000  -  0.872134 
## 265 : cafe_count_5000_price_1000 196 : cafe_count_1500_price_1000  -  0.8705503 
## 266 : cafe_count_5000_price_1500 196 : cafe_count_1500_price_1000  -  0.8795567 
## 267 : cafe_count_5000_price_2500 196 : cafe_count_1500_price_1000  -  0.8728197 
## 268 : cafe_count_5000_price_4000 196 : cafe_count_1500_price_1000  -  0.8614404 
## 269 : cafe_count_5000_price_high 196 : cafe_count_1500_price_1000  -  0.8375284 
## 270 : big_church_count_5000 196 : cafe_count_1500_price_1000  -  0.8658455 
## 271 : church_count_5000 196 : cafe_count_1500_price_1000  -  0.873197 
## 273 : leisure_count_5000 196 : cafe_count_1500_price_1000  -  0.8751141 
## 198 : cafe_count_1500_price_2500 197 : cafe_count_1500_price_1500  -  0.986683 
## 199 : cafe_count_1500_price_4000 197 : cafe_count_1500_price_1500  -  0.9723003 
## 200 : cafe_count_1500_price_high 197 : cafe_count_1500_price_1500  -  0.8942872 
## 201 : big_church_count_1500 197 : cafe_count_1500_price_1500  -  0.9663096 
## 202 : church_count_1500 197 : cafe_count_1500_price_1500  -  0.9669221 
## 204 : leisure_count_1500 197 : cafe_count_1500_price_1500  -  0.9421129 
## 209 : office_count_2000 197 : cafe_count_1500_price_1500  -  0.9608604 
## 213 : cafe_count_2000 197 : cafe_count_1500_price_1500  -  0.9934659 
## 217 : cafe_count_2000_na_price 197 : cafe_count_1500_price_1500  -  0.9800007 
## 218 : cafe_count_2000_price_500 197 : cafe_count_1500_price_1500  -  0.9872533 
## 219 : cafe_count_2000_price_1000 197 : cafe_count_1500_price_1500  -  0.9894293 
## 220 : cafe_count_2000_price_1500 197 : cafe_count_1500_price_1500  -  0.9958101 
## 221 : cafe_count_2000_price_2500 197 : cafe_count_1500_price_1500  -  0.9879199 
## 222 : cafe_count_2000_price_4000 197 : cafe_count_1500_price_1500  -  0.9764481 
## 223 : cafe_count_2000_price_high 197 : cafe_count_1500_price_1500  -  0.9320712 
## 224 : big_church_count_2000 197 : cafe_count_1500_price_1500  -  0.9710611 
## 225 : church_count_2000 197 : cafe_count_1500_price_1500  -  0.9722272 
## 227 : leisure_count_2000 197 : cafe_count_1500_price_1500  -  0.9756251 
## 232 : office_count_3000 197 : cafe_count_1500_price_1500  -  0.9504917 
## 233 : office_sqm_3000 197 : cafe_count_1500_price_1500  -  0.8080515 
## 236 : cafe_count_3000 197 : cafe_count_1500_price_1500  -  0.9768137 
## 240 : cafe_count_3000_na_price 197 : cafe_count_1500_price_1500  -  0.9652856 
## 241 : cafe_count_3000_price_500 197 : cafe_count_1500_price_1500  -  0.9731082 
## 242 : cafe_count_3000_price_1000 197 : cafe_count_1500_price_1500  -  0.970537 
## 243 : cafe_count_3000_price_1500 197 : cafe_count_1500_price_1500  -  0.9804188 
## 244 : cafe_count_3000_price_2500 197 : cafe_count_1500_price_1500  -  0.9721207 
## 245 : cafe_count_3000_price_4000 197 : cafe_count_1500_price_1500  -  0.9673562 
## 246 : cafe_count_3000_price_high 197 : cafe_count_1500_price_1500  -  0.8973944 
## 247 : big_church_count_3000 197 : cafe_count_1500_price_1500  -  0.9498973 
## 248 : church_count_3000 197 : cafe_count_1500_price_1500  -  0.9604447 
## 250 : leisure_count_3000 197 : cafe_count_1500_price_1500  -  0.9774377 
## 255 : office_count_5000 197 : cafe_count_1500_price_1500  -  0.847891 
## 259 : cafe_count_5000 197 : cafe_count_1500_price_1500  -  0.8621065 
## 263 : cafe_count_5000_na_price 197 : cafe_count_1500_price_1500  -  0.8582066 
## 264 : cafe_count_5000_price_500 197 : cafe_count_1500_price_1500  -  0.8560338 
## 265 : cafe_count_5000_price_1000 197 : cafe_count_1500_price_1500  -  0.8530695 
## 266 : cafe_count_5000_price_1500 197 : cafe_count_1500_price_1500  -  0.8667998 
## 267 : cafe_count_5000_price_2500 197 : cafe_count_1500_price_1500  -  0.8618944 
## 268 : cafe_count_5000_price_4000 197 : cafe_count_1500_price_1500  -  0.8537495 
## 269 : cafe_count_5000_price_high 197 : cafe_count_1500_price_1500  -  0.8300491 
## 270 : big_church_count_5000 197 : cafe_count_1500_price_1500  -  0.8561081 
## 271 : church_count_5000 197 : cafe_count_1500_price_1500  -  0.8591322 
## 273 : leisure_count_5000 197 : cafe_count_1500_price_1500  -  0.8650756 
## 199 : cafe_count_1500_price_4000 198 : cafe_count_1500_price_2500  -  0.9781661 
## 200 : cafe_count_1500_price_high 198 : cafe_count_1500_price_2500  -  0.9192803 
## 201 : big_church_count_1500 198 : cafe_count_1500_price_2500  -  0.9456491 
## 202 : church_count_1500 198 : cafe_count_1500_price_2500  -  0.9503677 
## 204 : leisure_count_1500 198 : cafe_count_1500_price_2500  -  0.9476245 
## 209 : office_count_2000 198 : cafe_count_1500_price_2500  -  0.958982 
## 213 : cafe_count_2000 198 : cafe_count_1500_price_2500  -  0.9904396 
## 217 : cafe_count_2000_na_price 198 : cafe_count_1500_price_2500  -  0.9749673 
## 218 : cafe_count_2000_price_500 198 : cafe_count_1500_price_2500  -  0.9838506 
## 219 : cafe_count_2000_price_1000 198 : cafe_count_1500_price_2500  -  0.9829797 
## 220 : cafe_count_2000_price_1500 198 : cafe_count_1500_price_2500  -  0.9871406 
## 221 : cafe_count_2000_price_2500 198 : cafe_count_1500_price_2500  -  0.9950858 
## 222 : cafe_count_2000_price_4000 198 : cafe_count_1500_price_2500  -  0.9854787 
## 223 : cafe_count_2000_price_high 198 : cafe_count_1500_price_2500  -  0.9524387 
## 224 : big_church_count_2000 198 : cafe_count_1500_price_2500  -  0.9513767 
## 225 : church_count_2000 198 : cafe_count_1500_price_2500  -  0.9567175 
## 227 : leisure_count_2000 198 : cafe_count_1500_price_2500  -  0.9755152 
## 232 : office_count_3000 198 : cafe_count_1500_price_2500  -  0.9475043 
## 233 : office_sqm_3000 198 : cafe_count_1500_price_2500  -  0.8133181 
## 236 : cafe_count_3000 198 : cafe_count_1500_price_2500  -  0.9759222 
## 240 : cafe_count_3000_na_price 198 : cafe_count_1500_price_2500  -  0.962665 
## 241 : cafe_count_3000_price_500 198 : cafe_count_1500_price_2500  -  0.9713839 
## 242 : cafe_count_3000_price_1000 198 : cafe_count_1500_price_2500  -  0.9670834 
## 243 : cafe_count_3000_price_1500 198 : cafe_count_1500_price_2500  -  0.9752491 
## 244 : cafe_count_3000_price_2500 198 : cafe_count_1500_price_2500  -  0.9788619 
## 245 : cafe_count_3000_price_4000 198 : cafe_count_1500_price_2500  -  0.9773545 
## 246 : cafe_count_3000_price_high 198 : cafe_count_1500_price_2500  -  0.9234475 
## 247 : big_church_count_3000 198 : cafe_count_1500_price_2500  -  0.9341508 
## 248 : church_count_3000 198 : cafe_count_1500_price_2500  -  0.948923 
## 250 : leisure_count_3000 198 : cafe_count_1500_price_2500  -  0.9777102 
## 255 : office_count_5000 198 : cafe_count_1500_price_2500  -  0.8508862 
## 259 : cafe_count_5000 198 : cafe_count_1500_price_2500  -  0.8653782 
## 263 : cafe_count_5000_na_price 198 : cafe_count_1500_price_2500  -  0.860449 
## 264 : cafe_count_5000_price_500 198 : cafe_count_1500_price_2500  -  0.8586401 
## 265 : cafe_count_5000_price_1000 198 : cafe_count_1500_price_2500  -  0.8535855 
## 266 : cafe_count_5000_price_1500 198 : cafe_count_1500_price_2500  -  0.8677385 
## 267 : cafe_count_5000_price_2500 198 : cafe_count_1500_price_2500  -  0.8705072 
## 268 : cafe_count_5000_price_4000 198 : cafe_count_1500_price_2500  -  0.8665418 
## 269 : cafe_count_5000_price_high 198 : cafe_count_1500_price_2500  -  0.8490876 
## 270 : big_church_count_5000 198 : cafe_count_1500_price_2500  -  0.8505554 
## 271 : church_count_5000 198 : cafe_count_1500_price_2500  -  0.8574936 
## 273 : leisure_count_5000 198 : cafe_count_1500_price_2500  -  0.8723425 
## 200 : cafe_count_1500_price_high 199 : cafe_count_1500_price_4000  -  0.9077797 
## 201 : big_church_count_1500 199 : cafe_count_1500_price_4000  -  0.9465274 
## 202 : church_count_1500 199 : cafe_count_1500_price_4000  -  0.9425939 
## 204 : leisure_count_1500 199 : cafe_count_1500_price_4000  -  0.9247817 
## 209 : office_count_2000 199 : cafe_count_1500_price_4000  -  0.9180984 
## 213 : cafe_count_2000 199 : cafe_count_1500_price_4000  -  0.9705031 
## 217 : cafe_count_2000_na_price 199 : cafe_count_1500_price_4000  -  0.9584363 
## 218 : cafe_count_2000_price_500 199 : cafe_count_1500_price_4000  -  0.9613434 
## 219 : cafe_count_2000_price_1000 199 : cafe_count_1500_price_4000  -  0.958152 
## 220 : cafe_count_2000_price_1500 199 : cafe_count_1500_price_4000  -  0.9678172 
## 221 : cafe_count_2000_price_2500 199 : cafe_count_1500_price_4000  -  0.975434 
## 222 : cafe_count_2000_price_4000 199 : cafe_count_1500_price_4000  -  0.9896196 
## 223 : cafe_count_2000_price_high 199 : cafe_count_1500_price_4000  -  0.9384832 
## 224 : big_church_count_2000 199 : cafe_count_1500_price_4000  -  0.9449054 
## 225 : church_count_2000 199 : cafe_count_1500_price_4000  -  0.9433939 
## 227 : leisure_count_2000 199 : cafe_count_1500_price_4000  -  0.965422 
## 232 : office_count_3000 199 : cafe_count_1500_price_4000  -  0.9087981 
## 236 : cafe_count_3000 199 : cafe_count_1500_price_4000  -  0.9438858 
## 240 : cafe_count_3000_na_price 199 : cafe_count_1500_price_4000  -  0.9348127 
## 241 : cafe_count_3000_price_500 199 : cafe_count_1500_price_4000  -  0.9385605 
## 242 : cafe_count_3000_price_1000 199 : cafe_count_1500_price_4000  -  0.9291625 
## 243 : cafe_count_3000_price_1500 199 : cafe_count_1500_price_4000  -  0.9444188 
## 244 : cafe_count_3000_price_2500 199 : cafe_count_1500_price_4000  -  0.9487937 
## 245 : cafe_count_3000_price_4000 199 : cafe_count_1500_price_4000  -  0.9608609 
## 246 : cafe_count_3000_price_high 199 : cafe_count_1500_price_4000  -  0.8916233 
## 247 : big_church_count_3000 199 : cafe_count_1500_price_4000  -  0.9028676 
## 248 : church_count_3000 199 : cafe_count_1500_price_4000  -  0.9156529 
## 250 : leisure_count_3000 199 : cafe_count_1500_price_4000  -  0.9607543 
## 259 : cafe_count_5000 199 : cafe_count_1500_price_4000  -  0.8039264 
## 263 : cafe_count_5000_na_price 199 : cafe_count_1500_price_4000  -  0.8031049 
## 266 : cafe_count_5000_price_1500 199 : cafe_count_1500_price_4000  -  0.8055064 
## 267 : cafe_count_5000_price_2500 199 : cafe_count_1500_price_4000  -  0.81104 
## 268 : cafe_count_5000_price_4000 199 : cafe_count_1500_price_4000  -  0.8141502 
## 273 : leisure_count_5000 199 : cafe_count_1500_price_4000  -  0.8149767 
## 201 : big_church_count_1500 200 : cafe_count_1500_price_high  -  0.8226739 
## 202 : church_count_1500 200 : cafe_count_1500_price_high  -  0.8231465 
## 204 : leisure_count_1500 200 : cafe_count_1500_price_high  -  0.8649334 
## 209 : office_count_2000 200 : cafe_count_1500_price_high  -  0.8806132 
## 213 : cafe_count_2000 200 : cafe_count_1500_price_high  -  0.9079338 
## 217 : cafe_count_2000_na_price 200 : cafe_count_1500_price_high  -  0.8915361 
## 218 : cafe_count_2000_price_500 200 : cafe_count_1500_price_high  -  0.899179 
## 219 : cafe_count_2000_price_1000 200 : cafe_count_1500_price_high  -  0.8946771 
## 220 : cafe_count_2000_price_1500 200 : cafe_count_1500_price_high  -  0.9000772 
## 221 : cafe_count_2000_price_2500 200 : cafe_count_1500_price_high  -  0.9205495 
## 222 : cafe_count_2000_price_4000 200 : cafe_count_1500_price_high  -  0.9260914 
## 223 : cafe_count_2000_price_high 200 : cafe_count_1500_price_high  -  0.9651985 
## 224 : big_church_count_2000 200 : cafe_count_1500_price_high  -  0.8265082 
## 225 : church_count_2000 200 : cafe_count_1500_price_high  -  0.8325293 
## 227 : leisure_count_2000 200 : cafe_count_1500_price_high  -  0.8860134 
## 232 : office_count_3000 200 : cafe_count_1500_price_high  -  0.8762281 
## 236 : cafe_count_3000 200 : cafe_count_1500_price_high  -  0.9094041 
## 240 : cafe_count_3000_na_price 200 : cafe_count_1500_price_high  -  0.8968676 
## 241 : cafe_count_3000_price_500 200 : cafe_count_1500_price_high  -  0.9039623 
## 242 : cafe_count_3000_price_1000 200 : cafe_count_1500_price_high  -  0.8962617 
## 243 : cafe_count_3000_price_1500 200 : cafe_count_1500_price_high  -  0.9002758 
## 244 : cafe_count_3000_price_2500 200 : cafe_count_1500_price_high  -  0.9231136 
## 245 : cafe_count_3000_price_4000 200 : cafe_count_1500_price_high  -  0.9322843 
## 246 : cafe_count_3000_price_high 200 : cafe_count_1500_price_high  -  0.9387867 
## 247 : big_church_count_3000 200 : cafe_count_1500_price_high  -  0.8208904 
## 248 : church_count_3000 200 : cafe_count_1500_price_high  -  0.8397554 
## 250 : leisure_count_3000 200 : cafe_count_1500_price_high  -  0.9029445 
## 259 : cafe_count_5000 200 : cafe_count_1500_price_high  -  0.8186455 
## 263 : cafe_count_5000_na_price 200 : cafe_count_1500_price_high  -  0.812042 
## 264 : cafe_count_5000_price_500 200 : cafe_count_1500_price_high  -  0.8129673 
## 265 : cafe_count_5000_price_1000 200 : cafe_count_1500_price_high  -  0.8016607 
## 266 : cafe_count_5000_price_1500 200 : cafe_count_1500_price_high  -  0.8147253 
## 267 : cafe_count_5000_price_2500 200 : cafe_count_1500_price_high  -  0.8321384 
## 268 : cafe_count_5000_price_4000 200 : cafe_count_1500_price_high  -  0.8405344 
## 269 : cafe_count_5000_price_high 200 : cafe_count_1500_price_high  -  0.8495281 
## 273 : leisure_count_5000 200 : cafe_count_1500_price_high  -  0.8243338 
## 202 : church_count_1500 201 : big_church_count_1500  -  0.9822897 
## 204 : leisure_count_1500 201 : big_church_count_1500  -  0.9046276 
## 209 : office_count_2000 201 : big_church_count_1500  -  0.9315102 
## 213 : cafe_count_2000 201 : big_church_count_1500  -  0.9603135 
## 217 : cafe_count_2000_na_price 201 : big_church_count_1500  -  0.9574319 
## 218 : cafe_count_2000_price_500 201 : big_church_count_1500  -  0.9546248 
## 219 : cafe_count_2000_price_1000 201 : big_church_count_1500  -  0.9556027 
## 220 : cafe_count_2000_price_1500 201 : big_church_count_1500  -  0.9643441 
## 221 : cafe_count_2000_price_2500 201 : big_church_count_1500  -  0.9512315 
## 222 : cafe_count_2000_price_4000 201 : big_church_count_1500  -  0.9420718 
## 223 : cafe_count_2000_price_high 201 : big_church_count_1500  -  0.8716127 
## 224 : big_church_count_2000 201 : big_church_count_1500  -  0.9918305 
## 225 : church_count_2000 201 : big_church_count_1500  -  0.9788784 
## 227 : leisure_count_2000 201 : big_church_count_1500  -  0.952172 
## 232 : office_count_3000 201 : big_church_count_1500  -  0.9283925 
## 236 : cafe_count_3000 201 : big_church_count_1500  -  0.9417124 
## 240 : cafe_count_3000_na_price 201 : big_church_count_1500  -  0.9398053 
## 241 : cafe_count_3000_price_500 201 : big_church_count_1500  -  0.9392199 
## 242 : cafe_count_3000_price_1000 201 : big_church_count_1500  -  0.9335187 
## 243 : cafe_count_3000_price_1500 201 : big_church_count_1500  -  0.9484457 
## 244 : cafe_count_3000_price_2500 201 : big_church_count_1500  -  0.9335511 
## 245 : cafe_count_3000_price_4000 201 : big_church_count_1500  -  0.9285981 
## 246 : cafe_count_3000_price_high 201 : big_church_count_1500  -  0.8256074 
## 247 : big_church_count_3000 201 : big_church_count_1500  -  0.9564435 
## 248 : church_count_3000 201 : big_church_count_1500  -  0.9530168 
## 250 : leisure_count_3000 201 : big_church_count_1500  -  0.9546502 
## 255 : office_count_5000 201 : big_church_count_1500  -  0.8227014 
## 259 : cafe_count_5000 201 : big_church_count_1500  -  0.8279208 
## 263 : cafe_count_5000_na_price 201 : big_church_count_1500  -  0.8282134 
## 264 : cafe_count_5000_price_500 201 : big_church_count_1500  -  0.8221183 
## 265 : cafe_count_5000_price_1000 201 : big_church_count_1500  -  0.817923 
## 266 : cafe_count_5000_price_1500 201 : big_church_count_1500  -  0.8341609 
## 267 : cafe_count_5000_price_2500 201 : big_church_count_1500  -  0.8268095 
## 268 : cafe_count_5000_price_4000 201 : big_church_count_1500  -  0.8186249 
## 270 : big_church_count_5000 201 : big_church_count_1500  -  0.8498457 
## 271 : church_count_5000 201 : big_church_count_1500  -  0.8402293 
## 273 : leisure_count_5000 201 : big_church_count_1500  -  0.8392408 
## 204 : leisure_count_1500 202 : church_count_1500  -  0.9119029 
## 209 : office_count_2000 202 : church_count_1500  -  0.9416749 
## 213 : cafe_count_2000 202 : church_count_1500  -  0.965242 
## 217 : cafe_count_2000_na_price 202 : church_count_1500  -  0.9572689 
## 218 : cafe_count_2000_price_500 202 : church_count_1500  -  0.9622541 
## 219 : cafe_count_2000_price_1000 202 : church_count_1500  -  0.9618292 
## 220 : cafe_count_2000_price_1500 202 : church_count_1500  -  0.9674167 
## 221 : cafe_count_2000_price_2500 202 : church_count_1500  -  0.9568906 
## 222 : cafe_count_2000_price_4000 202 : church_count_1500  -  0.9418805 
## 223 : cafe_count_2000_price_high 202 : church_count_1500  -  0.8745868 
## 224 : big_church_count_2000 202 : church_count_1500  -  0.9808335 
## 225 : church_count_2000 202 : church_count_1500  -  0.9927044 
## 227 : leisure_count_2000 202 : church_count_1500  -  0.9561314 
## 232 : office_count_3000 202 : church_count_1500  -  0.9375911 
## 236 : cafe_count_3000 202 : church_count_1500  -  0.9510748 
## 240 : cafe_count_3000_na_price 202 : church_count_1500  -  0.9437508 
## 241 : cafe_count_3000_price_500 202 : church_count_1500  -  0.9501504 
## 242 : cafe_count_3000_price_1000 202 : church_count_1500  -  0.9444729 
## 243 : cafe_count_3000_price_1500 202 : church_count_1500  -  0.9558613 
## 244 : cafe_count_3000_price_2500 202 : church_count_1500  -  0.9438992 
## 245 : cafe_count_3000_price_4000 202 : church_count_1500  -  0.9351695 
## 246 : cafe_count_3000_price_high 202 : church_count_1500  -  0.837881 
## 247 : big_church_count_3000 202 : church_count_1500  -  0.9506183 
## 248 : church_count_3000 202 : church_count_1500  -  0.9668901 
## 250 : leisure_count_3000 202 : church_count_1500  -  0.9619889 
## 255 : office_count_5000 202 : church_count_1500  -  0.8323462 
## 259 : cafe_count_5000 202 : church_count_1500  -  0.8420707 
## 263 : cafe_count_5000_na_price 202 : church_count_1500  -  0.8363002 
## 264 : cafe_count_5000_price_500 202 : church_count_1500  -  0.8377879 
## 265 : cafe_count_5000_price_1000 202 : church_count_1500  -  0.8332618 
## 266 : cafe_count_5000_price_1500 202 : church_count_1500  -  0.8469107 
## 267 : cafe_count_5000_price_2500 202 : church_count_1500  -  0.841217 
## 268 : cafe_count_5000_price_4000 202 : church_count_1500  -  0.8313883 
## 269 : cafe_count_5000_price_high 202 : church_count_1500  -  0.8001646 
## 270 : big_church_count_5000 202 : church_count_1500  -  0.8502163 
## 271 : church_count_5000 202 : church_count_1500  -  0.8523114 
## 273 : leisure_count_5000 202 : church_count_1500  -  0.8517993 
## 209 : office_count_2000 204 : leisure_count_1500  -  0.9249294 
## 213 : cafe_count_2000 204 : leisure_count_1500  -  0.9447339 
## 217 : cafe_count_2000_na_price 204 : leisure_count_1500  -  0.9320619 
## 218 : cafe_count_2000_price_500 204 : leisure_count_1500  -  0.939866 
## 219 : cafe_count_2000_price_1000 204 : leisure_count_1500  -  0.9397422 
## 220 : cafe_count_2000_price_1500 204 : leisure_count_1500  -  0.9417119 
## 221 : cafe_count_2000_price_2500 204 : leisure_count_1500  -  0.9453992 
## 222 : cafe_count_2000_price_4000 204 : leisure_count_1500  -  0.9347089 
## 223 : cafe_count_2000_price_high 204 : leisure_count_1500  -  0.8930109 
## 224 : big_church_count_2000 204 : leisure_count_1500  -  0.9153079 
## 225 : church_count_2000 204 : leisure_count_1500  -  0.9230786 
## 227 : leisure_count_2000 204 : leisure_count_1500  -  0.9705569 
## 232 : office_count_3000 204 : leisure_count_1500  -  0.9088143 
## 236 : cafe_count_3000 204 : leisure_count_1500  -  0.932192 
## 240 : cafe_count_3000_na_price 204 : leisure_count_1500  -  0.9204473 
## 241 : cafe_count_3000_price_500 204 : leisure_count_1500  -  0.9291528 
## 242 : cafe_count_3000_price_1000 204 : leisure_count_1500  -  0.9253091 
## 243 : cafe_count_3000_price_1500 204 : leisure_count_1500  -  0.9317362 
## 244 : cafe_count_3000_price_2500 204 : leisure_count_1500  -  0.9322546 
## 245 : cafe_count_3000_price_4000 204 : leisure_count_1500  -  0.9297442 
## 246 : cafe_count_3000_price_high 204 : leisure_count_1500  -  0.8626972 
## 247 : big_church_count_3000 204 : leisure_count_1500  -  0.9126847 
## 248 : church_count_3000 204 : leisure_count_1500  -  0.924875 
## 250 : leisure_count_3000 204 : leisure_count_1500  -  0.9493054 
## 255 : office_count_5000 204 : leisure_count_1500  -  0.815496 
## 259 : cafe_count_5000 204 : leisure_count_1500  -  0.8253172 
## 263 : cafe_count_5000_na_price 204 : leisure_count_1500  -  0.8152625 
## 264 : cafe_count_5000_price_500 204 : leisure_count_1500  -  0.8200369 
## 265 : cafe_count_5000_price_1000 204 : leisure_count_1500  -  0.8153758 
## 266 : cafe_count_5000_price_1500 204 : leisure_count_1500  -  0.8300811 
## 267 : cafe_count_5000_price_2500 204 : leisure_count_1500  -  0.8270922 
## 268 : cafe_count_5000_price_4000 204 : leisure_count_1500  -  0.8218279 
## 270 : big_church_count_5000 204 : leisure_count_1500  -  0.8291767 
## 271 : church_count_5000 204 : leisure_count_1500  -  0.8309757 
## 273 : leisure_count_5000 204 : leisure_count_1500  -  0.8421895 
## 228 : sport_count_2000 205 : sport_count_1500  -  0.9410394 
## 251 : sport_count_3000 205 : sport_count_1500  -  0.8772003 
## 274 : sport_count_5000 205 : sport_count_1500  -  0.8329066 
## 229 : market_count_2000 206 : market_count_1500  -  0.8556005 
## 230 : green_part_3000 207 : green_part_2000  -  0.9103976 
## 231 : prom_part_3000 208 : prom_part_2000  -  0.8229486 
## 210 : office_sqm_2000 209 : office_count_2000  -  0.8551663 
## 213 : cafe_count_2000 209 : office_count_2000  -  0.9750835 
## 217 : cafe_count_2000_na_price 209 : office_count_2000  -  0.9664944 
## 218 : cafe_count_2000_price_500 209 : office_count_2000  -  0.9740698 
## 219 : cafe_count_2000_price_1000 209 : office_count_2000  -  0.9741976 
## 220 : cafe_count_2000_price_1500 209 : office_count_2000  -  0.9723212 
## 221 : cafe_count_2000_price_2500 209 : office_count_2000  -  0.9686088 
## 222 : cafe_count_2000_price_4000 209 : office_count_2000  -  0.9422607 
## 223 : cafe_count_2000_price_high 209 : office_count_2000  -  0.9219563 
## 224 : big_church_count_2000 209 : office_count_2000  -  0.9471014 
## 225 : church_count_2000 209 : office_count_2000  -  0.9545946 
## 227 : leisure_count_2000 209 : office_count_2000  -  0.9472235 
## 232 : office_count_3000 209 : office_count_2000  -  0.9925305 
## 233 : office_sqm_3000 209 : office_count_2000  -  0.900523 
## 236 : cafe_count_3000 209 : office_count_2000  -  0.9873539 
## 240 : cafe_count_3000_na_price 209 : office_count_2000  -  0.9802733 
## 241 : cafe_count_3000_price_500 209 : office_count_2000  -  0.9866706 
## 242 : cafe_count_3000_price_1000 209 : office_count_2000  -  0.9854927 
## 243 : cafe_count_3000_price_1500 209 : office_count_2000  -  0.985983 
## 244 : cafe_count_3000_price_2500 209 : office_count_2000  -  0.9814792 
## 245 : cafe_count_3000_price_4000 209 : office_count_2000  -  0.9629592 
## 246 : cafe_count_3000_price_high 209 : office_count_2000  -  0.9205741 
## 247 : big_church_count_3000 209 : office_count_2000  -  0.969143 
## 248 : church_count_3000 209 : office_count_2000  -  0.9764038 
## 250 : leisure_count_3000 209 : office_count_2000  -  0.9697003 
## 255 : office_count_5000 209 : office_count_2000  -  0.9398094 
## 256 : office_sqm_5000 209 : office_count_2000  -  0.8536187 
## 259 : cafe_count_5000 209 : office_count_2000  -  0.9458283 
## 263 : cafe_count_5000_na_price 209 : office_count_2000  -  0.9397327 
## 264 : cafe_count_5000_price_500 209 : office_count_2000  -  0.9425377 
## 265 : cafe_count_5000_price_1000 209 : office_count_2000  -  0.9371734 
## 266 : cafe_count_5000_price_1500 209 : office_count_2000  -  0.9477986 
## 267 : cafe_count_5000_price_2500 209 : office_count_2000  -  0.9444695 
## 268 : cafe_count_5000_price_4000 209 : office_count_2000  -  0.935646 
## 269 : cafe_count_5000_price_high 209 : office_count_2000  -  0.9074853 
## 270 : big_church_count_5000 209 : office_count_2000  -  0.9378065 
## 271 : church_count_5000 209 : office_count_2000  -  0.9403047 
## 273 : leisure_count_5000 209 : office_count_2000  -  0.9460472 
## 232 : office_count_3000 210 : office_sqm_2000  -  0.8561592 
## 233 : office_sqm_3000 210 : office_sqm_2000  -  0.9513375 
## 236 : cafe_count_3000 210 : office_sqm_2000  -  0.8238426 
## 240 : cafe_count_3000_na_price 210 : office_sqm_2000  -  0.8209285 
## 241 : cafe_count_3000_price_500 210 : office_sqm_2000  -  0.8213758 
## 242 : cafe_count_3000_price_1000 210 : office_sqm_2000  -  0.8283335 
## 243 : cafe_count_3000_price_1500 210 : office_sqm_2000  -  0.8169184 
## 244 : cafe_count_3000_price_2500 210 : office_sqm_2000  -  0.8194447 
## 246 : cafe_count_3000_price_high 210 : office_sqm_2000  -  0.8254708 
## 255 : office_count_5000 210 : office_sqm_2000  -  0.8931149 
## 256 : office_sqm_5000 210 : office_sqm_2000  -  0.8935691 
## 259 : cafe_count_5000 210 : office_sqm_2000  -  0.8969701 
## 263 : cafe_count_5000_na_price 210 : office_sqm_2000  -  0.8923552 
## 264 : cafe_count_5000_price_500 210 : office_sqm_2000  -  0.8923851 
## 265 : cafe_count_5000_price_1000 210 : office_sqm_2000  -  0.8927153 
## 266 : cafe_count_5000_price_1500 210 : office_sqm_2000  -  0.8936662 
## 267 : cafe_count_5000_price_2500 210 : office_sqm_2000  -  0.8960985 
## 268 : cafe_count_5000_price_4000 210 : office_sqm_2000  -  0.8919159 
## 269 : cafe_count_5000_price_high 210 : office_sqm_2000  -  0.8841165 
## 270 : big_church_count_5000 210 : office_sqm_2000  -  0.8504428 
## 271 : church_count_5000 210 : office_sqm_2000  -  0.8611314 
## 273 : leisure_count_5000 210 : office_sqm_2000  -  0.8828442 
## 234 : trc_count_3000 211 : trc_count_2000  -  0.9174517 
## 235 : trc_sqm_3000 212 : trc_sqm_2000  -  0.8084027 
## 217 : cafe_count_2000_na_price 213 : cafe_count_2000  -  0.9873126 
## 218 : cafe_count_2000_price_500 213 : cafe_count_2000  -  0.9967452 
## 219 : cafe_count_2000_price_1000 213 : cafe_count_2000  -  0.9968843 
## 220 : cafe_count_2000_price_1500 213 : cafe_count_2000  -  0.9975857 
## 221 : cafe_count_2000_price_2500 213 : cafe_count_2000  -  0.9954746 
## 222 : cafe_count_2000_price_4000 213 : cafe_count_2000  -  0.9813456 
## 223 : cafe_count_2000_price_high 213 : cafe_count_2000  -  0.9464695 
## 224 : big_church_count_2000 213 : cafe_count_2000  -  0.9673183 
## 225 : church_count_2000 213 : cafe_count_2000  -  0.9723881 
## 227 : leisure_count_2000 213 : cafe_count_2000  -  0.9783515 
## 232 : office_count_3000 213 : cafe_count_2000  -  0.9660829 
## 233 : office_sqm_3000 213 : cafe_count_2000  -  0.834806 
## 236 : cafe_count_3000 213 : cafe_count_2000  -  0.9891946 
## 240 : cafe_count_3000_na_price 213 : cafe_count_2000  -  0.9785335 
## 241 : cafe_count_3000_price_500 213 : cafe_count_2000  -  0.9871911 
## 242 : cafe_count_3000_price_1000 213 : cafe_count_2000  -  0.9835539 
## 243 : cafe_count_3000_price_1500 213 : cafe_count_2000  -  0.9890947 
## 244 : cafe_count_3000_price_2500 213 : cafe_count_2000  -  0.9858383 
## 245 : cafe_count_3000_price_4000 213 : cafe_count_2000  -  0.9787527 
## 246 : cafe_count_3000_price_high 213 : cafe_count_2000  -  0.9191704 
## 247 : big_church_count_3000 213 : cafe_count_2000  -  0.9538307 
## 248 : church_count_3000 213 : cafe_count_2000  -  0.9675528 
## 250 : leisure_count_3000 213 : cafe_count_2000  -  0.9857583 
## 255 : office_count_5000 213 : cafe_count_2000  -  0.8721425 
## 259 : cafe_count_5000 213 : cafe_count_2000  -  0.8864725 
## 263 : cafe_count_5000_na_price 213 : cafe_count_2000  -  0.881549 
## 264 : cafe_count_5000_price_500 213 : cafe_count_2000  -  0.8817839 
## 265 : cafe_count_5000_price_1000 213 : cafe_count_2000  -  0.8774232 
## 266 : cafe_count_5000_price_1500 213 : cafe_count_2000  -  0.8890242 
## 267 : cafe_count_5000_price_2500 213 : cafe_count_2000  -  0.8865467 
## 268 : cafe_count_5000_price_4000 213 : cafe_count_2000  -  0.87925 
## 269 : cafe_count_5000_price_high 213 : cafe_count_2000  -  0.8582303 
## 270 : big_church_count_5000 213 : cafe_count_2000  -  0.8741863 
## 271 : church_count_5000 213 : cafe_count_2000  -  0.8801489 
## 273 : leisure_count_5000 213 : cafe_count_2000  -  0.8886561 
## 218 : cafe_count_2000_price_500 217 : cafe_count_2000_na_price  -  0.9829958 
## 219 : cafe_count_2000_price_1000 217 : cafe_count_2000_na_price  -  0.9801151 
## 220 : cafe_count_2000_price_1500 217 : cafe_count_2000_na_price  -  0.9843725 
## 221 : cafe_count_2000_price_2500 217 : cafe_count_2000_na_price  -  0.9810576 
## 222 : cafe_count_2000_price_4000 217 : cafe_count_2000_na_price  -  0.9701292 
## 223 : cafe_count_2000_price_high 217 : cafe_count_2000_na_price  -  0.9336056 
## 224 : big_church_count_2000 217 : cafe_count_2000_na_price  -  0.9656294 
## 225 : church_count_2000 217 : cafe_count_2000_na_price  -  0.9647906 
## 227 : leisure_count_2000 217 : cafe_count_2000_na_price  -  0.9647654 
## 232 : office_count_3000 217 : cafe_count_2000_na_price  -  0.9586264 
## 233 : office_sqm_3000 217 : cafe_count_2000_na_price  -  0.8321858 
## 236 : cafe_count_3000 217 : cafe_count_2000_na_price  -  0.9775325 
## 240 : cafe_count_3000_na_price 217 : cafe_count_2000_na_price  -  0.9819259 
## 241 : cafe_count_3000_price_500 217 : cafe_count_2000_na_price  -  0.9756004 
## 242 : cafe_count_3000_price_1000 217 : cafe_count_2000_na_price  -  0.9688621 
## 243 : cafe_count_3000_price_1500 217 : cafe_count_2000_na_price  -  0.9772062 
## 244 : cafe_count_3000_price_2500 217 : cafe_count_2000_na_price  -  0.9724468 
## 245 : cafe_count_3000_price_4000 217 : cafe_count_2000_na_price  -  0.9692551 
## 246 : cafe_count_3000_price_high 217 : cafe_count_2000_na_price  -  0.9062373 
## 247 : big_church_count_3000 217 : cafe_count_2000_na_price  -  0.9554111 
## 248 : church_count_3000 217 : cafe_count_2000_na_price  -  0.9616649 
## 250 : leisure_count_3000 217 : cafe_count_2000_na_price  -  0.9729617 
## 255 : office_count_5000 217 : cafe_count_2000_na_price  -  0.8697176 
## 259 : cafe_count_5000 217 : cafe_count_2000_na_price  -  0.8835786 
## 263 : cafe_count_5000_na_price 217 : cafe_count_2000_na_price  -  0.8878109 
## 264 : cafe_count_5000_price_500 217 : cafe_count_2000_na_price  -  0.879063 
## 265 : cafe_count_5000_price_1000 217 : cafe_count_2000_na_price  -  0.8720854 
## 266 : cafe_count_5000_price_1500 217 : cafe_count_2000_na_price  -  0.8854481 
## 267 : cafe_count_5000_price_2500 217 : cafe_count_2000_na_price  -  0.8830368 
## 268 : cafe_count_5000_price_4000 217 : cafe_count_2000_na_price  -  0.8805419 
## 269 : cafe_count_5000_price_high 217 : cafe_count_2000_na_price  -  0.8552176 
## 270 : big_church_count_5000 217 : cafe_count_2000_na_price  -  0.8757836 
## 271 : church_count_5000 217 : cafe_count_2000_na_price  -  0.8760077 
## 273 : leisure_count_5000 217 : cafe_count_2000_na_price  -  0.8824771 
## 219 : cafe_count_2000_price_1000 218 : cafe_count_2000_price_500  -  0.9943349 
## 220 : cafe_count_2000_price_1500 218 : cafe_count_2000_price_500  -  0.9913126 
## 221 : cafe_count_2000_price_2500 218 : cafe_count_2000_price_500  -  0.9888685 
## 222 : cafe_count_2000_price_4000 218 : cafe_count_2000_price_500  -  0.9716405 
## 223 : cafe_count_2000_price_high 218 : cafe_count_2000_price_500  -  0.9372411 
## 224 : big_church_count_2000 218 : cafe_count_2000_price_500  -  0.9615375 
## 225 : church_count_2000 218 : cafe_count_2000_price_500  -  0.969488 
## 227 : leisure_count_2000 218 : cafe_count_2000_price_500  -  0.9726963 
## 232 : office_count_3000 218 : cafe_count_2000_price_500  -  0.964109 
## 233 : office_sqm_3000 218 : cafe_count_2000_price_500  -  0.8322768 
## 236 : cafe_count_3000 218 : cafe_count_2000_price_500  -  0.9860313 
## 240 : cafe_count_3000_na_price 218 : cafe_count_2000_price_500  -  0.9748153 
## 241 : cafe_count_3000_price_500 218 : cafe_count_2000_price_500  -  0.9878648 
## 242 : cafe_count_3000_price_1000 218 : cafe_count_2000_price_500  -  0.9813733 
## 243 : cafe_count_3000_price_1500 218 : cafe_count_2000_price_500  -  0.9837056 
## 244 : cafe_count_3000_price_2500 218 : cafe_count_2000_price_500  -  0.9806233 
## 245 : cafe_count_3000_price_4000 218 : cafe_count_2000_price_500  -  0.9709987 
## 246 : cafe_count_3000_price_high 218 : cafe_count_2000_price_500  -  0.9124394 
## 247 : big_church_count_3000 218 : cafe_count_2000_price_500  -  0.9481183 
## 248 : church_count_3000 218 : cafe_count_2000_price_500  -  0.964785 
## 250 : leisure_count_3000 218 : cafe_count_2000_price_500  -  0.9810734 
## 255 : office_count_5000 218 : cafe_count_2000_price_500  -  0.8696408 
## 259 : cafe_count_5000 218 : cafe_count_2000_price_500  -  0.8830102 
## 263 : cafe_count_5000_na_price 218 : cafe_count_2000_price_500  -  0.876754 
## 264 : cafe_count_5000_price_500 218 : cafe_count_2000_price_500  -  0.8810263 
## 265 : cafe_count_5000_price_1000 218 : cafe_count_2000_price_500  -  0.8751144 
## 266 : cafe_count_5000_price_1500 218 : cafe_count_2000_price_500  -  0.8841225 
## 267 : cafe_count_5000_price_2500 218 : cafe_count_2000_price_500  -  0.8811365 
## 268 : cafe_count_5000_price_4000 218 : cafe_count_2000_price_500  -  0.8721433 
## 269 : cafe_count_5000_price_high 218 : cafe_count_2000_price_500  -  0.8530831 
## 270 : big_church_count_5000 218 : cafe_count_2000_price_500  -  0.8687972 
## 271 : church_count_5000 218 : cafe_count_2000_price_500  -  0.8773466 
## 273 : leisure_count_5000 218 : cafe_count_2000_price_500  -  0.8845589 
## 220 : cafe_count_2000_price_1500 219 : cafe_count_2000_price_1000  -  0.9939197 
## 221 : cafe_count_2000_price_2500 219 : cafe_count_2000_price_1000  -  0.9883219 
## 222 : cafe_count_2000_price_4000 219 : cafe_count_2000_price_1000  -  0.9685044 
## 223 : cafe_count_2000_price_high 219 : cafe_count_2000_price_1000  -  0.9327191 
## 224 : big_church_count_2000 219 : cafe_count_2000_price_1000  -  0.9632343 
## 225 : church_count_2000 219 : cafe_count_2000_price_1000  -  0.9698993 
## 227 : leisure_count_2000 219 : cafe_count_2000_price_1000  -  0.9724411 
## 232 : office_count_3000 219 : cafe_count_2000_price_1000  -  0.9654387 
## 233 : office_sqm_3000 219 : cafe_count_2000_price_1000  -  0.8372245 
## 236 : cafe_count_3000 219 : cafe_count_2000_price_1000  -  0.9870061 
## 240 : cafe_count_3000_na_price 219 : cafe_count_2000_price_1000  -  0.9738048 
## 241 : cafe_count_3000_price_500 219 : cafe_count_2000_price_1000  -  0.9856983 
## 242 : cafe_count_3000_price_1000 219 : cafe_count_2000_price_1000  -  0.9855709 
## 243 : cafe_count_3000_price_1500 219 : cafe_count_2000_price_1000  -  0.9871194 
## 244 : cafe_count_3000_price_2500 219 : cafe_count_2000_price_1000  -  0.9805293 
## 245 : cafe_count_3000_price_4000 219 : cafe_count_2000_price_1000  -  0.9676419 
## 246 : cafe_count_3000_price_high 219 : cafe_count_2000_price_1000  -  0.9065654 
## 247 : big_church_count_3000 219 : cafe_count_2000_price_1000  -  0.9528064 
## 248 : church_count_3000 219 : cafe_count_2000_price_1000  -  0.9678845 
## 250 : leisure_count_3000 219 : cafe_count_2000_price_1000  -  0.9804019 
## 255 : office_count_5000 219 : cafe_count_2000_price_1000  -  0.8745426 
## 259 : cafe_count_5000 219 : cafe_count_2000_price_1000  -  0.8891394 
## 263 : cafe_count_5000_na_price 219 : cafe_count_2000_price_1000  -  0.8823495 
## 264 : cafe_count_5000_price_500 219 : cafe_count_2000_price_1000  -  0.8850898 
## 265 : cafe_count_5000_price_1000 219 : cafe_count_2000_price_1000  -  0.8834662 
## 266 : cafe_count_5000_price_1500 219 : cafe_count_2000_price_1000  -  0.8922751 
## 267 : cafe_count_5000_price_2500 219 : cafe_count_2000_price_1000  -  0.8858911 
## 268 : cafe_count_5000_price_4000 219 : cafe_count_2000_price_1000  -  0.8740586 
## 269 : cafe_count_5000_price_high 219 : cafe_count_2000_price_1000  -  0.850669 
## 270 : big_church_count_5000 219 : cafe_count_2000_price_1000  -  0.8776171 
## 271 : church_count_5000 219 : cafe_count_2000_price_1000  -  0.8851453 
## 273 : leisure_count_5000 219 : cafe_count_2000_price_1000  -  0.887937 
## 221 : cafe_count_2000_price_2500 220 : cafe_count_2000_price_1500  -  0.9920949 
## 222 : cafe_count_2000_price_4000 220 : cafe_count_2000_price_1500  -  0.9777107 
## 223 : cafe_count_2000_price_high 220 : cafe_count_2000_price_1500  -  0.9394437 
## 224 : big_church_count_2000 220 : cafe_count_2000_price_1500  -  0.9713528 
## 225 : church_count_2000 220 : cafe_count_2000_price_1500  -  0.974176 
## 227 : leisure_count_2000 220 : cafe_count_2000_price_1500  -  0.9763696 
## 232 : office_count_3000 220 : cafe_count_2000_price_1500  -  0.9638266 
## 233 : office_sqm_3000 220 : cafe_count_2000_price_1500  -  0.8296528 
## 236 : cafe_count_3000 220 : cafe_count_2000_price_1500  -  0.9865895 
## 240 : cafe_count_3000_na_price 220 : cafe_count_2000_price_1500  -  0.9755545 
## 241 : cafe_count_3000_price_500 220 : cafe_count_2000_price_1500  -  0.9826373 
## 242 : cafe_count_3000_price_1000 220 : cafe_count_2000_price_1500  -  0.9810464 
## 243 : cafe_count_3000_price_1500 220 : cafe_count_2000_price_1500  -  0.9896687 
## 244 : cafe_count_3000_price_2500 220 : cafe_count_2000_price_1500  -  0.9821967 
## 245 : cafe_count_3000_price_4000 220 : cafe_count_2000_price_1500  -  0.9748069 
## 246 : cafe_count_3000_price_high 220 : cafe_count_2000_price_1500  -  0.9106023 
## 247 : big_church_count_3000 220 : cafe_count_2000_price_1500  -  0.9580929 
## 248 : church_count_3000 220 : cafe_count_2000_price_1500  -  0.9690167 
## 250 : leisure_count_3000 220 : cafe_count_2000_price_1500  -  0.9831217 
## 255 : office_count_5000 220 : cafe_count_2000_price_1500  -  0.8693866 
## 259 : cafe_count_5000 220 : cafe_count_2000_price_1500  -  0.8839013 
## 263 : cafe_count_5000_na_price 220 : cafe_count_2000_price_1500  -  0.879204 
## 264 : cafe_count_5000_price_500 220 : cafe_count_2000_price_1500  -  0.877846 
## 265 : cafe_count_5000_price_1000 220 : cafe_count_2000_price_1500  -  0.8748946 
## 266 : cafe_count_5000_price_1500 220 : cafe_count_2000_price_1500  -  0.8883677 
## 267 : cafe_count_5000_price_2500 220 : cafe_count_2000_price_1500  -  0.8837202 
## 268 : cafe_count_5000_price_4000 220 : cafe_count_2000_price_1500  -  0.8756193 
## 269 : cafe_count_5000_price_high 220 : cafe_count_2000_price_1500  -  0.8512475 
## 270 : big_church_count_5000 220 : cafe_count_2000_price_1500  -  0.8758013 
## 271 : church_count_5000 220 : cafe_count_2000_price_1500  -  0.8794583 
## 273 : leisure_count_5000 220 : cafe_count_2000_price_1500  -  0.8860514 
## 222 : cafe_count_2000_price_4000 221 : cafe_count_2000_price_2500  -  0.9882453 
## 223 : cafe_count_2000_price_high 221 : cafe_count_2000_price_2500  -  0.9584033 
## 224 : big_church_count_2000 221 : cafe_count_2000_price_2500  -  0.9580534 
## 225 : church_count_2000 221 : cafe_count_2000_price_2500  -  0.9637332 
## 227 : leisure_count_2000 221 : cafe_count_2000_price_2500  -  0.9784971 
## 232 : office_count_3000 221 : cafe_count_2000_price_2500  -  0.9595969 
## 233 : office_sqm_3000 221 : cafe_count_2000_price_2500  -  0.8292397 
## 236 : cafe_count_3000 221 : cafe_count_2000_price_2500  -  0.9849659 
## 240 : cafe_count_3000_na_price 221 : cafe_count_2000_price_2500  -  0.9729959 
## 241 : cafe_count_3000_price_500 221 : cafe_count_2000_price_2500  -  0.9805952 
## 242 : cafe_count_3000_price_1000 221 : cafe_count_2000_price_2500  -  0.9762003 
## 243 : cafe_count_3000_price_1500 221 : cafe_count_2000_price_2500  -  0.984038 
## 244 : cafe_count_3000_price_2500 221 : cafe_count_2000_price_2500  -  0.9877676 
## 245 : cafe_count_3000_price_4000 221 : cafe_count_2000_price_2500  -  0.9847946 
## 246 : cafe_count_3000_price_high 221 : cafe_count_2000_price_2500  -  0.9320715 
## 247 : big_church_count_3000 221 : cafe_count_2000_price_2500  -  0.9430422 
## 248 : church_count_3000 221 : cafe_count_2000_price_2500  -  0.9575524 
## 250 : leisure_count_3000 221 : cafe_count_2000_price_2500  -  0.9853469 
## 255 : office_count_5000 221 : cafe_count_2000_price_2500  -  0.8664551 
## 259 : cafe_count_5000 221 : cafe_count_2000_price_2500  -  0.8811005 
## 263 : cafe_count_5000_na_price 221 : cafe_count_2000_price_2500  -  0.8757509 
## 264 : cafe_count_5000_price_500 221 : cafe_count_2000_price_2500  -  0.8744334 
## 265 : cafe_count_5000_price_1000 221 : cafe_count_2000_price_2500  -  0.8691143 
## 266 : cafe_count_5000_price_1500 221 : cafe_count_2000_price_2500  -  0.8831751 
## 267 : cafe_count_5000_price_2500 221 : cafe_count_2000_price_2500  -  0.8863747 
## 268 : cafe_count_5000_price_4000 221 : cafe_count_2000_price_2500  -  0.8828073 
## 269 : cafe_count_5000_price_high 221 : cafe_count_2000_price_2500  -  0.865648 
## 270 : big_church_count_5000 221 : cafe_count_2000_price_2500  -  0.865676 
## 271 : church_count_5000 221 : cafe_count_2000_price_2500  -  0.8720542 
## 273 : leisure_count_5000 221 : cafe_count_2000_price_2500  -  0.8876015 
## 223 : cafe_count_2000_price_high 222 : cafe_count_2000_price_4000  -  0.9603656 
## 224 : big_church_count_2000 222 : cafe_count_2000_price_4000  -  0.9455935 
## 225 : church_count_2000 222 : cafe_count_2000_price_4000  -  0.9462218 
## 227 : leisure_count_2000 222 : cafe_count_2000_price_4000  -  0.9704794 
## 232 : office_count_3000 222 : cafe_count_2000_price_4000  -  0.9330519 
## 233 : office_sqm_3000 222 : cafe_count_2000_price_4000  -  0.8001576 
## 236 : cafe_count_3000 222 : cafe_count_2000_price_4000  -  0.9645293 
## 240 : cafe_count_3000_na_price 222 : cafe_count_2000_price_4000  -  0.9561256 
## 241 : cafe_count_3000_price_500 222 : cafe_count_2000_price_4000  -  0.9585631 
## 242 : cafe_count_3000_price_1000 222 : cafe_count_2000_price_4000  -  0.9502257 
## 243 : cafe_count_3000_price_1500 222 : cafe_count_2000_price_4000  -  0.9632281 
## 244 : cafe_count_3000_price_2500 222 : cafe_count_2000_price_4000  -  0.9708786 
## 245 : cafe_count_3000_price_4000 222 : cafe_count_2000_price_4000  -  0.9822554 
## 246 : cafe_count_3000_price_high 222 : cafe_count_2000_price_4000  -  0.9253818 
## 247 : big_church_count_3000 222 : cafe_count_2000_price_4000  -  0.9197715 
## 248 : church_count_3000 222 : cafe_count_2000_price_4000  -  0.9317659 
## 250 : leisure_count_3000 222 : cafe_count_2000_price_4000  -  0.9727461 
## 255 : office_count_5000 222 : cafe_count_2000_price_4000  -  0.8298458 
## 259 : cafe_count_5000 222 : cafe_count_2000_price_4000  -  0.8435084 
## 263 : cafe_count_5000_na_price 222 : cafe_count_2000_price_4000  -  0.8422472 
## 264 : cafe_count_5000_price_500 222 : cafe_count_2000_price_4000  -  0.8362311 
## 265 : cafe_count_5000_price_1000 222 : cafe_count_2000_price_4000  -  0.8280568 
## 266 : cafe_count_5000_price_1500 222 : cafe_count_2000_price_4000  -  0.8444696 
## 267 : cafe_count_5000_price_2500 222 : cafe_count_2000_price_4000  -  0.8515995 
## 268 : cafe_count_5000_price_4000 222 : cafe_count_2000_price_4000  -  0.8561721 
## 269 : cafe_count_5000_price_high 222 : cafe_count_2000_price_4000  -  0.842847 
## 270 : big_church_count_5000 222 : cafe_count_2000_price_4000  -  0.8286496 
## 271 : church_count_5000 222 : cafe_count_2000_price_4000  -  0.8309439 
## 273 : leisure_count_5000 222 : cafe_count_2000_price_4000  -  0.8542631 
## 224 : big_church_count_2000 223 : cafe_count_2000_price_high  -  0.8779053 
## 225 : church_count_2000 223 : cafe_count_2000_price_high  -  0.8816452 
## 227 : leisure_count_2000 223 : cafe_count_2000_price_high  -  0.9254348 
## 232 : office_count_3000 223 : cafe_count_2000_price_high  -  0.9168861 
## 233 : office_sqm_3000 223 : cafe_count_2000_price_high  -  0.828094 
## 236 : cafe_count_3000 223 : cafe_count_2000_price_high  -  0.9461836 
## 240 : cafe_count_3000_na_price 223 : cafe_count_2000_price_high  -  0.9353613 
## 241 : cafe_count_3000_price_500 223 : cafe_count_2000_price_high  -  0.9402256 
## 242 : cafe_count_3000_price_1000 223 : cafe_count_2000_price_high  -  0.9317595 
## 243 : cafe_count_3000_price_1500 223 : cafe_count_2000_price_high  -  0.9386635 
## 244 : cafe_count_3000_price_2500 223 : cafe_count_2000_price_high  -  0.9585853 
## 245 : cafe_count_3000_price_4000 223 : cafe_count_2000_price_high  -  0.9694541 
## 246 : cafe_count_3000_price_high 223 : cafe_count_2000_price_high  -  0.9690883 
## 247 : big_church_count_3000 223 : cafe_count_2000_price_high  -  0.8653985 
## 248 : church_count_3000 223 : cafe_count_2000_price_high  -  0.8816767 
## 250 : leisure_count_3000 223 : cafe_count_2000_price_high  -  0.9414055 
## 255 : office_count_5000 223 : cafe_count_2000_price_high  -  0.8352581 
## 259 : cafe_count_5000 223 : cafe_count_2000_price_high  -  0.8564972 
## 263 : cafe_count_5000_na_price 223 : cafe_count_2000_price_high  -  0.8524446 
## 264 : cafe_count_5000_price_500 223 : cafe_count_2000_price_high  -  0.8493971 
## 265 : cafe_count_5000_price_1000 223 : cafe_count_2000_price_high  -  0.8378401 
## 266 : cafe_count_5000_price_1500 223 : cafe_count_2000_price_high  -  0.8529661 
## 267 : cafe_count_5000_price_2500 223 : cafe_count_2000_price_high  -  0.8709185 
## 268 : cafe_count_5000_price_4000 223 : cafe_count_2000_price_high  -  0.882054 
## 269 : cafe_count_5000_price_high 223 : cafe_count_2000_price_high  -  0.8877692 
## 270 : big_church_count_5000 223 : cafe_count_2000_price_high  -  0.8109247 
## 271 : church_count_5000 223 : cafe_count_2000_price_high  -  0.8211687 
## 273 : leisure_count_5000 223 : cafe_count_2000_price_high  -  0.8629547 
## 225 : church_count_2000 224 : big_church_count_2000  -  0.9859596 
## 227 : leisure_count_2000 224 : big_church_count_2000  -  0.9586736 
## 232 : office_count_3000 224 : big_church_count_2000  -  0.9432464 
## 236 : cafe_count_3000 224 : big_church_count_2000  -  0.9532929 
## 240 : cafe_count_3000_na_price 224 : big_church_count_2000  -  0.951857 
## 241 : cafe_count_3000_price_500 224 : big_church_count_2000  -  0.9507188 
## 242 : cafe_count_3000_price_1000 224 : big_church_count_2000  -  0.9458801 
## 243 : cafe_count_3000_price_1500 224 : big_church_count_2000  -  0.959883 
## 244 : cafe_count_3000_price_2500 224 : big_church_count_2000  -  0.944648 
## 245 : cafe_count_3000_price_4000 224 : big_church_count_2000  -  0.9376104 
## 246 : cafe_count_3000_price_high 224 : big_church_count_2000  -  0.8378489 
## 247 : big_church_count_3000 224 : big_church_count_2000  -  0.9724784 
## 248 : church_count_3000 224 : big_church_count_2000  -  0.9674442 
## 250 : leisure_count_3000 224 : big_church_count_2000  -  0.9626856 
## 255 : office_count_5000 224 : big_church_count_2000  -  0.8454371 
## 259 : cafe_count_5000 224 : big_church_count_2000  -  0.8508991 
## 263 : cafe_count_5000_na_price 224 : big_church_count_2000  -  0.851428 
## 264 : cafe_count_5000_price_500 224 : big_church_count_2000  -  0.8450917 
## 265 : cafe_count_5000_price_1000 224 : big_church_count_2000  -  0.8411238 
## 266 : cafe_count_5000_price_1500 224 : big_church_count_2000  -  0.8572645 
## 267 : cafe_count_5000_price_2500 224 : big_church_count_2000  -  0.8489705 
## 268 : cafe_count_5000_price_4000 224 : big_church_count_2000  -  0.8409884 
## 269 : cafe_count_5000_price_high 224 : big_church_count_2000  -  0.8003047 
## 270 : big_church_count_5000 224 : big_church_count_2000  -  0.8744456 
## 271 : church_count_5000 224 : big_church_count_2000  -  0.8638308 
## 273 : leisure_count_5000 224 : big_church_count_2000  -  0.8620509 
## 227 : leisure_count_2000 225 : church_count_2000  -  0.9623376 
## 232 : office_count_3000 225 : church_count_2000  -  0.9508197 
## 236 : cafe_count_3000 225 : church_count_2000  -  0.9623933 
## 240 : cafe_count_3000_na_price 225 : church_count_2000  -  0.9549476 
## 241 : cafe_count_3000_price_500 225 : church_count_2000  -  0.9616863 
## 242 : cafe_count_3000_price_1000 225 : church_count_2000  -  0.9570557 
## 243 : cafe_count_3000_price_1500 225 : church_count_2000  -  0.9665259 
## 244 : cafe_count_3000_price_2500 225 : church_count_2000  -  0.9547467 
## 245 : cafe_count_3000_price_4000 225 : church_count_2000  -  0.9435213 
## 246 : cafe_count_3000_price_high 225 : church_count_2000  -  0.8493043 
## 247 : big_church_count_3000 225 : church_count_2000  -  0.9633119 
## 248 : church_count_3000 225 : church_count_2000  -  0.9802465 
## 250 : leisure_count_3000 225 : church_count_2000  -  0.9699196 
## 255 : office_count_5000 225 : church_count_2000  -  0.8526636 
## 259 : cafe_count_5000 225 : church_count_2000  -  0.8625867 
## 263 : cafe_count_5000_na_price 225 : church_count_2000  -  0.8560634 
## 264 : cafe_count_5000_price_500 225 : church_count_2000  -  0.8586564 
## 265 : cafe_count_5000_price_1000 225 : church_count_2000  -  0.8543166 
## 266 : cafe_count_5000_price_1500 225 : church_count_2000  -  0.8672442 
## 267 : cafe_count_5000_price_2500 225 : church_count_2000  -  0.8610459 
## 268 : cafe_count_5000_price_4000 225 : church_count_2000  -  0.8505093 
## 269 : cafe_count_5000_price_high 225 : church_count_2000  -  0.8171164 
## 270 : big_church_count_5000 225 : church_count_2000  -  0.8705921 
## 271 : church_count_5000 225 : church_count_2000  -  0.8744412 
## 273 : leisure_count_5000 225 : church_count_2000  -  0.8722146 
## 232 : office_count_3000 227 : leisure_count_2000  -  0.9356046 
## 236 : cafe_count_3000 227 : leisure_count_2000  -  0.9603798 
## 240 : cafe_count_3000_na_price 227 : leisure_count_2000  -  0.9483928 
## 241 : cafe_count_3000_price_500 227 : leisure_count_2000  -  0.9572581 
## 242 : cafe_count_3000_price_1000 227 : leisure_count_2000  -  0.9512388 
## 243 : cafe_count_3000_price_1500 227 : leisure_count_2000  -  0.9610464 
## 244 : cafe_count_3000_price_2500 227 : leisure_count_2000  -  0.9608182 
## 245 : cafe_count_3000_price_4000 227 : leisure_count_2000  -  0.960907 
## 246 : cafe_count_3000_price_high 227 : leisure_count_2000  -  0.8860358 
## 247 : big_church_count_3000 227 : leisure_count_2000  -  0.9360212 
## 248 : church_count_3000 227 : leisure_count_2000  -  0.9490478 
## 250 : leisure_count_3000 227 : leisure_count_2000  -  0.9822442 
## 255 : office_count_5000 227 : leisure_count_2000  -  0.8285537 
## 259 : cafe_count_5000 227 : leisure_count_2000  -  0.8392285 
## 263 : cafe_count_5000_na_price 227 : leisure_count_2000  -  0.8309608 
## 264 : cafe_count_5000_price_500 227 : leisure_count_2000  -  0.8335285 
## 265 : cafe_count_5000_price_1000 227 : leisure_count_2000  -  0.8279949 
## 266 : cafe_count_5000_price_1500 227 : leisure_count_2000  -  0.8433669 
## 267 : cafe_count_5000_price_2500 227 : leisure_count_2000  -  0.8423832 
## 268 : cafe_count_5000_price_4000 227 : leisure_count_2000  -  0.8385629 
## 269 : cafe_count_5000_price_high 227 : leisure_count_2000  -  0.8124392 
## 270 : big_church_count_5000 227 : leisure_count_2000  -  0.8411048 
## 271 : church_count_5000 227 : leisure_count_2000  -  0.8426101 
## 273 : leisure_count_5000 227 : leisure_count_2000  -  0.8559613 
## 234 : trc_count_3000 228 : sport_count_2000  -  0.8472293 
## 251 : sport_count_3000 228 : sport_count_2000  -  0.9455181 
## 257 : trc_count_5000 228 : sport_count_2000  -  0.8434135 
## 263 : cafe_count_5000_na_price 228 : sport_count_2000  -  0.8047753 
## 264 : cafe_count_5000_price_500 228 : sport_count_2000  -  0.801809 
## 265 : cafe_count_5000_price_1000 228 : sport_count_2000  -  0.8155165 
## 274 : sport_count_5000 228 : sport_count_2000  -  0.8906538 
## 253 : green_part_5000 230 : green_part_3000  -  0.8891496 
## 233 : office_sqm_3000 232 : office_count_3000  -  0.9202113 
## 236 : cafe_count_3000 232 : office_count_3000  -  0.9869608 
## 240 : cafe_count_3000_na_price 232 : office_count_3000  -  0.9809454 
## 241 : cafe_count_3000_price_500 232 : office_count_3000  -  0.9863118 
## 242 : cafe_count_3000_price_1000 232 : office_count_3000  -  0.9861584 
## 243 : cafe_count_3000_price_1500 232 : office_count_3000  -  0.9854589 
## 244 : cafe_count_3000_price_2500 232 : office_count_3000  -  0.9806006 
## 245 : cafe_count_3000_price_4000 232 : office_count_3000  -  0.9587721 
## 246 : cafe_count_3000_price_high 232 : office_count_3000  -  0.9195891 
## 247 : big_church_count_3000 232 : office_count_3000  -  0.9696657 
## 248 : church_count_3000 232 : office_count_3000  -  0.9759579 
## 250 : leisure_count_3000 232 : office_count_3000  -  0.9663702 
## 255 : office_count_5000 232 : office_count_3000  -  0.9597162 
## 256 : office_sqm_5000 232 : office_count_3000  -  0.8792707 
## 259 : cafe_count_5000 232 : office_count_3000  -  0.9640475 
## 263 : cafe_count_5000_na_price 232 : office_count_3000  -  0.9572915 
## 264 : cafe_count_5000_price_500 232 : office_count_3000  -  0.9614682 
## 265 : cafe_count_5000_price_1000 232 : office_count_3000  -  0.956501 
## 266 : cafe_count_5000_price_1500 232 : office_count_3000  -  0.9654294 
## 267 : cafe_count_5000_price_2500 232 : office_count_3000  -  0.9619206 
## 268 : cafe_count_5000_price_4000 232 : office_count_3000  -  0.9504074 
## 269 : cafe_count_5000_price_high 232 : office_count_3000  -  0.9220918 
## 270 : big_church_count_5000 232 : office_count_3000  -  0.9557522 
## 271 : church_count_5000 232 : office_count_3000  -  0.9588449 
## 273 : leisure_count_5000 232 : office_count_3000  -  0.9619904 
## 236 : cafe_count_3000 233 : office_sqm_3000  -  0.8840995 
## 240 : cafe_count_3000_na_price 233 : office_sqm_3000  -  0.8822518 
## 241 : cafe_count_3000_price_500 233 : office_sqm_3000  -  0.8818228 
## 242 : cafe_count_3000_price_1000 233 : office_sqm_3000  -  0.8896214 
## 243 : cafe_count_3000_price_1500 233 : office_sqm_3000  -  0.8783422 
## 244 : cafe_count_3000_price_2500 233 : office_sqm_3000  -  0.8774654 
## 245 : cafe_count_3000_price_4000 233 : office_sqm_3000  -  0.8506895 
## 246 : cafe_count_3000_price_high 233 : office_sqm_3000  -  0.8642189 
## 247 : big_church_count_3000 233 : office_sqm_3000  -  0.8473776 
## 248 : church_count_3000 233 : office_sqm_3000  -  0.850933 
## 250 : leisure_count_3000 233 : office_sqm_3000  -  0.8326083 
## 251 : sport_count_3000 233 : office_sqm_3000  -  0.8238289 
## 255 : office_count_5000 233 : office_sqm_3000  -  0.9564251 
## 256 : office_sqm_5000 233 : office_sqm_3000  -  0.9548842 
## 259 : cafe_count_5000 233 : office_sqm_3000  -  0.957289 
## 263 : cafe_count_5000_na_price 233 : office_sqm_3000  -  0.9531141 
## 264 : cafe_count_5000_price_500 233 : office_sqm_3000  -  0.9539834 
## 265 : cafe_count_5000_price_1000 233 : office_sqm_3000  -  0.9550693 
## 266 : cafe_count_5000_price_1500 233 : office_sqm_3000  -  0.9550234 
## 267 : cafe_count_5000_price_2500 233 : office_sqm_3000  -  0.952715 
## 268 : cafe_count_5000_price_4000 233 : office_sqm_3000  -  0.9406882 
## 269 : cafe_count_5000_price_high 233 : office_sqm_3000  -  0.9272656 
## 270 : big_church_count_5000 233 : office_sqm_3000  -  0.9174468 
## 271 : church_count_5000 233 : office_sqm_3000  -  0.9289802 
## 273 : leisure_count_5000 233 : office_sqm_3000  -  0.9379537 
## 274 : sport_count_5000 233 : office_sqm_3000  -  0.8424254 
## 235 : trc_sqm_3000 234 : trc_count_3000  -  0.812455 
## 251 : sport_count_3000 234 : trc_count_3000  -  0.8714232 
## 257 : trc_count_5000 234 : trc_count_3000  -  0.9043437 
## 265 : cafe_count_5000_price_1000 234 : trc_count_3000  -  0.8027993 
## 274 : sport_count_5000 234 : trc_count_3000  -  0.8349124 
## 258 : trc_sqm_5000 235 : trc_sqm_3000  -  0.8254176 
## 240 : cafe_count_3000_na_price 236 : cafe_count_3000  -  0.9912845 
## 241 : cafe_count_3000_price_500 236 : cafe_count_3000  -  0.9978826 
## 242 : cafe_count_3000_price_1000 236 : cafe_count_3000  -  0.9972998 
## 243 : cafe_count_3000_price_1500 236 : cafe_count_3000  -  0.9980919 
## 244 : cafe_count_3000_price_2500 236 : cafe_count_3000  -  0.9960243 
## 245 : cafe_count_3000_price_4000 236 : cafe_count_3000  -  0.98244 
## 246 : cafe_count_3000_price_high 236 : cafe_count_3000  -  0.9402412 
## 247 : big_church_count_3000 236 : cafe_count_3000  -  0.9621663 
## 248 : church_count_3000 236 : cafe_count_3000  -  0.9748266 
## 250 : leisure_count_3000 236 : cafe_count_3000  -  0.9832207 
## 255 : office_count_5000 236 : cafe_count_3000  -  0.9208885 
## 256 : office_sqm_5000 236 : cafe_count_3000  -  0.8357725 
## 259 : cafe_count_5000 236 : cafe_count_3000  -  0.9350907 
## 263 : cafe_count_5000_na_price 236 : cafe_count_3000  -  0.9282827 
## 264 : cafe_count_5000_price_500 236 : cafe_count_3000  -  0.931133 
## 265 : cafe_count_5000_price_1000 236 : cafe_count_3000  -  0.927294 
## 266 : cafe_count_5000_price_1500 236 : cafe_count_3000  -  0.9363132 
## 267 : cafe_count_5000_price_2500 236 : cafe_count_3000  -  0.9344736 
## 268 : cafe_count_5000_price_4000 236 : cafe_count_3000  -  0.9254572 
## 269 : cafe_count_5000_price_high 236 : cafe_count_3000  -  0.9051543 
## 270 : big_church_count_5000 236 : cafe_count_3000  -  0.9163224 
## 271 : church_count_5000 236 : cafe_count_3000  -  0.923902 
## 273 : leisure_count_5000 236 : cafe_count_3000  -  0.9334039 
## 241 : cafe_count_3000_price_500 240 : cafe_count_3000_na_price  -  0.9888132 
## 242 : cafe_count_3000_price_1000 240 : cafe_count_3000_na_price  -  0.9855482 
## 243 : cafe_count_3000_price_1500 240 : cafe_count_3000_na_price  -  0.9888103 
## 244 : cafe_count_3000_price_2500 240 : cafe_count_3000_na_price  -  0.9858738 
## 245 : cafe_count_3000_price_4000 240 : cafe_count_3000_na_price  -  0.9758245 
## 246 : cafe_count_3000_price_high 240 : cafe_count_3000_na_price  -  0.9291485 
## 247 : big_church_count_3000 240 : cafe_count_3000_na_price  -  0.9638543 
## 248 : church_count_3000 240 : cafe_count_3000_na_price  -  0.9693039 
## 250 : leisure_count_3000 240 : cafe_count_3000_na_price  -  0.9718831 
## 255 : office_count_5000 240 : cafe_count_3000_na_price  -  0.9195137 
## 256 : office_sqm_5000 240 : cafe_count_3000_na_price  -  0.8388952 
## 259 : cafe_count_5000 240 : cafe_count_3000_na_price  -  0.9330241 
## 263 : cafe_count_5000_na_price 240 : cafe_count_3000_na_price  -  0.9359444 
## 264 : cafe_count_5000_price_500 240 : cafe_count_3000_na_price  -  0.9291497 
## 265 : cafe_count_5000_price_1000 240 : cafe_count_3000_na_price  -  0.9230538 
## 266 : cafe_count_5000_price_1500 240 : cafe_count_3000_na_price  -  0.9333836 
## 267 : cafe_count_5000_price_2500 240 : cafe_count_3000_na_price  -  0.9315793 
## 268 : cafe_count_5000_price_4000 240 : cafe_count_3000_na_price  -  0.9272338 
## 269 : cafe_count_5000_price_high 240 : cafe_count_3000_na_price  -  0.9037114 
## 270 : big_church_count_5000 240 : cafe_count_3000_na_price  -  0.9184567 
## 271 : church_count_5000 240 : cafe_count_3000_na_price  -  0.9201568 
## 273 : leisure_count_5000 240 : cafe_count_3000_na_price  -  0.9268225 
## 242 : cafe_count_3000_price_1000 241 : cafe_count_3000_price_500  -  0.9958766 
## 243 : cafe_count_3000_price_1500 241 : cafe_count_3000_price_500  -  0.9939258 
## 244 : cafe_count_3000_price_2500 241 : cafe_count_3000_price_500  -  0.9913963 
## 245 : cafe_count_3000_price_4000 241 : cafe_count_3000_price_500  -  0.9755922 
## 246 : cafe_count_3000_price_high 241 : cafe_count_3000_price_500  -  0.9328523 
## 247 : big_church_count_3000 241 : cafe_count_3000_price_500  -  0.9591304 
## 248 : church_count_3000 241 : cafe_count_3000_price_500  -  0.9743001 
## 250 : leisure_count_3000 241 : cafe_count_3000_price_500  -  0.9797467 
## 255 : office_count_5000 241 : cafe_count_3000_price_500  -  0.919984 
## 256 : office_sqm_5000 241 : cafe_count_3000_price_500  -  0.8332776 
## 259 : cafe_count_5000 241 : cafe_count_3000_price_500  -  0.9329257 
## 263 : cafe_count_5000_na_price 241 : cafe_count_3000_price_500  -  0.9253269 
## 264 : cafe_count_5000_price_500 241 : cafe_count_3000_price_500  -  0.9318539 
## 265 : cafe_count_5000_price_1000 241 : cafe_count_3000_price_500  -  0.9262578 
## 266 : cafe_count_5000_price_1500 241 : cafe_count_3000_price_500  -  0.9325302 
## 267 : cafe_count_5000_price_2500 241 : cafe_count_3000_price_500  -  0.9302689 
## 268 : cafe_count_5000_price_4000 241 : cafe_count_3000_price_500  -  0.9192968 
## 269 : cafe_count_5000_price_high 241 : cafe_count_3000_price_500  -  0.9009908 
## 270 : big_church_count_5000 241 : cafe_count_3000_price_500  -  0.9128443 
## 271 : church_count_5000 241 : cafe_count_3000_price_500  -  0.9224542 
## 273 : leisure_count_5000 241 : cafe_count_3000_price_500  -  0.9303498 
## 243 : cafe_count_3000_price_1500 242 : cafe_count_3000_price_1000  -  0.9953982 
## 244 : cafe_count_3000_price_2500 242 : cafe_count_3000_price_1000  -  0.9892877 
## 245 : cafe_count_3000_price_4000 242 : cafe_count_3000_price_1000  -  0.9694078 
## 246 : cafe_count_3000_price_high 242 : cafe_count_3000_price_1000  -  0.9281915 
## 247 : big_church_count_3000 242 : cafe_count_3000_price_1000  -  0.9595183 
## 248 : church_count_3000 242 : cafe_count_3000_price_1000  -  0.9737382 
## 250 : leisure_count_3000 242 : cafe_count_3000_price_1000  -  0.9752941 
## 251 : sport_count_3000 242 : cafe_count_3000_price_1000  -  0.8050268 
## 255 : office_count_5000 242 : cafe_count_3000_price_1000  -  0.9263291 
## 256 : office_sqm_5000 242 : cafe_count_3000_price_1000  -  0.8456888 
## 259 : cafe_count_5000 242 : cafe_count_3000_price_1000  -  0.9409612 
## 263 : cafe_count_5000_na_price 242 : cafe_count_3000_price_1000  -  0.9320802 
## 264 : cafe_count_5000_price_500 242 : cafe_count_3000_price_1000  -  0.9379821 
## 265 : cafe_count_5000_price_1000 242 : cafe_count_3000_price_1000  -  0.9371236 
## 266 : cafe_count_5000_price_1500 242 : cafe_count_3000_price_1000  -  0.9426409 
## 267 : cafe_count_5000_price_2500 242 : cafe_count_3000_price_1000  -  0.936433 
## 268 : cafe_count_5000_price_4000 242 : cafe_count_3000_price_1000  -  0.9217349 
## 269 : cafe_count_5000_price_high 242 : cafe_count_3000_price_1000  -  0.8992722 
## 270 : big_church_count_5000 242 : cafe_count_3000_price_1000  -  0.9218453 
## 271 : church_count_5000 242 : cafe_count_3000_price_1000  -  0.9316498 
## 273 : leisure_count_5000 242 : cafe_count_3000_price_1000  -  0.9353293 
## 244 : cafe_count_3000_price_2500 243 : cafe_count_3000_price_1500  -  0.9928489 
## 245 : cafe_count_3000_price_4000 243 : cafe_count_3000_price_1500  -  0.9784151 
## 246 : cafe_count_3000_price_high 243 : cafe_count_3000_price_1500  -  0.9300771 
## 247 : big_church_count_3000 243 : cafe_count_3000_price_1500  -  0.9680415 
## 248 : church_count_3000 243 : cafe_count_3000_price_1500  -  0.9778769 
## 250 : leisure_count_3000 243 : cafe_count_3000_price_1500  -  0.9826156 
## 255 : office_count_5000 243 : cafe_count_3000_price_1500  -  0.9172453 
## 256 : office_sqm_5000 243 : cafe_count_3000_price_1500  -  0.8298581 
## 259 : cafe_count_5000 243 : cafe_count_3000_price_1500  -  0.9312912 
## 263 : cafe_count_5000_na_price 243 : cafe_count_3000_price_1500  -  0.9244225 
## 264 : cafe_count_5000_price_500 243 : cafe_count_3000_price_1500  -  0.925777 
## 265 : cafe_count_5000_price_1000 243 : cafe_count_3000_price_1500  -  0.9237194 
## 266 : cafe_count_5000_price_1500 243 : cafe_count_3000_price_1500  -  0.9350031 
## 267 : cafe_count_5000_price_2500 243 : cafe_count_3000_price_1500  -  0.9300509 
## 268 : cafe_count_5000_price_4000 243 : cafe_count_3000_price_1500  -  0.9198413 
## 269 : cafe_count_5000_price_high 243 : cafe_count_3000_price_1500  -  0.895153 
## 270 : big_church_count_5000 243 : cafe_count_3000_price_1500  -  0.9184466 
## 271 : church_count_5000 243 : cafe_count_3000_price_1500  -  0.9235231 
## 273 : leisure_count_5000 243 : cafe_count_3000_price_1500  -  0.9299751 
## 245 : cafe_count_3000_price_4000 244 : cafe_count_3000_price_2500  -  0.9904435 
## 246 : cafe_count_3000_price_high 244 : cafe_count_3000_price_2500  -  0.9548027 
## 247 : big_church_count_3000 244 : cafe_count_3000_price_2500  -  0.9512628 
## 248 : church_count_3000 244 : cafe_count_3000_price_2500  -  0.965035 
## 250 : leisure_count_3000 244 : cafe_count_3000_price_2500  -  0.9845908 
## 255 : office_count_5000 244 : cafe_count_3000_price_2500  -  0.9126521 
## 256 : office_sqm_5000 244 : cafe_count_3000_price_2500  -  0.8264589 
## 259 : cafe_count_5000 244 : cafe_count_3000_price_2500  -  0.9274297 
## 263 : cafe_count_5000_na_price 244 : cafe_count_3000_price_2500  -  0.9197525 
## 264 : cafe_count_5000_price_500 244 : cafe_count_3000_price_2500  -  0.9212844 
## 265 : cafe_count_5000_price_1000 244 : cafe_count_3000_price_2500  -  0.9159991 
## 266 : cafe_count_5000_price_1500 244 : cafe_count_3000_price_2500  -  0.928002 
## 267 : cafe_count_5000_price_2500 244 : cafe_count_3000_price_2500  -  0.9329657 
## 268 : cafe_count_5000_price_4000 244 : cafe_count_3000_price_2500  -  0.929206 
## 269 : cafe_count_5000_price_high 244 : cafe_count_3000_price_2500  -  0.9130535 
## 270 : big_church_count_5000 244 : cafe_count_3000_price_2500  -  0.90498 
## 271 : church_count_5000 244 : cafe_count_3000_price_2500  -  0.9130353 
## 273 : leisure_count_5000 244 : cafe_count_3000_price_2500  -  0.9309493 
## 246 : cafe_count_3000_price_high 245 : cafe_count_3000_price_4000  -  0.9603138 
## 247 : big_church_count_3000 245 : cafe_count_3000_price_4000  -  0.932428 
## 248 : church_count_3000 245 : cafe_count_3000_price_4000  -  0.943621 
## 250 : leisure_count_3000 245 : cafe_count_3000_price_4000  -  0.9791559 
## 255 : office_count_5000 245 : cafe_count_3000_price_4000  -  0.878691 
## 259 : cafe_count_5000 245 : cafe_count_3000_price_4000  -  0.8940032 
## 263 : cafe_count_5000_na_price 245 : cafe_count_3000_price_4000  -  0.89142 
## 264 : cafe_count_5000_price_500 245 : cafe_count_3000_price_4000  -  0.8862833 
## 265 : cafe_count_5000_price_1000 245 : cafe_count_3000_price_4000  -  0.8777314 
## 266 : cafe_count_5000_price_1500 245 : cafe_count_3000_price_4000  -  0.8934372 
## 267 : cafe_count_5000_price_2500 245 : cafe_count_3000_price_4000  -  0.9039138 
## 268 : cafe_count_5000_price_4000 245 : cafe_count_3000_price_4000  -  0.9108076 
## 269 : cafe_count_5000_price_high 245 : cafe_count_3000_price_4000  -  0.8991454 
## 270 : big_church_count_5000 245 : cafe_count_3000_price_4000  -  0.8699712 
## 271 : church_count_5000 245 : cafe_count_3000_price_4000  -  0.874018 
## 273 : leisure_count_5000 245 : cafe_count_3000_price_4000  -  0.9022724 
## 247 : big_church_count_3000 246 : cafe_count_3000_price_high  -  0.8520974 
## 248 : church_count_3000 246 : cafe_count_3000_price_high  -  0.8669004 
## 250 : leisure_count_3000 246 : cafe_count_3000_price_high  -  0.919483 
## 255 : office_count_5000 246 : cafe_count_3000_price_high  -  0.8710327 
## 256 : office_sqm_5000 246 : cafe_count_3000_price_high  -  0.8066135 
## 259 : cafe_count_5000 246 : cafe_count_3000_price_high  -  0.8938697 
## 263 : cafe_count_5000_na_price 246 : cafe_count_3000_price_high  -  0.8873819 
## 264 : cafe_count_5000_price_500 246 : cafe_count_3000_price_high  -  0.8871178 
## 265 : cafe_count_5000_price_1000 246 : cafe_count_3000_price_high  -  0.8753695 
## 266 : cafe_count_5000_price_1500 246 : cafe_count_3000_price_high  -  0.8876269 
## 267 : cafe_count_5000_price_2500 246 : cafe_count_3000_price_high  -  0.9100806 
## 268 : cafe_count_5000_price_4000 246 : cafe_count_3000_price_high  -  0.9228813 
## 269 : cafe_count_5000_price_high 246 : cafe_count_3000_price_high  -  0.9330515 
## 270 : big_church_count_5000 246 : cafe_count_3000_price_high  -  0.8342448 
## 271 : church_count_5000 246 : cafe_count_3000_price_high  -  0.8470705 
## 273 : leisure_count_5000 246 : cafe_count_3000_price_high  -  0.8969924 
## 248 : church_count_3000 247 : big_church_count_3000  -  0.9848122 
## 250 : leisure_count_3000 247 : big_church_count_3000  -  0.9549201 
## 255 : office_count_5000 247 : big_church_count_3000  -  0.9132998 
## 256 : office_sqm_5000 247 : big_church_count_3000  -  0.811871 
## 259 : cafe_count_5000 247 : big_church_count_3000  -  0.9151172 
## 263 : cafe_count_5000_na_price 247 : big_church_count_3000  -  0.915379 
## 264 : cafe_count_5000_price_500 247 : big_church_count_3000  -  0.9099064 
## 265 : cafe_count_5000_price_1000 247 : big_church_count_3000  -  0.9077931 
## 266 : cafe_count_5000_price_1500 247 : big_church_count_3000  -  0.9223162 
## 267 : cafe_count_5000_price_2500 247 : big_church_count_3000  -  0.9091195 
## 268 : cafe_count_5000_price_4000 247 : big_church_count_3000  -  0.8973479 
## 269 : cafe_count_5000_price_high 247 : big_church_count_3000  -  0.846644 
## 270 : big_church_count_5000 247 : big_church_count_3000  -  0.9459037 
## 271 : church_count_5000 247 : big_church_count_3000  -  0.9324364 
## 273 : leisure_count_5000 247 : big_church_count_3000  -  0.922906 
## 250 : leisure_count_3000 248 : church_count_3000  -  0.9682859 
## 255 : office_count_5000 248 : church_count_3000  -  0.9127801 
## 256 : office_sqm_5000 248 : church_count_3000  -  0.8140019 
## 259 : cafe_count_5000 248 : church_count_3000  -  0.9203612 
## 263 : cafe_count_5000_na_price 248 : church_count_3000  -  0.9122198 
## 264 : cafe_count_5000_price_500 248 : church_count_3000  -  0.9174274 
## 265 : cafe_count_5000_price_1000 248 : church_count_3000  -  0.9148206 
## 266 : cafe_count_5000_price_1500 248 : church_count_3000  -  0.9251961 
## 267 : cafe_count_5000_price_2500 248 : church_count_3000  -  0.9152441 
## 268 : cafe_count_5000_price_4000 248 : church_count_3000  -  0.9004141 
## 269 : cafe_count_5000_price_high 248 : church_count_3000  -  0.8605311 
## 270 : big_church_count_5000 248 : church_count_3000  -  0.9300013 
## 271 : church_count_5000 248 : church_count_3000  -  0.936308 
## 273 : leisure_count_5000 248 : church_count_3000  -  0.9272265 
## 255 : office_count_5000 250 : leisure_count_3000  -  0.8774501 
## 259 : cafe_count_5000 250 : leisure_count_3000  -  0.8890705 
## 263 : cafe_count_5000_na_price 250 : leisure_count_3000  -  0.8790183 
## 264 : cafe_count_5000_price_500 250 : leisure_count_3000  -  0.8836277 
## 265 : cafe_count_5000_price_1000 250 : leisure_count_3000  -  0.8783556 
## 266 : cafe_count_5000_price_1500 250 : leisure_count_3000  -  0.8917891 
## 267 : cafe_count_5000_price_2500 250 : leisure_count_3000  -  0.8925316 
## 268 : cafe_count_5000_price_4000 250 : leisure_count_3000  -  0.8883212 
## 269 : cafe_count_5000_price_high 250 : leisure_count_3000  -  0.8639381 
## 270 : big_church_count_5000 250 : leisure_count_3000  -  0.8844587 
## 271 : church_count_5000 250 : leisure_count_3000  -  0.888528 
## 273 : leisure_count_5000 250 : leisure_count_3000  -  0.9046701 
## 255 : office_count_5000 251 : sport_count_3000  -  0.8347447 
## 256 : office_sqm_5000 251 : sport_count_3000  -  0.846088 
## 257 : trc_count_5000 251 : sport_count_3000  -  0.8893024 
## 258 : trc_sqm_5000 251 : sport_count_3000  -  0.8099396 
## 259 : cafe_count_5000 251 : sport_count_3000  -  0.8455699 
## 263 : cafe_count_5000_na_price 251 : sport_count_3000  -  0.8474483 
## 264 : cafe_count_5000_price_500 251 : sport_count_3000  -  0.852248 
## 265 : cafe_count_5000_price_1000 251 : sport_count_3000  -  0.8674814 
## 266 : cafe_count_5000_price_1500 251 : sport_count_3000  -  0.8400296 
## 267 : cafe_count_5000_price_2500 251 : sport_count_3000  -  0.815045 
## 270 : big_church_count_5000 251 : sport_count_3000  -  0.8182288 
## 271 : church_count_5000 251 : sport_count_3000  -  0.8350941 
## 273 : leisure_count_5000 251 : sport_count_3000  -  0.8037898 
## 274 : sport_count_5000 251 : sport_count_3000  -  0.9503366 
## 256 : office_sqm_5000 255 : office_count_5000  -  0.9617535 
## 259 : cafe_count_5000 255 : office_count_5000  -  0.993024 
## 263 : cafe_count_5000_na_price 255 : office_count_5000  -  0.9863875 
## 264 : cafe_count_5000_price_500 255 : office_count_5000  -  0.9926878 
## 265 : cafe_count_5000_price_1000 255 : office_count_5000  -  0.9909756 
## 266 : cafe_count_5000_price_1500 255 : office_count_5000  -  0.9915455 
## 267 : cafe_count_5000_price_2500 255 : office_count_5000  -  0.9870463 
## 268 : cafe_count_5000_price_4000 255 : office_count_5000  -  0.9671255 
## 269 : cafe_count_5000_price_high 255 : office_count_5000  -  0.9404476 
## 270 : big_church_count_5000 255 : office_count_5000  -  0.9772237 
## 271 : church_count_5000 255 : office_count_5000  -  0.9828477 
## 273 : leisure_count_5000 255 : office_count_5000  -  0.980727 
## 274 : sport_count_5000 255 : office_count_5000  -  0.8532842 
## 257 : trc_count_5000 256 : office_sqm_5000  -  0.8259781 
## 259 : cafe_count_5000 256 : office_sqm_5000  -  0.9531514 
## 263 : cafe_count_5000_na_price 256 : office_sqm_5000  -  0.950398 
## 264 : cafe_count_5000_price_500 256 : office_sqm_5000  -  0.9523371 
## 265 : cafe_count_5000_price_1000 256 : office_sqm_5000  -  0.9576731 
## 266 : cafe_count_5000_price_1500 256 : office_sqm_5000  -  0.9496059 
## 267 : cafe_count_5000_price_2500 256 : office_sqm_5000  -  0.9426446 
## 268 : cafe_count_5000_price_4000 256 : office_sqm_5000  -  0.9188832 
## 269 : cafe_count_5000_price_high 256 : office_sqm_5000  -  0.9034862 
## 270 : big_church_count_5000 256 : office_sqm_5000  -  0.9127029 
## 271 : church_count_5000 256 : office_sqm_5000  -  0.9272167 
## 273 : leisure_count_5000 256 : office_sqm_5000  -  0.9223322 
## 274 : sport_count_5000 256 : office_sqm_5000  -  0.8910978 
## 258 : trc_sqm_5000 257 : trc_count_5000  -  0.8928347 
## 259 : cafe_count_5000 257 : trc_count_5000  -  0.8015681 
## 263 : cafe_count_5000_na_price 257 : trc_count_5000  -  0.8042059 
## 264 : cafe_count_5000_price_500 257 : trc_count_5000  -  0.8087895 
## 265 : cafe_count_5000_price_1000 257 : trc_count_5000  -  0.8298682 
## 266 : cafe_count_5000_price_1500 257 : trc_count_5000  -  0.8026206 
## 271 : church_count_5000 257 : trc_count_5000  -  0.8106212 
## 274 : sport_count_5000 257 : trc_count_5000  -  0.9230759 
## 274 : sport_count_5000 258 : trc_sqm_5000  -  0.8320419 
## 263 : cafe_count_5000_na_price 259 : cafe_count_5000  -  0.9928079 
## 264 : cafe_count_5000_price_500 259 : cafe_count_5000  -  0.9979626 
## 265 : cafe_count_5000_price_1000 259 : cafe_count_5000  -  0.9972485 
## 266 : cafe_count_5000_price_1500 259 : cafe_count_5000  -  0.9982875 
## 267 : cafe_count_5000_price_2500 259 : cafe_count_5000  -  0.9957301 
## 268 : cafe_count_5000_price_4000 259 : cafe_count_5000  -  0.9796032 
## 269 : cafe_count_5000_price_high 259 : cafe_count_5000  -  0.9573238 
## 270 : big_church_count_5000 259 : cafe_count_5000  -  0.9703712 
## 271 : church_count_5000 259 : cafe_count_5000  -  0.9796257 
## 273 : leisure_count_5000 259 : cafe_count_5000  -  0.9847009 
## 274 : sport_count_5000 259 : cafe_count_5000  -  0.8563096 
## 264 : cafe_count_5000_price_500 263 : cafe_count_5000_na_price  -  0.9901355 
## 265 : cafe_count_5000_price_1000 263 : cafe_count_5000_na_price  -  0.9872154 
## 266 : cafe_count_5000_price_1500 263 : cafe_count_5000_na_price  -  0.9901798 
## 267 : cafe_count_5000_price_2500 263 : cafe_count_5000_na_price  -  0.987896 
## 268 : cafe_count_5000_price_4000 263 : cafe_count_5000_na_price  -  0.9769168 
## 269 : cafe_count_5000_price_high 263 : cafe_count_5000_na_price  -  0.9516893 
## 270 : big_church_count_5000 263 : cafe_count_5000_na_price  -  0.9670045 
## 271 : church_count_5000 263 : cafe_count_5000_na_price  -  0.9696052 
## 273 : leisure_count_5000 263 : cafe_count_5000_na_price  -  0.9707563 
## 274 : sport_count_5000 263 : cafe_count_5000_na_price  -  0.8585639 
## 265 : cafe_count_5000_price_1000 264 : cafe_count_5000_price_500  -  0.99672 
## 266 : cafe_count_5000_price_1500 264 : cafe_count_5000_price_500  -  0.9941324 
## 267 : cafe_count_5000_price_2500 264 : cafe_count_5000_price_500  -  0.9907286 
## 268 : cafe_count_5000_price_4000 264 : cafe_count_5000_price_500  -  0.9714473 
## 269 : cafe_count_5000_price_high 264 : cafe_count_5000_price_500  -  0.9509029 
## 270 : big_church_count_5000 264 : cafe_count_5000_price_500  -  0.9669987 
## 271 : church_count_5000 264 : cafe_count_5000_price_500  -  0.979153 
## 273 : leisure_count_5000 264 : cafe_count_5000_price_500  -  0.980566 
## 274 : sport_count_5000 264 : cafe_count_5000_price_500  -  0.8641546 
## 266 : cafe_count_5000_price_1500 265 : cafe_count_5000_price_1000  -  0.9957797 
## 267 : cafe_count_5000_price_2500 265 : cafe_count_5000_price_1000  -  0.9877585 
## 268 : cafe_count_5000_price_4000 265 : cafe_count_5000_price_1000  -  0.9642767 
## 269 : cafe_count_5000_price_high 265 : cafe_count_5000_price_1000  -  0.9409959 
## 270 : big_church_count_5000 265 : cafe_count_5000_price_1000  -  0.9680617 
## 271 : church_count_5000 265 : cafe_count_5000_price_1000  -  0.9800034 
## 273 : leisure_count_5000 265 : cafe_count_5000_price_1000  -  0.9786268 
## 274 : sport_count_5000 265 : cafe_count_5000_price_1000  -  0.8809844 
## 267 : cafe_count_5000_price_2500 266 : cafe_count_5000_price_1500  -  0.9932155 
## 268 : cafe_count_5000_price_4000 266 : cafe_count_5000_price_1500  -  0.9758233 
## 269 : cafe_count_5000_price_high 266 : cafe_count_5000_price_1500  -  0.9487415 
## 270 : big_church_count_5000 266 : cafe_count_5000_price_1500  -  0.9756968 
## 271 : church_count_5000 266 : cafe_count_5000_price_1500  -  0.9825254 
## 273 : leisure_count_5000 266 : cafe_count_5000_price_1500  -  0.9843254 
## 274 : sport_count_5000 266 : cafe_count_5000_price_1500  -  0.8488931 
## 268 : cafe_count_5000_price_4000 267 : cafe_count_5000_price_2500  -  0.9904384 
## 269 : cafe_count_5000_price_high 267 : cafe_count_5000_price_2500  -  0.9726039 
## 270 : big_church_count_5000 267 : cafe_count_5000_price_2500  -  0.9610006 
## 271 : church_count_5000 267 : cafe_count_5000_price_2500  -  0.9697376 
## 273 : leisure_count_5000 267 : cafe_count_5000_price_2500  -  0.9862058 
## 274 : sport_count_5000 267 : cafe_count_5000_price_2500  -  0.824139 
## 269 : cafe_count_5000_price_high 268 : cafe_count_5000_price_4000  -  0.9813071 
## 270 : big_church_count_5000 268 : cafe_count_5000_price_4000  -  0.9417155 
## 271 : church_count_5000 268 : cafe_count_5000_price_4000  -  0.944713 
## 273 : leisure_count_5000 268 : cafe_count_5000_price_4000  -  0.9754618 
## 270 : big_church_count_5000 269 : cafe_count_5000_price_high  -  0.8881244 
## 271 : church_count_5000 269 : cafe_count_5000_price_high  -  0.899886 
## 273 : leisure_count_5000 269 : cafe_count_5000_price_high  -  0.9483907 
## 271 : church_count_5000 270 : big_church_count_5000  -  0.9879008 
## 273 : leisure_count_5000 270 : big_church_count_5000  -  0.9690292 
## 274 : sport_count_5000 270 : big_church_count_5000  -  0.8258829 
## 273 : leisure_count_5000 271 : church_count_5000  -  0.9752592 
## 274 : sport_count_5000 271 : church_count_5000  -  0.8477713 
## 274 : sport_count_5000 273 : leisure_count_5000  -  0.8091686 
## 280 : cpi 277 : oil_urals  -  0.8125755 
## 285 : usdrub 277 : oil_urals  -  0.9589818 
## 286 : eurrub 277 : oil_urals  -  0.8920352 
## 287 : brent 277 : oil_urals  -  0.9906277 
## 293 : rts 277 : oil_urals  -  0.883588 
## 295 : micex_rgbi_tr 277 : oil_urals  -  0.8560464 
## 299 : deposits_rate 277 : oil_urals  -  0.8990849 
## 280 : cpi 279 : gdp_quart_growth  -  0.8628019 
## 281 : ppi 279 : gdp_quart_growth  -  0.8597354 
## 282 : gdp_deflator 279 : gdp_quart_growth  -  0.850746 
## 289 : gdp_annual 279 : gdp_quart_growth  -  0.8417361 
## 296 : micex_cbi_tr 279 : gdp_quart_growth  -  0.8495915 
## 297 : deposits_value 279 : gdp_quart_growth  -  0.8593266 
## 301 : mortgage_growth 279 : gdp_quart_growth  -  0.8520337 
## 307 : salary 279 : gdp_quart_growth  -  0.8106387 
## 309 : fixed_basket 279 : gdp_quart_growth  -  0.8780238 
## 281 : ppi 280 : cpi  -  0.9536628 
## 282 : gdp_deflator 280 : cpi  -  0.9209334 
## 285 : usdrub 280 : cpi  -  0.8185735 
## 287 : brent 280 : cpi  -  0.8005003 
## 289 : gdp_annual 280 : cpi  -  0.8910762 
## 290 : gdp_annual_growth 280 : cpi  -  0.8624391 
## 293 : rts 280 : cpi  -  0.8128595 
## 296 : micex_cbi_tr 280 : cpi  -  0.8427722 
## 297 : deposits_value 280 : cpi  -  0.9371622 
## 301 : mortgage_growth 280 : cpi  -  0.8001801 
## 307 : salary 280 : cpi  -  0.8846223 
## 309 : fixed_basket 280 : cpi  -  0.9897577 
## 316 : invest_fixed_capital_per_cap 280 : cpi  -  0.8131303 
## 317 : invest_fixed_assets 280 : cpi  -  0.825668 
## 342 : average_life_exp 280 : cpi  -  0.8135548 
## 354 : load_of_teachers_school_per_teacher 280 : cpi  -  0.8743746 
## 357 : provision_nurse 280 : cpi  -  0.8196361 
## 364 : turnover_catering_per_cap 280 : cpi  -  0.872565 
## 368 : bandwidth_sports 280 : cpi  -  0.9386282 
## 282 : gdp_deflator 281 : ppi  -  0.8534554 
## 289 : gdp_annual 281 : ppi  -  0.8267145 
## 290 : gdp_annual_growth 281 : ppi  -  0.8084971 
## 296 : micex_cbi_tr 281 : ppi  -  0.8189435 
## 297 : deposits_value 281 : ppi  -  0.8713571 
## 307 : salary 281 : ppi  -  0.8173582 
## 309 : fixed_basket 281 : ppi  -  0.92451 
## 354 : load_of_teachers_school_per_teacher 281 : ppi  -  0.8358643 
## 364 : turnover_catering_per_cap 281 : ppi  -  0.8152779 
## 368 : bandwidth_sports 281 : ppi  -  0.8731953 
## 289 : gdp_annual 282 : gdp_deflator  -  0.9949697 
## 290 : gdp_annual_growth 282 : gdp_deflator  -  0.8757488 
## 296 : micex_cbi_tr 282 : gdp_deflator  -  0.8872235 
## 297 : deposits_value 282 : gdp_deflator  -  0.9480549 
## 307 : salary 282 : gdp_deflator  -  0.9548854 
## 309 : fixed_basket 282 : gdp_deflator  -  0.948202 
## 310 : retail_trade_turnover 282 : gdp_deflator  -  0.8503533 
## 311 : retail_trade_turnover_per_cap 282 : gdp_deflator  -  0.8171174 
## 313 : labor_force 282 : gdp_deflator  -  0.8593182 
## 316 : invest_fixed_capital_per_cap 282 : gdp_deflator  -  0.9507305 
## 317 : invest_fixed_assets 282 : gdp_deflator  -  0.9575377 
## 342 : average_life_exp 282 : gdp_deflator  -  0.891101 
## 354 : load_of_teachers_school_per_teacher 282 : gdp_deflator  -  0.8576366 
## 364 : turnover_catering_per_cap 282 : gdp_deflator  -  0.9659569 
## 368 : bandwidth_sports 282 : gdp_deflator  -  0.9482216 
## 286 : eurrub 285 : usdrub  -  0.9699501 
## 287 : brent 285 : usdrub  -  0.9578835 
## 293 : rts 285 : usdrub  -  0.9142141 
## 295 : micex_rgbi_tr 285 : usdrub  -  0.9226577 
## 299 : deposits_rate 285 : usdrub  -  0.9046348 
## 309 : fixed_basket 285 : usdrub  -  0.8004566 
## 287 : brent 286 : eurrub  -  0.8907894 
## 293 : rts 286 : eurrub  -  0.9282358 
## 295 : micex_rgbi_tr 286 : eurrub  -  0.9350055 
## 299 : deposits_rate 286 : eurrub  -  0.8555856 
## 293 : rts 287 : brent  -  0.8877007 
## 295 : micex_rgbi_tr 287 : brent  -  0.850382 
## 299 : deposits_rate 287 : brent  -  0.8846259 
## 290 : gdp_annual_growth 289 : gdp_annual  -  0.8638946 
## 296 : micex_cbi_tr 289 : gdp_annual  -  0.890196 
## 297 : deposits_value 289 : gdp_annual  -  0.9446287 
## 307 : salary 289 : gdp_annual  -  0.9557337 
## 309 : fixed_basket 289 : gdp_annual  -  0.9236501 
## 310 : retail_trade_turnover 289 : gdp_annual  -  0.8729286 
## 311 : retail_trade_turnover_per_cap 289 : gdp_annual  -  0.8416821 
## 313 : labor_force 289 : gdp_annual  -  0.8712306 
## 316 : invest_fixed_capital_per_cap 289 : gdp_annual  -  0.9743696 
## 317 : invest_fixed_assets 289 : gdp_annual  -  0.9787267 
## 342 : average_life_exp 289 : gdp_annual  -  0.8977296 
## 354 : load_of_teachers_school_per_teacher 289 : gdp_annual  -  0.8312711 
## 364 : turnover_catering_per_cap 289 : gdp_annual  -  0.9747231 
## 368 : bandwidth_sports 289 : gdp_annual  -  0.925569 
## 296 : micex_cbi_tr 290 : gdp_annual_growth  -  0.8329156 
## 297 : deposits_value 290 : gdp_annual_growth  -  0.8915401 
## 307 : salary 290 : gdp_annual_growth  -  0.9567854 
## 309 : fixed_basket 290 : gdp_annual_growth  -  0.8801833 
## 310 : retail_trade_turnover 290 : gdp_annual_growth  -  0.9304812 
## 311 : retail_trade_turnover_per_cap 290 : gdp_annual_growth  -  0.9195327 
## 313 : labor_force 290 : gdp_annual_growth  -  0.9715608 
## 315 : employment 290 : gdp_annual_growth  -  0.9499216 
## 316 : invest_fixed_capital_per_cap 290 : gdp_annual_growth  -  0.8683183 
## 317 : invest_fixed_assets 290 : gdp_annual_growth  -  0.8770339 
## 342 : average_life_exp 290 : gdp_annual_growth  -  0.9142577 
## 354 : load_of_teachers_school_per_teacher 290 : gdp_annual_growth  -  0.9313116 
## 357 : provision_nurse 290 : gdp_annual_growth  -  0.9364835 
## 358 : load_on_doctors 290 : gdp_annual_growth  -  0.8066611 
## 364 : turnover_catering_per_cap 290 : gdp_annual_growth  -  0.9406276 
## 368 : bandwidth_sports 290 : gdp_annual_growth  -  0.9689374 
## 295 : micex_rgbi_tr 293 : rts  -  0.9064284 
## 309 : fixed_basket 293 : rts  -  0.8090974 
## 297 : deposits_value 296 : micex_cbi_tr  -  0.9080422 
## 307 : salary 296 : micex_cbi_tr  -  0.9076728 
## 309 : fixed_basket 296 : micex_cbi_tr  -  0.869603 
## 310 : retail_trade_turnover 296 : micex_cbi_tr  -  0.8541022 
## 311 : retail_trade_turnover_per_cap 296 : micex_cbi_tr  -  0.8360737 
## 313 : labor_force 296 : micex_cbi_tr  -  0.8323405 
## 316 : invest_fixed_capital_per_cap 296 : micex_cbi_tr  -  0.8865456 
## 317 : invest_fixed_assets 296 : micex_cbi_tr  -  0.8901297 
## 342 : average_life_exp 296 : micex_cbi_tr  -  0.8939813 
## 364 : turnover_catering_per_cap 296 : micex_cbi_tr  -  0.8932511 
## 368 : bandwidth_sports 296 : micex_cbi_tr  -  0.8631393 
## 307 : salary 297 : deposits_value  -  0.957559 
## 309 : fixed_basket 297 : deposits_value  -  0.9645016 
## 310 : retail_trade_turnover 297 : deposits_value  -  0.8846841 
## 311 : retail_trade_turnover_per_cap 297 : deposits_value  -  0.86248 
## 313 : labor_force 297 : deposits_value  -  0.8766392 
## 316 : invest_fixed_capital_per_cap 297 : deposits_value  -  0.9257982 
## 317 : invest_fixed_assets 297 : deposits_value  -  0.9314803 
## 342 : average_life_exp 297 : deposits_value  -  0.9288401 
## 354 : load_of_teachers_school_per_teacher 297 : deposits_value  -  0.812804 
## 364 : turnover_catering_per_cap 297 : deposits_value  -  0.9446225 
## 368 : bandwidth_sports 297 : deposits_value  -  0.9318395 
## 302 : mortgage_rate 301 : mortgage_growth  -  0.8569295 
## 312 : retail_trade_turnover_growth 302 : mortgage_rate  -  0.8529548 
## 309 : fixed_basket 307 : salary  -  0.9210971 
## 310 : retail_trade_turnover 307 : salary  -  0.9576906 
## 311 : retail_trade_turnover_per_cap 307 : salary  -  0.9412368 
## 313 : labor_force 307 : salary  -  0.9530599 
## 315 : employment 307 : salary  -  0.8736578 
## 316 : invest_fixed_capital_per_cap 307 : salary  -  0.9598711 
## 317 : invest_fixed_assets 307 : salary  -  0.9648571 
## 342 : average_life_exp 307 : salary  -  0.9768263 
## 354 : load_of_teachers_school_per_teacher 307 : salary  -  0.8560024 
## 357 : provision_nurse 307 : salary  -  0.8323593 
## 364 : turnover_catering_per_cap 307 : salary  -  0.9859135 
## 368 : bandwidth_sports 307 : salary  -  0.9649813 
## 331 : mortality 308 : salary_growth  -  0.8384191 
## 358 : load_on_doctors 308 : salary_growth  -  0.8193925 
## 366 : seats_theather_rfmin_per_100000_cap 308 : salary_growth  -  0.8467139 
## 372 : apartment_fund_sqm 308 : salary_growth  -  0.8807668 
## 313 : labor_force 309 : fixed_basket  -  0.8169562 
## 316 : invest_fixed_capital_per_cap 309 : fixed_basket  -  0.8564465 
## 317 : invest_fixed_assets 309 : fixed_basket  -  0.867502 
## 342 : average_life_exp 309 : fixed_basket  -  0.8639698 
## 354 : load_of_teachers_school_per_teacher 309 : fixed_basket  -  0.8636062 
## 357 : provision_nurse 309 : fixed_basket  -  0.8076913 
## 364 : turnover_catering_per_cap 309 : fixed_basket  -  0.9045114 
## 368 : bandwidth_sports 309 : fixed_basket  -  0.9541138 
## 311 : retail_trade_turnover_per_cap 310 : retail_trade_turnover  -  0.9980646 
## 313 : labor_force 310 : retail_trade_turnover  -  0.9795314 
## 315 : employment 310 : retail_trade_turnover  -  0.9353876 
## 316 : invest_fixed_capital_per_cap 310 : retail_trade_turnover  -  0.9410974 
## 317 : invest_fixed_assets 310 : retail_trade_turnover  -  0.9405619 
## 342 : average_life_exp 310 : retail_trade_turnover  -  0.9606785 
## 364 : turnover_catering_per_cap 310 : retail_trade_turnover  -  0.9509117 
## 368 : bandwidth_sports 310 : retail_trade_turnover  -  0.8727263 
## 313 : labor_force 311 : retail_trade_turnover_per_cap  -  0.9730232 
## 315 : employment 311 : retail_trade_turnover_per_cap  -  0.93807 
## 316 : invest_fixed_capital_per_cap 311 : retail_trade_turnover_per_cap  -  0.920576 
## 317 : invest_fixed_assets 311 : retail_trade_turnover_per_cap  -  0.9193124 
## 342 : average_life_exp 311 : retail_trade_turnover_per_cap  -  0.9542078 
## 364 : turnover_catering_per_cap 311 : retail_trade_turnover_per_cap  -  0.9299263 
## 368 : bandwidth_sports 311 : retail_trade_turnover_per_cap  -  0.848906 
## 315 : employment 313 : labor_force  -  0.9756559 
## 316 : invest_fixed_capital_per_cap 313 : labor_force  -  0.9196831 
## 317 : invest_fixed_assets 313 : labor_force  -  0.9227358 
## 342 : average_life_exp 313 : labor_force  -  0.9197324 
## 354 : load_of_teachers_school_per_teacher 313 : labor_force  -  0.8757547 
## 357 : provision_nurse 313 : labor_force  -  0.8929592 
## 364 : turnover_catering_per_cap 313 : labor_force  -  0.9588559 
## 368 : bandwidth_sports 313 : labor_force  -  0.9129098 
## 316 : invest_fixed_capital_per_cap 315 : employment  -  0.8136662 
## 317 : invest_fixed_assets 315 : employment  -  0.8172542 
## 342 : average_life_exp 315 : employment  -  0.8427896 
## 354 : load_of_teachers_school_per_teacher 315 : employment  -  0.8536507 
## 355 : students_state_oneshift 315 : employment  -  0.852239 
## 357 : provision_nurse 315 : employment  -  0.8995981 
## 364 : turnover_catering_per_cap 315 : employment  -  0.8756087 
## 368 : bandwidth_sports 315 : employment  -  0.8480003 
## 317 : invest_fixed_assets 316 : invest_fixed_capital_per_cap  -  0.9996701 
## 342 : average_life_exp 316 : invest_fixed_capital_per_cap  -  0.9264072 
## 364 : turnover_catering_per_cap 316 : invest_fixed_capital_per_cap  -  0.9826541 
## 368 : bandwidth_sports 316 : invest_fixed_capital_per_cap  -  0.8824089 
## 342 : average_life_exp 317 : invest_fixed_assets  -  0.9286896 
## 364 : turnover_catering_per_cap 317 : invest_fixed_assets  -  0.9864575 
## 368 : bandwidth_sports 317 : invest_fixed_assets  -  0.8936592 
## 366 : seats_theather_rfmin_per_100000_cap 331 : mortality  -  0.8560091 
## 372 : apartment_fund_sqm 331 : mortality  -  0.9725452 
## 364 : turnover_catering_per_cap 342 : average_life_exp  -  0.9373091 
## 368 : bandwidth_sports 342 : average_life_exp  -  0.9057596 
## 354 : load_of_teachers_school_per_teacher 347 : rent_price_3room_bus  -  0.8122621 
## 357 : provision_nurse 347 : rent_price_3room_bus  -  0.8048533 
## 350 : rent_price_3room_eco 348 : rent_price_2room_bus  -  0.8485271 
## 357 : provision_nurse 354 : load_of_teachers_school_per_teacher  -  0.9893542 
## 358 : load_on_doctors 354 : load_of_teachers_school_per_teacher  -  0.931398 
## 364 : turnover_catering_per_cap 354 : load_of_teachers_school_per_teacher  -  0.8778537 
## 368 : bandwidth_sports 354 : load_of_teachers_school_per_teacher  -  0.9404566 
## 358 : load_on_doctors 357 : provision_nurse  -  0.9269676 
## 364 : turnover_catering_per_cap 357 : provision_nurse  -  0.8541897 
## 368 : bandwidth_sports 357 : provision_nurse  -  0.9100185 
## 366 : seats_theather_rfmin_per_100000_cap 358 : load_on_doctors  -  0.8759732 
## 368 : bandwidth_sports 358 : load_on_doctors  -  0.8224601 
## 368 : bandwidth_sports 364 : turnover_catering_per_cap  -  0.9492677 
## 372 : apartment_fund_sqm 366 : seats_theather_rfmin_per_100000_cap  -  0.9524204
col_del <- unique(col_del)

Found 198 correlated numerical attributes from 391 total and 372 numeric ones. Which is 50.6% overall and 95.1%